plutus-core-1.0.0.1: Language library for Plutus Core
Safe Haskell None
Language Haskell2010

PlutusPrelude

Synopsis

Reexports from base

(&) :: a -> (a -> b) -> b infixl 1 Source #

& is a reverse application operator. This provides notational convenience. Its precedence is one higher than that of the forward application operator $ , which allows & to be nested in $ .

>>> 5 & (+1) & show
"6"

Since: base-4.8.0.0

(&&&) :: Arrow a => a b c -> a b c' -> a b (c, c') infixr 3 Source #

Fanout: send the input to both argument arrows and combine their output.

The default definition may be overridden with a more efficient version if desired.

(<&>) :: Functor f => f a -> (a -> b) -> f b infixl 1 Source #

Flipped version of <$> .

(<&>) = flip fmap

Examples

Expand

Apply (+1) to a list, a Just and a Right :

>>> Just 2 <&> (+1)
Just 3
>>> [1,2,3] <&> (+1)
[2,3,4]
>>> Right 3 <&> (+1)
Right 4

Since: base-4.11.0.0

toList :: Foldable t => t a -> [a] Source #

List of elements of a structure, from left to right.

Since: base-4.8.0.0

bool :: a -> a -> Bool -> a Source #

Case analysis for the Bool type. bool x y p evaluates to x when p is False , and evaluates to y when p is True .

This is equivalent to if p then y else x ; that is, one can think of it as an if-then-else construct with its arguments reordered.

Examples

Expand

Basic usage:

>>> bool "foo" "bar" True
"bar"
>>> bool "foo" "bar" False
"foo"

Confirm that bool x y p and if p then y else x are equivalent:

>>> let p = True; x = "bar"; y = "foo"
>>> bool x y p == if p then y else x
True
>>> let p = False
>>> bool x y p == if p then y else x
True

Since: base-4.7.0.0

first :: Bifunctor p => (a -> b) -> p a c -> p b c Source #

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

Expand
>>> first toUpper ('j', 3)
('J',3)
>>> first toUpper (Left 'j')
Left 'J'

second :: Bifunctor p => (b -> c) -> p a b -> p a c Source #

Map covariantly over the second argument.

secondbimap id

Examples

Expand
>>> second (+1) ('j', 3)
('j',4)
>>> second (+1) (Right 3)
Right 4

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c infixl 0 Source #

on b u x y runs the binary function b on the results of applying unary function u to two arguments x and y . From the opposite perspective, it transforms two inputs and combines the outputs.

((+) `on` f) x y = f x + f y

Typical usage: sortBy ( compare `on` fst ) .

Algebraic properties:

  • (*) `on` id = (*) -- (if (*) ∉ {⊥, const ⊥})
  • ((*) `on` f) `on` g = (*) `on` (f . g)
  • flip on f . flip on g = flip on (g . f)

isNothing :: Maybe a -> Bool Source #

The isNothing function returns True iff its argument is Nothing .

Examples

Expand

Basic usage:

>>> isNothing (Just 3)
False
>>> isNothing (Just ())
False
>>> isNothing Nothing
True

Only the outer constructor is taken into consideration:

>>> isNothing (Just Nothing)
False

isJust :: Maybe a -> Bool Source #

The isJust function returns True iff its argument is of the form Just _ .

Examples

Expand

Basic usage:

>>> isJust (Just 3)
True
>>> isJust (Just ())
True
>>> isJust Nothing
False

Only the outer constructor is taken into consideration:

>>> isJust (Just Nothing)
True

fromMaybe :: a -> Maybe a -> a Source #

The fromMaybe function takes a default value and and Maybe value. If the Maybe is Nothing , it returns the default values; otherwise, it returns the value contained in the Maybe .

Examples

Expand

Basic usage:

>>> fromMaybe "" (Just "Hello, World!")
"Hello, World!"
>>> fromMaybe "" Nothing
""

Read an integer from a string using readMaybe . If we fail to parse an integer, we want to return 0 by default:

>>> import Text.Read ( readMaybe )
>>> fromMaybe 0 (readMaybe "5")
5
>>> fromMaybe 0 (readMaybe "")
0

guard :: Alternative f => Bool -> f () Source #

Conditional failure of Alternative computations. Defined by

guard True  = pure ()
guard False = empty

Examples

Expand

Common uses of guard include conditionally signaling an error in an error monad and conditionally rejecting the current choice in an Alternative -based parser.

As an example of signaling an error in the error monad Maybe , consider a safe division function safeDiv x y that returns Nothing when the denominator y is zero and Just (x `div` y) otherwise. For example:

>>> safeDiv 4 0
Nothing
>>> safeDiv 4 2
Just 2

A definition of safeDiv using guards, but not guard :

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y | y /= 0    = Just (x `div` y)
            | otherwise = Nothing

A definition of safeDiv using guard and Monad do -notation:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y = do
  guard (y /= 0)
  return (x `div` y)

foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b Source #

Left-associative fold of a structure but with strict application of the operator.

This ensures that each step of the fold is forced to weak head normal form before being applied, avoiding the collection of thunks that would otherwise occur. This is often what you want to strictly reduce a finite list to a single, monolithic result (e.g. length ).

For a general Foldable structure this should be semantically identical to,

foldl' f z = foldl' f z . toList

Since: base-4.6.0.0

fold :: ( Foldable t, Monoid m) => t m -> m Source #

Combine the elements of a structure using a monoid.

for :: ( Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) Source #

for is traverse with its arguments flipped. For a version that ignores the results see for_ .

throw :: forall (r :: RuntimeRep ) (a :: TYPE r) e. Exception e => e -> a Source #

Throw an exception. Exceptions may be thrown from purely functional code, but may only be caught within the IO monad.

join :: Monad m => m (m a) -> m a Source #

The join function is the conventional monad join operator. It is used to remove one level of monadic structure, projecting its bound argument into the outer level.

' join bss ' can be understood as the do expression

do bs <- bss
   bs

Examples

Expand

A common use of join is to run an IO computation returned from an STM transaction, since STM transactions can't perform IO directly. Recall that

atomically :: STM a -> IO a

is used to run STM transactions atomically. So, by specializing the types of atomically and join to

atomically :: STM (IO b) -> IO (IO b)
join       :: IO (IO b)  -> IO b

we can compose them as

join . atomically :: STM (IO b) -> IO b

to run an STM transaction and the IO action it returns.

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c infixr 1 Source #

Right-to-left composition of Kleisli arrows. ( >=> ) , with the arguments flipped.

Note how this operator resembles function composition ( . ) :

(.)   ::            (b ->   c) -> (a ->   b) -> a ->   c
(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c infixr 1 Source #

Left-to-right composition of Kleisli arrows.

' (bs >=> cs) a ' can be understood as the do expression

do b <- bs a
   cs b

($>) :: Functor f => f a -> b -> f b infixl 4 Source #

Flipped version of <$ .

Using ApplicativeDo : ' as $> b ' can be understood as the do expression

do as
   pure b

with an inferred Functor constraint.

Examples

Expand

Replace the contents of a Maybe Int with a constant String :

>>> Nothing $> "foo"
Nothing
>>> Just 90210 $> "foo"
Just "foo"

Replace the contents of an Either Int Int with a constant String , resulting in an Either Int String :

>>> Left 8675309 $> "foo"
Left 8675309
>>> Right 8675309 $> "foo"
Right "foo"

Replace each element of a list with a constant String :

>>> [1,2,3] $> "foo"
["foo","foo","foo"]

Replace the second element of a pair with a constant String :

>>> (1,2) $> "foo"
(1,"foo")

Since: base-4.7.0.0

fromRight :: b -> Either a b -> b Source #

Return the contents of a Right -value or a default value otherwise.

Examples

Expand

Basic usage:

>>> fromRight 1 (Right 3)
3
>>> fromRight 1 (Left "foo")
1

Since: base-4.10.0.0

isRight :: Either a b -> Bool Source #

Return True if the given value is a Right -value, False otherwise.

Examples

Expand

Basic usage:

>>> isRight (Left "foo")
False
>>> isRight (Right 3)
True

Assuming a Left value signifies some sort of error, we can use isRight to write a very simple reporting function that only outputs "SUCCESS" when a computation has succeeded.

This example shows how isRight might be used to avoid pattern matching when one does not care about the value contained in the constructor:

>>> import Control.Monad ( when )
>>> let report e = when (isRight e) $ putStrLn "SUCCESS"
>>> report (Left "parse error")
>>> report (Right 1)
SUCCESS

Since: base-4.7.0.0

void :: Functor f => f a -> f () Source #

void value discards or ignores the result of evaluation, such as the return value of an IO action.

Using ApplicativeDo : ' void as ' can be understood as the do expression

do as
   pure ()

with an inferred Functor constraint.

Examples

Expand

Replace the contents of a Maybe Int with unit:

>>> void Nothing
Nothing
>>> void (Just 3)
Just ()

Replace the contents of an Either Int Int with unit, resulting in an Either Int () :

>>> void (Left 8675309)
Left 8675309
>>> void (Right 8675309)
Right ()

Replace every element of a list with unit:

>>> void [1,2,3]
[(),(),()]

Replace the second element of a pair with unit:

>>> void (1,2)
(1,())

Discard the result of an IO action:

>>> mapM print [1,2]
1
2
[(),()]
>>> void $ mapM print [1,2]
1
2

through :: Functor f => (a -> f b) -> a -> f a Source #

Makes an effectful function ignore its result value and return its input value.

coerce :: forall (k :: RuntimeRep ) (a :: TYPE k) (b :: TYPE k). Coercible a b => a -> b Source #

The function coerce allows you to safely convert between values of types that have the same representation with no run-time overhead. In the simplest case you can use it instead of a newtype constructor, to go from the newtype's concrete type to the abstract type. But it also works in more complicated settings, e.g. converting a list of newtypes to a list of concrete types.

This function is runtime-representation polymorphic, but the RuntimeRep type argument is marked as Inferred , meaning that it is not available for visible type application. This means the typechecker will accept coerce @Int @Age 42 .

class Generic a Source #

Representable types of kind * . This class is derivable in GHC with the DeriveGeneric flag on.

A Generic instance must satisfy the following laws:

from . toid
to . fromid

Minimal complete definition

from , to

Instances

Instances details
Generic Bool

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type Source #

Generic Ordering

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Generic Exp
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp :: Type -> Type Source #

Generic Match
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Clause
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Pat
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat :: Type -> Type Source #

Generic Type
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type :: Type -> Type Source #

Generic Dec
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec :: Type -> Type Source #

Generic Name
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name :: Type -> Type Source #

Generic FunDep
Instance details

Defined in Language.Haskell.TH.Syntax

Generic InjectivityAnn
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Overlap
Instance details

Defined in Language.Haskell.TH.Syntax

Generic ()

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type Source #

Methods

from :: () -> Rep () x Source #

to :: Rep () x -> () Source #

Generic Version

Since: base-4.9.0.0

Instance details

Defined in Data.Version

Generic Value
Instance details

Defined in Data.Aeson.Types.Internal

Generic AdjacencyIntMap
Instance details

Defined in Algebra.Graph.AdjacencyIntMap

Generic DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Generic SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Generic SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Generic Associativity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Generic Fixity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Generic Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type Source #

Generic ExitCode
Instance details

Defined in GHC.IO.Exception

Generic All

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All :: Type -> Type Source #

Generic Any

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any :: Type -> Type Source #

Generic ByteSpan
Instance details

Defined in Cardano.Binary.Annotated

Generic Filler
Instance details

Defined in Flat.Filler

Generic Extension
Instance details

Defined in GHC.LanguageExtensions.Type

Generic ForeignSrcLang
Instance details

Defined in GHC.ForeignSrcLang.Type

Generic PrimType
Instance details

Defined in GHC.Exts.Heap.Closures

Generic StgInfoTable
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Generic ClosureType
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Generic Half
Instance details

Defined in Numeric.Half.Internal

Associated Types

type Rep Half :: Type -> Type Source #

Generic Stmt
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt :: Type -> Type Source #

Generic ModName
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Phases
Instance details

Defined in Language.Haskell.TH.Syntax

Generic RuleBndr
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Pragma
Instance details

Defined in Language.Haskell.TH.Syntax

Generic DerivClause
Instance details

Defined in Language.Haskell.TH.Syntax

Generic DerivStrategy
Instance details

Defined in Language.Haskell.TH.Syntax

Generic TySynEqn
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Fixity
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Info
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info :: Type -> Type Source #

Generic Con
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con :: Type -> Type Source #

Generic TyVarBndr
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Pos
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep Pos :: Type -> Type Source #

Generic InvalidPosException
Instance details

Defined in Text.Megaparsec.Pos

Generic SourcePos
Instance details

Defined in Text.Megaparsec.Pos

Generic Doc
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc :: Type -> Type Source #

Generic TextDetails
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Generic Style
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Generic Mode
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode :: Type -> Type Source #

Generic PkgName
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Module
Instance details

Defined in Language.Haskell.TH.Syntax

Generic OccName
Instance details

Defined in Language.Haskell.TH.Syntax

Generic NameFlavour
Instance details

Defined in Language.Haskell.TH.Syntax

Generic NameSpace
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Loc
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc :: Type -> Type Source #

Generic ModuleInfo
Instance details

Defined in Language.Haskell.TH.Syntax

Generic FixityDirection
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Lit
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit :: Type -> Type Source #

Generic Bytes
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Body
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body :: Type -> Type Source #

Generic Guard
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Range
Instance details

Defined in Language.Haskell.TH.Syntax

Generic TypeFamilyHead
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Foreign
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Callconv
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Safety
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Inline
Instance details

Defined in Language.Haskell.TH.Syntax

Generic RuleMatch
Instance details

Defined in Language.Haskell.TH.Syntax

Generic AnnTarget
Instance details

Defined in Language.Haskell.TH.Syntax

Generic SourceUnpackedness
Instance details

Defined in Language.Haskell.TH.Syntax

Generic SourceStrictness
Instance details

Defined in Language.Haskell.TH.Syntax

Generic DecidedStrictness
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Bang
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang :: Type -> Type Source #

Generic PatSynDir
Instance details

Defined in Language.Haskell.TH.Syntax

Generic PatSynArgs
Instance details

Defined in Language.Haskell.TH.Syntax

Generic FamilyResultSig
Instance details

Defined in Language.Haskell.TH.Syntax

Generic TyLit
Instance details

Defined in Language.Haskell.TH.Syntax

Generic Role
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role :: Type -> Type Source #

Generic AnnLookup
Instance details

Defined in Language.Haskell.TH.Syntax

Generic DatatypeInfo
Instance details

Defined in Language.Haskell.TH.Datatype

Generic DatatypeVariant
Instance details

Defined in Language.Haskell.TH.Datatype

Generic ConstructorInfo
Instance details

Defined in Language.Haskell.TH.Datatype

Generic ConstructorVariant
Instance details

Defined in Language.Haskell.TH.Datatype

Generic FieldStrictness
Instance details

Defined in Language.Haskell.TH.Datatype

Generic Unpackedness
Instance details

Defined in Language.Haskell.TH.Datatype

Generic Strictness
Instance details

Defined in Language.Haskell.TH.Datatype

Generic Specificity
Instance details

Defined in Language.Haskell.TH.Datatype.TyVarBndr

Generic SatInt Source #
Instance details

Defined in Data.SatInt

Generic Data Source #
Instance details

Defined in PlutusCore.Data

Associated Types

type Rep Data :: Type -> Type Source #

Generic TyName Source #
Instance details

Defined in PlutusCore.Name

Generic Name Source #
Instance details

Defined in PlutusCore.Name

Associated Types

type Rep Name :: Type -> Type Source #

Generic FreeVariableError Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic TyDeBruijn Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic NamedTyDeBruijn Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic DeBruijn Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic NamedDeBruijn Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic Index Source #
Instance details

Defined in PlutusCore.DeBruijn.Internal

Generic ExCPU Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Generic ExMemory Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Generic ExBudget Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Generic ModelSixArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelFiveArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelFourArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelThreeArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelTwoArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelConstantOrTwoArguments Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelConstantOrLinear Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelMaxSize Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelMinSize Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelMultipliedSizes Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelLinearSize Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelSubtractedSizes Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelAddedSizes Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ModelOneArgument Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ParseError Source #
Instance details

Defined in PlutusCore.Error

Generic DefaultFun Source #
Instance details

Defined in PlutusCore.Default.Builtins

Generic CekMachineCosts Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Generic CekUserError Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Generic StepKind Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Generic Strictness Source #
Instance details

Defined in PlutusIR.Core.Type

Generic Recursivity Source #
Instance details

Defined in PlutusIR.Core.Type

Generic ExtensionFun Source #
Instance details

Defined in PlutusCore.Examples.Builtins

Generic [a]

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] :: Type -> Type Source #

Methods

from :: [a] -> Rep [a] x Source #

to :: Rep [a] x -> [a] Source #

Generic ( Maybe a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Maybe a) :: Type -> Type Source #

Generic ( Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Par1 p) :: Type -> Type Source #

Generic ( Solo a)
Instance details

Defined in Data.Tuple.Solo

Associated Types

type Rep ( Solo a) :: Type -> Type Source #

Generic ( Only a)
Instance details

Defined in Data.Tuple.Only

Associated Types

type Rep ( Only a) :: Type -> Type Source #

Generic ( Tree a)

Since: containers-0.5.8

Instance details

Defined in Data.Tree

Associated Types

type Rep ( Tree a) :: Type -> Type Source #

Generic ( Graph a)
Instance details

Defined in Algebra.Graph.Undirected

Associated Types

type Rep ( Graph a) :: Type -> Type Source #

Generic ( AdjacencyMap a)
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

Associated Types

type Rep ( AdjacencyMap a) :: Type -> Type Source #

Generic ( Graph a)
Instance details

Defined in Algebra.Graph

Associated Types

type Rep ( Graph a) :: Type -> Type Source #

Generic ( AdjacencyMap a)
Instance details

Defined in Algebra.Graph.AdjacencyMap

Associated Types

type Rep ( AdjacencyMap a) :: Type -> Type Source #

Generic ( Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep ( Identity a) :: Type -> Type Source #

Generic ( Complex a)

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Associated Types

type Rep ( Complex a) :: Type -> Type Source #

Generic ( Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( Min a) :: Type -> Type Source #

Generic ( Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( Max a) :: Type -> Type Source #

Generic ( First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( First a) :: Type -> Type Source #

Generic ( Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( Last a) :: Type -> Type Source #

Generic ( WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Generic ( Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( Option a) :: Type -> Type Source #

Generic ( ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep ( ZipList a) :: Type -> Type Source #

Generic ( First a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep ( First a) :: Type -> Type Source #

Generic ( Last a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep ( Last a) :: Type -> Type Source #

Generic ( Dual a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep ( Dual a) :: Type -> Type Source #

Generic ( Endo a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep ( Endo a) :: Type -> Type Source #

Generic ( Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep ( Sum a) :: Type -> Type Source #

Generic ( Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep ( Product a) :: Type -> Type Source #

Generic ( Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Down a) :: Type -> Type Source #

Generic ( NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( NonEmpty a) :: Type -> Type Source #

Generic ( SigDSIGN SchnorrSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Generic ( SigDSIGN EcdsaSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Generic ( SignKeyDSIGN SchnorrSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Generic ( SignKeyDSIGN EcdsaSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Generic ( VerKeyDSIGN SchnorrSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Generic ( VerKeyDSIGN EcdsaSecp256k1DSIGN )
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Generic ( SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Associated Types

type Rep ( SCC vertex) :: Type -> Type Source #

Methods

from :: SCC vertex -> Rep ( SCC vertex) x Source #

to :: Rep ( SCC vertex) x -> SCC vertex Source #

Generic ( FingerTree a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( FingerTree a) :: Type -> Type Source #

Generic ( Digit a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( Digit a) :: Type -> Type Source #

Generic ( Node a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( Node a) :: Type -> Type Source #

Generic ( Elem a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( Elem a) :: Type -> Type Source #

Generic ( ViewL a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( ViewL a) :: Type -> Type Source #

Generic ( ViewR a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep ( ViewR a) :: Type -> Type Source #

Generic ( Fix f)
Instance details

Defined in Data.Fix

Associated Types

type Rep ( Fix f) :: Type -> Type Source #

Generic ( PostAligned a)
Instance details

Defined in Flat.Filler

Associated Types

type Rep ( PostAligned a) :: Type -> Type Source #

Generic ( PreAligned a)
Instance details

Defined in Flat.Filler

Associated Types

type Rep ( PreAligned a) :: Type -> Type Source #

Generic ( GenClosure b)
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep ( GenClosure b) :: Type -> Type Source #

Generic ( ErrorItem t)
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep ( ErrorItem t) :: Type -> Type Source #

Generic ( ErrorFancy e)
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep ( ErrorFancy e) :: Type -> Type Source #

Generic ( PosState s)
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep ( PosState s) :: Type -> Type Source #

Generic ( Doc a)
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep ( Doc a) :: Type -> Type Source #

Generic ( Doc ann)
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep ( Doc ann) :: Type -> Type Source #

Generic ( SimpleDocStream ann)
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep ( SimpleDocStream ann) :: Type -> Type Source #

Generic ( Maybe a)
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep ( Maybe a) :: Type -> Type Source #

Generic ( Window a)
Instance details

Defined in System.Console.Terminal.Common

Associated Types

type Rep ( Window a) :: Type -> Type Source #

Generic ( Doc a)
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep ( Doc a) :: Type -> Type Source #

Generic ( SimpleDoc a)
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep ( SimpleDoc a) :: Type -> Type Source #

Generic ( EvaluationResult a) Source #
Instance details

Defined in PlutusCore.Evaluation.Result

Generic ( CostingFun model) Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ( CostingFun model) :: Type -> Type Source #

Generic ( BuiltinCostModelBase f) Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Generic ( Version ann) Source #
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep ( Version ann) :: Type -> Type Source #

Generic ( Kind ann) Source #
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep ( Kind ann) :: Type -> Type Source #

Generic ( Normalized a) Source #
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep ( Normalized a) :: Type -> Type Source #

Generic ( MachineError fun) Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep ( MachineError fun) :: Type -> Type Source #

Generic ( UniqueError ann) Source #
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep ( UniqueError ann) :: Type -> Type Source #

Generic ( ExBudgetCategory fun) Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Generic ( TallyingSt fun) Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep ( TallyingSt fun) :: Type -> Type Source #

Generic ( CekExTally fun) Source #
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep ( CekExTally fun) :: Type -> Type Source #

Generic ( Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Either a b) :: Type -> Type Source #

Generic ( V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( V1 p) :: Type -> Type Source #

Generic ( U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( U1 p) :: Type -> Type Source #

Generic (a, b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) :: Type -> Type Source #

Methods

from :: (a, b) -> Rep (a, b) x Source #

to :: Rep (a, b) x -> (a, b) Source #

Generic ( Graph e a)
Instance details

Defined in Algebra.Graph.Labelled

Associated Types

type Rep ( Graph e a) :: Type -> Type Source #

Generic ( AdjacencyMap e a)
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

Associated Types

type Rep ( AdjacencyMap e a) :: Type -> Type Source #

Generic ( Void f)
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep ( Void f) :: Type -> Type Source #

Generic ( Unit f)
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep ( Unit f) :: Type -> Type Source #

Generic ( Container b a)
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep ( Container b a) :: Type -> Type Source #

Generic ( ErrorContainer b e)
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep ( ErrorContainer b e) :: Type -> Type Source #

Generic ( Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep ( Arg a b) :: Type -> Type Source #

Generic ( WrappedMonad m a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep ( WrappedMonad m a) :: Type -> Type Source #

Generic ( Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Proxy t) :: Type -> Type Source #

Generic ( Bimap a b)
Instance details

Defined in Data.Bimap

Associated Types

type Rep ( Bimap a b) :: Type -> Type Source #

Generic ( Annotated b a)
Instance details

Defined in Cardano.Binary.Annotated

Associated Types

type Rep ( Annotated b a) :: Type -> Type Source #

Generic ( SignedDSIGN v a)
Instance details

Defined in Cardano.Crypto.DSIGN.Class

Associated Types

type Rep ( SignedDSIGN v a) :: Type -> Type Source #

Generic ( Hash h a)
Instance details

Defined in Cardano.Crypto.Hash.Class

Associated Types

type Rep ( Hash h a) :: Type -> Type Source #

Generic ( Cofree f a)
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep ( Cofree f a) :: Type -> Type Source #

Generic ( Free f a)
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep ( Free f a) :: Type -> Type Source #

Generic ( ListT m a)
Instance details

Defined in ListT

Associated Types

type Rep ( ListT m a) :: Type -> Type Source #

Generic ( ParseErrorBundle s e)
Instance details

Defined in Text.Megaparsec.Error

Generic ( State s e)
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep ( State s e) :: Type -> Type Source #

Generic ( ParseError s e)
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep ( ParseError s e) :: Type -> Type Source #

Generic ( ListF a b)
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep ( ListF a b) :: Type -> Type Source #

Generic ( NonEmptyF a b)
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep ( NonEmptyF a b) :: Type -> Type Source #

Generic ( TreeF a b)
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep ( TreeF a b) :: Type -> Type Source #

Generic ( These a b)
Instance details

Defined in Data.These

Associated Types

type Rep ( These a b) :: Type -> Type Source #

Generic ( Pair a b)
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep ( Pair a b) :: Type -> Type Source #

Generic ( These a b)
Instance details

Defined in Data.Strict.These

Associated Types

type Rep ( These a b) :: Type -> Type Source #

Generic ( Either a b)
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep ( Either a b) :: Type -> Type Source #

Generic ( TyVarDecl tyname ann) Source #
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep ( TyVarDecl tyname ann) :: Type -> Type Source #

Methods

from :: TyVarDecl tyname ann -> Rep ( TyVarDecl tyname ann) x Source #

to :: Rep ( TyVarDecl tyname ann) x -> TyVarDecl tyname ann Source #

Generic ( EvaluationError user internal) Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep ( EvaluationError user internal) :: Type -> Type Source #

Methods

from :: EvaluationError user internal -> Rep ( EvaluationError user internal) x Source #

to :: Rep ( EvaluationError user internal) x -> EvaluationError user internal Source #

Generic ( ErrorWithCause err cause) Source #
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep ( ErrorWithCause err cause) :: Type -> Type Source #

Generic ( Def var val) Source #
Instance details

Defined in PlutusCore.MkPlc

Associated Types

type Rep ( Def var val) :: Type -> Type Source #

Methods

from :: Def var val -> Rep ( Def var val) x Source #

to :: Rep ( Def var val) x -> Def var val Source #

Generic ( UVarDecl name ann) Source #
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

type Rep ( UVarDecl name ann) :: Type -> Type Source #

Methods

from :: UVarDecl name ann -> Rep ( UVarDecl name ann) x Source #

to :: Rep ( UVarDecl name ann) x -> UVarDecl name ann Source #

Generic ( TypeErrorExt uni ann) Source #
Instance details

Defined in PlutusIR.Error

Associated Types

type Rep ( TypeErrorExt uni ann) :: Type -> Type Source #

Generic ( Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( Rec1 f p) :: Type -> Type Source #

Generic ( URec ( Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( URec ( Ptr ()) p) :: Type -> Type Source #

Generic ( URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( URec Char p) :: Type -> Type Source #

Generic ( URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Generic ( URec Float p)
Instance details

Defined in GHC.Generics

Generic ( URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( URec Int p) :: Type -> Type Source #

Generic ( URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ( URec Word p) :: Type -> Type Source #

Generic (a, b, c)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) :: Type -> Type Source #

Methods

from :: (a, b, c) -> Rep (a, b, c) x Source #

to :: Rep (a, b, c) x -> (a, b, c) Source #

Generic ( Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep ( Const a b) :: Type -> Type Source #

Generic ( WrappedArrow a b c)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep ( WrappedArrow a b c) :: Type -> Type Source #

Generic ( Kleisli m a b)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Associated Types

type Rep ( Kleisli m a b) :: Type -> Type Source #

Generic ( Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep ( Ap f a) :: Type -> Type Source #

Generic ( Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep ( Alt f a) :: Type -> Type Source #

Generic ( Join p a)