atlas-cardano-0.3.0: Application backend for Plutus smart contracts on Cardano
Copyright(c) 2023 GYELD GMBH
LicenseApache 2.0
Maintainer[email protected]
Stabilitydevelop
Safe HaskellNone
LanguageHaskell2010

GeniusYield.Imports

Description

 
Synopsis

Documentation

coerce ∷ ∀ (k ∷ RuntimeRep) (a ∷ TYPE k) (b ∷ TYPE k). Coercible a b ⇒ a → b #

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.

guardAlternative f ⇒ Bool → f () #

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)

joinMonad m ⇒ m (m a) → m a #

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.

class IsString a where #

Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).

Methods

fromStringString → a #

Instances

Instances details
IsString ShortByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Short.Internal

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

fromStringStringByteString #

IsString ByteString

Beware: fromString truncates multi-byte characters to octets. e.g. "枯朶に烏のとまりけり秋の暮" becomes �6k�nh~�Q��n�

Instance details

Defined in Data.ByteString.Internal

Methods

fromStringStringByteString #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromStringStringDoc #

IsString Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

fromStringStringBuilder #

IsString PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

fromStringString → PraosNonce #

IsString ScriptHash 
Instance details

Defined in Cardano.Api.Script

Methods

fromStringString → ScriptHash #

IsString TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

fromStringString → TextEnvelopeDescr #

IsString TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

fromStringString → TextEnvelopeType #

IsString TxId 
Instance details

Defined in Cardano.Api.TxIn

Methods

fromStringString → TxId #

IsString AssetName 
Instance details

Defined in Cardano.Api.Value

Methods

fromStringString → AssetName #

IsString PolicyId 
Instance details

Defined in Cardano.Api.Value

Methods

fromStringString → PolicyId #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromStringString → Value #

IsString Key 
Instance details

Defined in Data.Aeson.Key

Methods

fromStringString → Key #

IsString IPv6 
Instance details

Defined in Data.IP.Addr

Methods

fromStringString → IPv6 #

IsString IPv4 
Instance details

Defined in Data.IP.Addr

Methods

fromStringString → IPv4 #

IsString ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

fromStringString → ScrubbedBytes #

IsString ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

Methods

fromStringString → ByteArray #

IsString ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

fromStringString → ShortText #

IsString RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fromStringString → RequestBody #

IsString Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Methods

fromStringString → Alphabet #

IsString ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

fromStringString → ByteString64 #

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromStringString0 → String #

IsString AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

fromStringString → AsciiString #

IsString PubKeyHash 
Instance details

Defined in Plutus.V1.Ledger.Crypto

Methods

fromStringString → PubKeyHash #

IsString CurrencySymbol 
Instance details

Defined in Plutus.V1.Ledger.Value

Methods

fromStringString → CurrencySymbol #

IsString TokenName 
Instance details

Defined in Plutus.V1.Ledger.Value

Methods

fromStringString → TokenName #

IsString DatumHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → DatumHash #

IsString ValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → ValidatorHash #

IsString TxId 
Instance details

Defined in Plutus.V1.Ledger.Tx

Methods

fromStringString → TxId #

IsString SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

Methods

fromStringString → SlicedByteArray #

IsString GroupName 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fromStringString → GroupName #

IsString LabelName 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fromStringString → LabelName #

IsString PropertyName 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fromStringString → PropertyName #

IsString UnliftingError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Methods

fromStringString → UnliftingError #

IsString LedgerBytes 
Instance details

Defined in Plutus.V1.Ledger.Bytes

Methods

fromStringString → LedgerBytes #

IsString MintingPolicyHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → MintingPolicyHash #

IsString RedeemerHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → RedeemerHash #

IsString ScriptHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → ScriptHash #

IsString StakeValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Methods

fromStringString → StakeValidatorHash #

IsString MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

Methods

fromStringString → MediaType #

IsString Environment 
Instance details

Defined in Katip.Core

Methods

fromStringString → Environment #

IsString LogStr 
Instance details

Defined in Katip.Core

Methods

fromStringString → LogStr #

IsString Namespace 
Instance details

Defined in Katip.Core

Methods

fromStringString → Namespace #

IsString IP 
Instance details

Defined in Data.IP.Addr

Methods

fromStringString → IP #

IsString IPRange 
Instance details

Defined in Data.IP.Range

Methods

fromStringString → IPRange #

IsString Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromStringString → Query #

IsString Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromStringString → Identifier #

IsString QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromStringString → QualifiedIdentifier #

IsString GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

IsString LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

fromStringStringLogSrc #

IsString GYLogNamespace # 
Instance details

Defined in GeniusYield.Types.Logging

IsString Host 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringString → Host #

IsString License 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringString → License #

IsString Response 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringString → Response #

IsString Tag 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringString → Tag #

IsString GYPubKeyHash # 
Instance details

Defined in GeniusYield.Types.PubKeyHash

IsString GYExtendedPaymentSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYPaymentSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYPaymentVerificationKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYMintingPolicyId #
>>> fromString "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" :: GYMintingPolicyId
"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef"
Instance details

Defined in GeniusYield.Types.Script

IsString GYValidatorHash #
>>> "cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0" :: GYValidatorHash
GYValidatorHash "cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0"
Instance details

Defined in GeniusYield.Types.Script

IsString GYAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

IsString GYTime #
>>> "1970-01-01T00:00:00Z" :: GYTime
GYTime 0s
>>> "1970-01-01T00:00:00" :: GYTime
*** Exception: can't parse '1970-01-01T00:00:00' as GYTime in ISO8601 format
...
Instance details

Defined in GeniusYield.Types.Time

Methods

fromStringStringGYTime #

IsString GYTxId #
>>> "6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8" :: GYTxId
6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8
Instance details

Defined in GeniusYield.Types.Tx

Methods

fromStringStringGYTxId #

IsString GYTxOutRef #
>>> "4293386fef391299c9886dc0ef3e8676cbdbc2c9f2773507f1f838e00043a189#1" :: GYTxOutRef
GYTxOutRef (TxIn "4293386fef391299c9886dc0ef3e8676cbdbc2c9f2773507f1f838e00043a189" (TxIx 1))
>>> "not-a-tx-out-ref" :: GYTxOutRef
*** Exception: invalid GYTxOutRef: not-a-tx-out-ref
...
Instance details

Defined in GeniusYield.Types.TxOutRef

Methods

fromStringStringGYTxOutRef #

IsString GYTokenName #

Does NOT UTF8-encode.

Instance details

Defined in GeniusYield.Types.Value

IsString GYAssetClass # 
Instance details

Defined in GeniusYield.Types.Value

IsString Seed 
Instance details

Defined in Crypto.Encoding.BIP39

Methods

fromStringString → Seed #

IsString Project 
Instance details

Defined in Blockfrost.Auth

Methods

fromStringStringProject #

IsString Address 
Instance details

Defined in Blockfrost.Types.Shared.Address

Methods

fromStringString → Address #

IsString AssetId 
Instance details

Defined in Blockfrost.Types.Shared.AssetId

Methods

fromStringString → AssetId #

IsString BlockHash 
Instance details

Defined in Blockfrost.Types.Shared.BlockHash

Methods

fromStringString → BlockHash #

IsString DatumHash 
Instance details

Defined in Blockfrost.Types.Shared.DatumHash

Methods

fromStringString → DatumHash #

IsString PolicyId 
Instance details

Defined in Blockfrost.Types.Shared.PolicyId

Methods

fromStringString → PolicyId #

IsString PoolId 
Instance details

Defined in Blockfrost.Types.Shared.PoolId

Methods

fromStringString → PoolId #

IsString ScriptHash 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

Methods

fromStringString → ScriptHash #

IsString TxHash 
Instance details

Defined in Blockfrost.Types.Shared.TxHash

Methods

fromStringString → TxHash #

a ~ CharIsString [a]

(a ~ Char) context was introduced in 4.9.0.0

Since: base-2.1

Instance details

Defined in Data.String

Methods

fromStringString → [a] #

IsString a ⇒ IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringIdentity a #

a ~ CharIsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromStringStringSeq a #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromStringStringDoc a #

IsString (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

Methods

fromStringString → Hash BlockHeader #

IsString (Hash ByronKey) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → Hash ByronKey #

IsString (Hash ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → Hash ByronKeyLegacy #

IsString (Hash GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash GenesisDelegateExtendedKey #

IsString (Hash GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash GenesisDelegateKey #

IsString (Hash GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash GenesisExtendedKey #

IsString (Hash GenesisKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash GenesisKey #

IsString (Hash GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash GenesisUTxOKey #

IsString (Hash PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash PaymentExtendedKey #

IsString (Hash PaymentKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash PaymentKey #

IsString (Hash StakeExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash StakeExtendedKey #

IsString (Hash StakeKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash StakeKey #

IsString (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

Methods

fromStringString → Hash ScriptData #

IsString (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → Hash StakePoolKey #

IsString (Hash VrfKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → Hash VrfKey #

IsString (Hash KesKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → Hash KesKey #

IsString (SigningKey ByronKey) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → SigningKey ByronKey #

IsString (SigningKey ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → SigningKey ByronKeyLegacy #

IsString (SigningKey GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey GenesisDelegateExtendedKey #

IsString (SigningKey GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey GenesisDelegateKey #

IsString (SigningKey GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey GenesisExtendedKey #

IsString (SigningKey GenesisKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey GenesisKey #

IsString (SigningKey GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey GenesisUTxOKey #

IsString (SigningKey PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey PaymentExtendedKey #

IsString (SigningKey PaymentKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey PaymentKey #

IsString (SigningKey StakeExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey StakeExtendedKey #

IsString (SigningKey StakeKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey StakeKey #

IsString (SigningKey StakePoolKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → SigningKey StakePoolKey #

IsString (SigningKey VrfKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → SigningKey VrfKey #

IsString (SigningKey KesKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → SigningKey KesKey #

IsString (VerificationKey ByronKey) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → VerificationKey ByronKey #

IsString (VerificationKey ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.KeysByron

Methods

fromStringString → VerificationKey ByronKeyLegacy #

IsString (VerificationKey GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey GenesisDelegateExtendedKey #

IsString (VerificationKey GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey GenesisDelegateKey #

IsString (VerificationKey GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey GenesisExtendedKey #

IsString (VerificationKey GenesisKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey GenesisKey #

IsString (VerificationKey GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey GenesisUTxOKey #

IsString (VerificationKey PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey PaymentExtendedKey #

IsString (VerificationKey PaymentKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey PaymentKey #

IsString (VerificationKey StakeExtendedKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey StakeExtendedKey #

IsString (VerificationKey StakeKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey StakeKey #

IsString (VerificationKey StakePoolKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

fromStringString → VerificationKey StakePoolKey #

IsString (VerificationKey VrfKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → VerificationKey VrfKey #

IsString (VerificationKey KesKey) 
Instance details

Defined in Cardano.Api.KeysPraos

Methods

fromStringString → VerificationKey KesKey #

a ~ CharIsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromStringString → DList a #

IsString (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

fromStringString → Doc ann #

KnownNat n ⇒ IsString (PinnedSizedBytes n) 
Instance details

Defined in Cardano.Crypto.PinnedSizedBytes

Methods

fromStringString → PinnedSizedBytes n #

a ~ CharIsString (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fromStringString → DNonEmpty a #

(IsString s, FoldCase s) ⇒ IsString (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

fromStringString → CI s #

IsString a ⇒ IsString (Graph a) 
Instance details

Defined in Algebra.Graph

Methods

fromStringString → Graph a #

IsString a ⇒ IsString (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.AdjacencyMap

Methods

fromStringString → AdjacencyMap a #

IsString a ⇒ IsString (Graph a) 
Instance details

Defined in Algebra.Graph.Undirected

Methods

fromStringString → Graph a #

IsString a ⇒ IsString (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

Methods

fromStringString → AdjacencyMap a #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

fromStringString → Doc a #

IsString (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Methods

fromStringString → AddrRange IPv6 #

IsString (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Methods

fromStringString → AddrRange IPv4 #

(IsString a, Hashable a) ⇒ IsString (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

fromStringString → Hashed a #

IsString a ⇒ IsString (Referenced a) 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringString → Referenced a #

HashAlgorithm h ⇒ IsString (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

fromStringString → Hash h a #

IsString a ⇒ IsString (AdjacencyMap e a) 
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

Methods

fromStringString → AdjacencyMap e a #

IsString a ⇒ IsString (Graph e a) 
Instance details

Defined in Algebra.Graph.Labelled

Methods

fromStringString → Graph e a #

IsString a ⇒ IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringConst a b #

IsString a ⇒ IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromStringString → Tagged s a #

liftA2Applicative f ⇒ (a → b → c) → f a → f b → f c #

Lift a binary function to actions.

Some functors support an implementation of liftA2 that is more efficient than the default one. In particular, if fmap is an expensive operation, it is likely better to use liftA2 than to fmap over the structure and then use <*>.

This became a typeclass method in 4.10.0.0. Prior to that, it was a function defined in terms of <*> and fmap.

Using ApplicativeDo: 'liftA2 f as bs' can be understood as the do expression

do a <- as
   b <- bs
   pure (f a b)

toListFoldable t ⇒ t a → [a] #

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

Since: base-4.8.0.0

foldl'Foldable t ⇒ (b → a → b) → b → t a → b #

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

class Generic a #

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 BoolTypeType #

Methods

fromBoolRep Bool x #

toRep Bool x → Bool #

Generic Ordering

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep OrderingTypeType #

Methods

fromOrderingRep Ordering x #

toRep Ordering x → Ordering #

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ExpTypeType #

Methods

fromExpRep Exp x #

toRep Exp x → Exp #

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep MatchTypeType #

Methods

fromMatchRep Match x #

toRep Match x → Match #

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ClauseTypeType #

Methods

fromClauseRep Clause x #

toRep Clause x → Clause #

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatTypeType #

Methods

fromPatRep Pat x #

toRep Pat x → Pat #

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeTypeType #

Methods

fromTypeRep Type x #

toRep Type x → Type #

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecTypeType #

Methods

fromDecRep Dec x #

toRep Dec x → Dec #

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameTypeType #

Methods

fromNameRep Name x #

toRep Name x → Name #

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDepTypeType #

Methods

fromFunDepRep FunDep x #

toRep FunDep x → FunDep #

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnnTypeType #

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OverlapTypeType #

Methods

fromOverlapRep Overlap x #

toRep Overlap x → Overlap #

Generic ()

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep () ∷ TypeType #

Methods

from ∷ () → Rep () x #

toRep () x → () #

Generic Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Associated Types

type Rep VoidTypeType #

Methods

fromVoidRep Void x #

toRep Void x → Void #

Generic Version

Since: base-4.9.0.0

Instance details

Defined in Data.Version

Associated Types

type Rep VersionTypeType #

Methods

fromVersionRep Version x #

toRep Version x → Version #

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCodeTypeType #

Methods

fromExitCodeRep ExitCode x #

toRep ExitCode x → ExitCode #

Generic All

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep AllTypeType #

Methods

fromAllRep All x #

toRep All x → All #

Generic Any

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep AnyTypeType #

Methods

fromAnyRep Any x #

toRep Any x → Any #

Generic Fixity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep FixityTypeType #

Methods

fromFixityRep Fixity x #

toRep Fixity x → Fixity #

Generic Associativity

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep AssociativityTypeType #

Generic SourceUnpackedness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackednessTypeType #

Generic SourceStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictnessTypeType #

Generic DecidedStrictness

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictnessTypeType #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep ExtensionTypeType #

Methods

fromExtensionRep Extension x #

toRep Extension x → Extension #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLangTypeType #

Generic PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep PrimTypeTypeType #

Methods

fromPrimTypeRep PrimType x #

toRep PrimType x → PrimType #

Generic StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Associated Types

type Rep StgInfoTableTypeType #

Generic ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Associated Types

type Rep ClosureTypeTypeType #

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep DocTypeType #

Methods

fromDocRep Doc x #

toRep Doc x → Doc #

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetailsTypeType #

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep StyleTypeType #

Methods

fromStyleRep Style x #

toRep Style x → Style #

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep ModeTypeType #

Methods

fromModeRep Mode x #

toRep Mode x → Mode #

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModNameTypeType #

Methods

fromModNameRep ModName x #

toRep ModName x → ModName #

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgNameTypeType #

Methods

fromPkgNameRep PkgName x #

toRep PkgName x → PkgName #

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleTypeType #

Methods

fromModuleRep Module x #

toRep Module x → Module #

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccNameTypeType #

Methods

fromOccNameRep OccName x #

toRep OccName x → OccName #

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavourTypeType #

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpaceTypeType #

Methods

fromNameSpaceRep NameSpace x #

toRep NameSpace x → NameSpace #

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep LocTypeType #

Methods

fromLocRep Loc x #

toRep Loc x → Loc #

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InfoTypeType #

Methods

fromInfoRep Info x #

toRep Info x → Info #

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfoTypeType #

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityTypeType #

Methods

fromFixityRep Fixity x #

toRep Fixity x → Fixity #

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirectionTypeType #

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep LitTypeType #

Methods

fromLitRep Lit x #

toRep Lit x → Lit #

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BytesTypeType #

Methods

fromBytesRep Bytes x #

toRep Bytes x → Bytes #

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BodyTypeType #

Methods

fromBodyRep Body x #

toRep Body x → Body #

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep GuardTypeType #

Methods

fromGuardRep Guard x #

toRep Guard x → Guard #

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep StmtTypeType #

Methods

fromStmtRep Stmt x #

toRep Stmt x → Stmt #

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RangeTypeType #

Methods

fromRangeRep Range x #

toRep Range x → Range #

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClauseTypeType #

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategyTypeType #

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHeadTypeType #

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqnTypeType #

Methods

fromTySynEqnRep TySynEqn x #

toRep TySynEqn x → TySynEqn #

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ForeignTypeType #

Methods

fromForeignRep Foreign x #

toRep Foreign x → Foreign #

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep CallconvTypeType #

Methods

fromCallconvRep Callconv x #

toRep Callconv x → Callconv #

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SafetyTypeType #

Methods

fromSafetyRep Safety x #

toRep Safety x → Safety #

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PragmaTypeType #

Methods

fromPragmaRep Pragma x #

toRep Pragma x → Pragma #

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InlineTypeType #

Methods

fromInlineRep Inline x #

toRep Inline x → Inline #

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatchTypeType #

Methods

fromRuleMatchRep RuleMatch x #

toRep RuleMatch x → RuleMatch #

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PhasesTypeType #

Methods

fromPhasesRep Phases x #

toRep Phases x → Phases #

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndrTypeType #

Methods

fromRuleBndrRep RuleBndr x #

toRep RuleBndr x → RuleBndr #

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTargetTypeType #

Methods

fromAnnTargetRep AnnTarget x #

toRep AnnTarget x → AnnTarget #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackednessTypeType #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictnessTypeType #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictnessTypeType #

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ConTypeType #

Methods

fromConRep Con x #

toRep Con x → Con #

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BangTypeType #

Methods

fromBangRep Bang x #

toRep Bang x → Bang #

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDirTypeType #

Methods

fromPatSynDirRep PatSynDir x #

toRep PatSynDir x → PatSynDir #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgsTypeType #

Generic TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyVarBndrTypeType #

Methods

fromTyVarBndrRep TyVarBndr x #

toRep TyVarBndr x → TyVarBndr #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSigTypeType #

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLitTypeType #

Methods

fromTyLitRep TyLit x #

toRep TyLit x → TyLit #

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RoleTypeType #

Methods

fromRoleRep Role x #

toRep Role x → Role #

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookupTypeType #

Methods

fromAnnLookupRep AnnLookup x #

toRep AnnLookup x → AnnLookup #

Generic PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

Associated Types

type Rep PraosNonce ∷ TypeType #

Methods

from ∷ PraosNonce → Rep PraosNonce x #

toRep PraosNonce x → PraosNonce #

Generic EpochSlots 
Instance details

Defined in Cardano.Chain.Slotting.EpochSlots

Associated Types

type Rep EpochSlots ∷ TypeType #

Methods

from ∷ EpochSlots → Rep EpochSlots x #

toRep EpochSlots x → EpochSlots #

Generic BlockNo 
Instance details

Defined in Cardano.Slotting.Block

Associated Types

type Rep BlockNo ∷ TypeType #

Methods

from ∷ BlockNo → Rep BlockNo x #

toRep BlockNo x → BlockNo #

Generic EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep EpochNo ∷ TypeType #

Methods

from ∷ EpochNo → Rep EpochNo x #

toRep EpochNo x → EpochNo #

Generic SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep SlotNo ∷ TypeType #

Methods

from ∷ SlotNo → Rep SlotNo x #

toRep SlotNo x → SlotNo #

Generic SystemStart 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep SystemStart ∷ TypeType #

Methods

from ∷ SystemStart → Rep SystemStart x #

toRep SystemStart x → SystemStart #

Generic NetworkMagic 
Instance details

Defined in Ouroboros.Network.Magic

Associated Types

type Rep NetworkMagic ∷ TypeType #

Methods

from ∷ NetworkMagic → Rep NetworkMagic x #

toRep NetworkMagic x → NetworkMagic #

Generic MempoolSizeAndCapacity 
Instance details

Defined in Ouroboros.Network.Protocol.LocalTxMonitor.Type

Associated Types

type Rep MempoolSizeAndCapacity ∷ TypeType #

Methods

from ∷ MempoolSizeAndCapacity → Rep MempoolSizeAndCapacity x #

toRep MempoolSizeAndCapacity x → MempoolSizeAndCapacity #

Generic EraMismatch 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.AcrossEras

Associated Types

type Rep EraMismatch ∷ TypeType #

Methods

from ∷ EraMismatch → Rep EraMismatch x #

toRep EraMismatch x → EraMismatch #

Generic Past 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.State.Types

Associated Types

type Rep Past ∷ TypeType #

Methods

from ∷ Past → Rep Past x #

toRep Past x → Past #

Generic EraParams 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.EraParams

Associated Types

type Rep EraParams ∷ TypeType #

Methods

from ∷ EraParams → Rep EraParams x #

toRep EraParams x → EraParams #

Generic SafeZone 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.EraParams

Associated Types

type Rep SafeZone ∷ TypeType #

Methods

from ∷ SafeZone → Rep SafeZone x #

toRep SafeZone x → SafeZone #

Generic Bound 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep Bound ∷ TypeType #

Methods

from ∷ Bound → Rep Bound x #

toRep Bound x → Bound #

Generic EraEnd 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep EraEnd ∷ TypeType #

Methods

from ∷ EraEnd → Rep EraEnd x #

toRep EraEnd x → EraEnd #

Generic EraSummary 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep EraSummary ∷ TypeType #

Methods

from ∷ EraSummary → Rep EraSummary x #

toRep EraSummary x → EraSummary #

Generic ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep ProtVer ∷ TypeType #

Methods

from ∷ ProtVer → Rep ProtVer x #

toRep ProtVer x → ProtVer #

Generic ByronPartialLedgerConfig 
Instance details

Defined in Ouroboros.Consensus.Cardano.CanHardFork

Associated Types

type Rep ByronPartialLedgerConfig ∷ TypeType #

Methods

from ∷ ByronPartialLedgerConfig → Rep ByronPartialLedgerConfig x #

toRep ByronPartialLedgerConfig x → ByronPartialLedgerConfig #

Generic BinaryBlockInfo 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep BinaryBlockInfo ∷ TypeType #

Methods

from ∷ BinaryBlockInfo → Rep BinaryBlockInfo x #

toRep BinaryBlockInfo x → BinaryBlockInfo #

Generic TriggerHardFork 
Instance details

Defined in Ouroboros.Consensus.HardFork.Simple

Associated Types

type Rep TriggerHardFork ∷ TypeType #

Methods

from ∷ TriggerHardFork → Rep TriggerHardFork x #

toRep TriggerHardFork x → TriggerHardFork #

Generic MaxMajorProtVer 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep MaxMajorProtVer ∷ TypeType #

Methods

from ∷ MaxMajorProtVer → Rep MaxMajorProtVer x #

toRep MaxMajorProtVer x → MaxMajorProtVer #

Generic PrefixLen 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep PrefixLen ∷ TypeType #

Methods

from ∷ PrefixLen → Rep PrefixLen x #

toRep PrefixLen x → PrefixLen #

Generic Config 
Instance details

Defined in Cardano.Chain.Genesis.Config

Associated Types

type Rep Config ∷ TypeType #

Methods

from ∷ Config → Rep Config x #

toRep Config x → Config #

Generic CompactAddress 
Instance details

Defined in Cardano.Chain.Common.Compact

Associated Types

type Rep CompactAddress ∷ TypeType #

Methods

from ∷ CompactAddress → Rep CompactAddress x #

toRep CompactAddress x → CompactAddress #

Generic RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep RequiresNetworkMagic ∷ TypeType #

Methods

from ∷ RequiresNetworkMagic → Rep RequiresNetworkMagic x #

toRep RequiresNetworkMagic x → RequiresNetworkMagic #

Generic ProtocolParameters 
Instance details

Defined in Cardano.Chain.Update.ProtocolParameters

Associated Types

type Rep ProtocolParameters ∷ TypeType #

Methods

from ∷ ProtocolParameters → Rep ProtocolParameters x #

toRep ProtocolParameters x → ProtocolParameters #

Generic ProtocolVersion 
Instance details

Defined in Cardano.Chain.Update.ProtocolVersion

Associated Types

type Rep ProtocolVersion ∷ TypeType #

Methods

from ∷ ProtocolVersion → Rep ProtocolVersion x #

toRep ProtocolVersion x → ProtocolVersion #

Generic PBftSignatureThreshold 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftSignatureThreshold ∷ TypeType #

Methods

from ∷ PBftSignatureThreshold → Rep PBftSignatureThreshold x #

toRep PBftSignatureThreshold x → PBftSignatureThreshold #

Generic ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep ProtocolMagicId ∷ TypeType #

Methods

from ∷ ProtocolMagicId → Rep ProtocolMagicId x #

toRep ProtocolMagicId x → ProtocolMagicId #

Generic ChunkInfo 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Chunks.Internal

Associated Types

type Rep ChunkInfo ∷ TypeType #

Methods

from ∷ ChunkInfo → Rep ChunkInfo x #

toRep ChunkInfo x → ChunkInfo #

Generic CoreNodeId 
Instance details

Defined in Ouroboros.Consensus.NodeId

Associated Types

type Rep CoreNodeId ∷ TypeType #

Methods

from ∷ CoreNodeId → Rep CoreNodeId x #

toRep CoreNodeId x → CoreNodeId #

Generic SoftwareVersion 
Instance details

Defined in Cardano.Chain.Update.SoftwareVersion

Associated Types

type Rep SoftwareVersion ∷ TypeType #

Methods

from ∷ SoftwareVersion → Rep SoftwareVersion x #

toRep SoftwareVersion x → SoftwareVersion #

Generic CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

Associated Types

type Rep CompactRedeemVerificationKey ∷ TypeType #

Methods

from ∷ CompactRedeemVerificationKey → Rep CompactRedeemVerificationKey x #

toRep CompactRedeemVerificationKey x → CompactRedeemVerificationKey #

Generic Lovelace 
Instance details

Defined in Cardano.Chain.Common.Lovelace

Associated Types

type Rep Lovelace ∷ TypeType #

Methods

from ∷ Lovelace → Rep Lovelace x #

toRep Lovelace x → Lovelace #

Generic ChainValidationState 
Instance details

Defined in Cardano.Chain.Block.Validation

Associated Types

type Rep ChainValidationState ∷ TypeType #

Methods

from ∷ ChainValidationState → Rep ChainValidationState x #

toRep ChainValidationState x → ChainValidationState #

Generic VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

Associated Types

type Rep VerificationKey ∷ TypeType #

Methods

from ∷ VerificationKey → Rep VerificationKey x #

toRep VerificationKey x → VerificationKey #

Generic GenesisHash 
Instance details

Defined in Cardano.Chain.Genesis.Hash

Associated Types

type Rep GenesisHash ∷ TypeType #

Methods

from ∷ GenesisHash → Rep GenesisHash x #

toRep GenesisHash x → GenesisHash #

Generic CandidateProtocolUpdate 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Associated Types

type Rep CandidateProtocolUpdate ∷ TypeType #

Methods

from ∷ CandidateProtocolUpdate → Rep CandidateProtocolUpdate x #

toRep CandidateProtocolUpdate x → CandidateProtocolUpdate #

Generic SlotNumber 
Instance details

Defined in Cardano.Chain.Slotting.SlotNumber

Associated Types

type Rep SlotNumber ∷ TypeType #

Methods

from ∷ SlotNumber → Rep SlotNumber x #

toRep SlotNumber x → SlotNumber #

Generic Endorsement 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Associated Types

type Rep Endorsement ∷ TypeType #

Methods

from ∷ Endorsement → Rep Endorsement x #

toRep Endorsement x → Endorsement #

Generic ByronHash 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Block

Associated Types

type Rep ByronHash ∷ TypeType #

Methods

from ∷ ByronHash → Rep ByronHash x #

toRep ByronHash x → ByronHash #

Generic Tx 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep Tx ∷ TypeType #

Methods

from ∷ Tx → Rep Tx x #

toRep Tx x → Tx #

Generic ByteSpan 
Instance details

Defined in Cardano.Binary.Annotated

Associated Types

type Rep ByteSpan ∷ TypeType #

Methods

from ∷ ByteSpan → Rep ByteSpan x #

toRep ByteSpan x → ByteSpan #

Generic ByronTransition 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Ledger

Associated Types

type Rep ByronTransition ∷ TypeType #

Methods

from ∷ ByronTransition → Rep ByronTransition x #

toRep ByronTransition x → ByronTransition #

Generic Map 
Instance details

Defined in Cardano.Chain.Delegation.Map

Associated Types

type Rep Map ∷ TypeType #

Methods

from ∷ Map → Rep Map x #

toRep Map x → Map #

Generic ScheduledDelegation 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep ScheduledDelegation ∷ TypeType #

Methods

from ∷ ScheduledDelegation → Rep ScheduledDelegation x #

toRep ScheduledDelegation x → ScheduledDelegation #

Generic EpochNumber 
Instance details

Defined in Cardano.Chain.Slotting.EpochNumber

Associated Types

type Rep EpochNumber ∷ TypeType #

Methods

from ∷ EpochNumber → Rep EpochNumber x #

toRep EpochNumber x → EpochNumber #

Generic State 
Instance details

Defined in Cardano.Chain.Update.Validation.Interface

Associated Types

type Rep State ∷ TypeType #

Methods

from ∷ State → Rep State x #

toRep State x → State #

Generic UTxO 
Instance details

Defined in Cardano.Chain.UTxO.UTxO

Associated Types

type Rep UTxO ∷ TypeType #

Methods

from ∷ UTxO → Rep UTxO x #

toRep UTxO x → UTxO #

Generic ByronOtherHeaderEnvelopeError 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.HeaderValidation

Associated Types

type Rep ByronOtherHeaderEnvelopeError ∷ TypeType #

Methods

from ∷ ByronOtherHeaderEnvelopeError → Rep ByronOtherHeaderEnvelopeError x #

toRep ByronOtherHeaderEnvelopeError x → ByronOtherHeaderEnvelopeError #

Generic PBftSelectView 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftSelectView ∷ TypeType #

Methods

from ∷ PBftSelectView → Rep PBftSelectView x #

toRep PBftSelectView x → PBftSelectView #

Generic ToSign 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep ToSign ∷ TypeType #

Methods

from ∷ ToSign → Rep ToSign x #

toRep ToSign x → ToSign #

Generic PraosEnvelopeError 
Instance details

Defined in Ouroboros.Consensus.Shelley.Protocol.Praos

Associated Types

type Rep PraosEnvelopeError ∷ TypeType #

Methods

from ∷ PraosEnvelopeError → Rep PraosEnvelopeError x #

toRep PraosEnvelopeError x → PraosEnvelopeError #

Generic PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep PositiveUnitInterval ∷ TypeType #

Methods

from ∷ PositiveUnitInterval → Rep PositiveUnitInterval x #

toRep PositiveUnitInterval x → PositiveUnitInterval #

Generic Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Network ∷ TypeType #

Methods

from ∷ Network → Rep Network x #

toRep Network x → Network #

Generic Coin 
Instance details

Defined in Cardano.Ledger.Coin

Associated Types

type Rep Coin ∷ TypeType #

Methods

from ∷ Coin → Rep Coin x #

toRep Coin x → Coin #

Generic PraosParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep PraosParams ∷ TypeType #

Methods

from ∷ PraosParams → Rep PraosParams x #

toRep PraosParams x → PraosParams #

Generic TPraosParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep TPraosParams ∷ TypeType #

Methods

from ∷ TPraosParams → Rep TPraosParams x #

toRep TPraosParams x → TPraosParams #

Generic Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Nonce ∷ TypeType #

Methods

from ∷ Nonce → Rep Nonce x #

toRep Nonce x → Nonce #

Generic KESInfo 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep KESInfo ∷ TypeType #

Methods

from ∷ KESInfo → Rep KESInfo x #

toRep KESInfo x → KESInfo #

Generic ChainPredicateFailure 
Instance details

Defined in Cardano.Ledger.Chain

Associated Types

type Rep ChainPredicateFailure ∷ TypeType #

Methods

from ∷ ChainPredicateFailure → Rep ChainPredicateFailure x #

toRep ChainPredicateFailure x → ChainPredicateFailure #

Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value ∷ TypeType #

Methods

from ∷ Value → Rep Value x #

toRep Value x → Value #

Generic AccountState 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep AccountState ∷ TypeType #

Methods

from ∷ AccountState → Rep AccountState x #

toRep AccountState x → AccountState #

Generic Ptr 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep Ptr ∷ TypeType #

Methods

from ∷ Ptr → Rep Ptr x #

toRep Ptr x → Ptr #

Generic DeltaCoin 
Instance details

Defined in Cardano.Ledger.Coin

Associated Types

type Rep DeltaCoin ∷ TypeType #

Methods

from ∷ DeltaCoin → Rep DeltaCoin x #

toRep DeltaCoin x → DeltaCoin #

Generic LogWeight 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep LogWeight ∷ TypeType #

Methods

from ∷ LogWeight → Rep LogWeight x #

toRep LogWeight x → LogWeight #

Generic Likelihood 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep Likelihood ∷ TypeType #

Methods

from ∷ Likelihood → Rep Likelihood x #

toRep Likelihood x → Likelihood #

Generic RewardType 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep RewardType ∷ TypeType #

Methods

from ∷ RewardType → Rep RewardType x #

toRep RewardType x → RewardType #

Generic AlonzoMeasure 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Mempool

Associated Types

type Rep AlonzoMeasure ∷ TypeType #

Methods

from ∷ AlonzoMeasure → Rep AlonzoMeasure x #

toRep AlonzoMeasure x → AlonzoMeasure #

Generic ExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep ExUnits ∷ TypeType #

Methods

from ∷ ExUnits → Rep ExUnits x #

toRep ExUnits x → ExUnits #

Generic Globals 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Globals ∷ TypeType #

Methods

from ∷ Globals → Rep Globals x #

toRep Globals x → Globals #

Generic StakePoolRelay 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep StakePoolRelay ∷ TypeType #

Methods

from ∷ StakePoolRelay → Rep StakePoolRelay x #

toRep StakePoolRelay x → StakePoolRelay #

Generic RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Associated Types

type Rep RewardParams ∷ TypeType #

Methods

from ∷ RewardParams → Rep RewardParams x #

toRep RewardParams x → RewardParams #

Generic RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Associated Types

type Rep RewardInfoPool ∷ TypeType #

Methods

from ∷ RewardInfoPool → Rep RewardInfoPool x #

toRep RewardInfoPool x → RewardInfoPool #

Generic UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep UnitInterval ∷ TypeType #

Methods

from ∷ UnitInterval → Rep UnitInterval x #

toRep UnitInterval x → UnitInterval #

Generic NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep NonNegativeInterval ∷ TypeType #

Methods

from ∷ NonNegativeInterval → Rep NonNegativeInterval x #

toRep NonNegativeInterval x → NonNegativeInterval #

Generic ShelleyTransition 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep ShelleyTransition ∷ TypeType #

Methods

from ∷ ShelleyTransition → Rep ShelleyTransition x #

toRep ShelleyTransition x → ShelleyTransition #

Generic SecurityParam 
Instance details

Defined in Ouroboros.Consensus.Config.SecurityParam

Associated Types

type Rep SecurityParam ∷ TypeType #

Methods

from ∷ SecurityParam → Rep SecurityParam x #

toRep SecurityParam x → SecurityParam #

Generic TransitionInfo 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.State.Types

Associated Types

type Rep TransitionInfo ∷ TypeType #

Methods

from ∷ TransitionInfo → Rep TransitionInfo x #

toRep TransitionInfo x → TransitionInfo #

Generic RelativeTime 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep RelativeTime ∷ TypeType #

Methods

from ∷ RelativeTime → Rep RelativeTime x #

toRep RelativeTime x → RelativeTime #

Generic CostModels 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep CostModels ∷ TypeType #

Methods

from ∷ CostModels → Rep CostModels x #

toRep CostModels x → CostModels #

Generic Prices 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep Prices ∷ TypeType #

Methods

from ∷ Prices → Rep Prices x #

toRep Prices x → Prices #

Generic AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

Associated Types

type Rep AlonzoGenesis ∷ TypeType #

Methods

from ∷ AlonzoGenesis → Rep AlonzoGenesis x #

toRep AlonzoGenesis x → AlonzoGenesis #

Generic Metadatum 
Instance details

Defined in Cardano.Ledger.Shelley.Metadata

Associated Types

type Rep Metadatum ∷ TypeType #

Methods

from ∷ Metadatum → Rep Metadatum x #

toRep Metadatum x → Metadatum #

Generic Language 
Instance details

Defined in Cardano.Ledger.Alonzo.Language

Associated Types

type Rep Language ∷ TypeType #

Methods

from ∷ Language → Rep Language x #

toRep Language x → Language #

Generic CostModel 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep CostModel ∷ TypeType #

Methods

from ∷ CostModel → Rep CostModel x #

toRep CostModel x → CostModel #

Generic Data 
Instance details

Defined in PlutusCore.Data

Associated Types

type Rep Data ∷ TypeType #

Methods

from ∷ Data → Rep Data x #

toRep Data x → Data #

Generic ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Associated Types

type Rep ExCPU ∷ TypeType #

Methods

from ∷ ExCPU → Rep ExCPU x #

toRep ExCPU x → ExCPU #

Generic ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Associated Types

type Rep ExMemory ∷ TypeType #

Methods

from ∷ ExMemory → Rep ExMemory x #

toRep ExMemory x → ExMemory #

Generic ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Associated Types

type Rep ExBudget ∷ TypeType #

Methods

from ∷ ExBudget → Rep ExBudget x #

toRep ExBudget x → ExBudget #

Generic TyName 
Instance details

Defined in PlutusCore.Name

Associated Types

type Rep TyName ∷ TypeType #

Methods

from ∷ TyName → Rep TyName x #

toRep TyName x → TyName #

Generic Name 
Instance details

Defined in PlutusCore.Name

Associated Types

type Rep Name ∷ TypeType #

Methods

from ∷ Name → Rep Name x #

toRep Name x → Name #

Generic Strictness 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep Strictness ∷ TypeType #

Methods

from ∷ Strictness → Rep Strictness x #

toRep Strictness x → Strictness #

Generic Recursivity 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep Recursivity ∷ TypeType #

Methods

from ∷ Recursivity → Rep Recursivity x #

toRep Recursivity x → Recursivity #

Generic DeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep DeBruijn ∷ TypeType #

Methods

from ∷ DeBruijn → Rep DeBruijn x #

toRep DeBruijn x → DeBruijn #

Generic NamedDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep NamedDeBruijn ∷ TypeType #

Methods

from ∷ NamedDeBruijn → Rep NamedDeBruijn x #

toRep NamedDeBruijn x → NamedDeBruijn #

Generic NamedTyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep NamedTyDeBruijn ∷ TypeType #

Methods

from ∷ NamedTyDeBruijn → Rep NamedTyDeBruijn x #

toRep NamedTyDeBruijn x → NamedTyDeBruijn #

Generic Index 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep Index ∷ TypeType #

Methods

from ∷ Index → Rep Index x #

toRep Index x → Index #

Generic TyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep TyDeBruijn ∷ TypeType #

Methods

from ∷ TyDeBruijn → Rep TyDeBruijn x #

toRep TyDeBruijn x → TyDeBruijn #

Generic ParseError 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep ParseError ∷ TypeType #

Methods

from ∷ ParseError → Rep ParseError x #

toRep ParseError x → ParseError #

Generic DefaultFun 
Instance details

Defined in PlutusCore.Default.Builtins

Associated Types

type Rep DefaultFun ∷ TypeType #

Methods

from ∷ DefaultFun → Rep DefaultFun x #

toRep DefaultFun x → DefaultFun #

Generic SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep SourcePos ∷ TypeType #

Methods

from ∷ SourcePos → Rep SourcePos x #

toRep SourcePos x → SourcePos #

Generic FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep FreeVariableError ∷ TypeType #

Methods

from ∷ FreeVariableError → Rep FreeVariableError x #

toRep FreeVariableError x → FreeVariableError #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo ∷ TypeType #

Methods

from ∷ ConstructorInfo → Rep ConstructorInfo x #

toRep ConstructorInfo x → ConstructorInfo #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo ∷ TypeType #

Methods

from ∷ DatatypeInfo → Rep DatatypeInfo x #

toRep DatatypeInfo x → DatatypeInfo #

Generic Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep Desirability ∷ TypeType #

Methods

from ∷ Desirability → Rep Desirability x #

toRep Desirability x → Desirability #

Generic PoolMetadata 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep PoolMetadata ∷ TypeType #

Methods

from ∷ PoolMetadata → Rep PoolMetadata x #

toRep PoolMetadata x → PoolMetadata #

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6 ∷ TypeType #

Methods

from ∷ IPv6 → Rep IPv6 x #

toRep IPv6 x → IPv6 #

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4 ∷ TypeType #

Methods

from ∷ IPv4 → Rep IPv4 x #

toRep IPv4 x → IPv4 #

Generic FsPath 
Instance details

Defined in Ouroboros.Consensus.Storage.FS.API.Types

Associated Types

type Rep FsPath ∷ TypeType #

Methods

from ∷ FsPath → Rep FsPath x #

toRep FsPath x → FsPath #

Generic Time 
Instance details

Defined in Control.Monad.Class.MonadTime

Associated Types

type Rep Time ∷ TypeType #

Methods

from ∷ Time → Rep Time x #

toRep Time x → Time #

Generic ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

Associated Types

type Rep ProtocolParameters ∷ TypeType #

Methods

from ∷ ProtocolParameters → Rep ProtocolParameters x #

toRep ProtocolParameters x → ProtocolParameters #

Generic SlotLength 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep SlotLength ∷ TypeType #

Methods

from ∷ SlotLength → Rep SlotLength x #

toRep SlotLength x → SlotLength #

Generic TimeInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep TimeInEra ∷ TypeType #

Methods

from ∷ TimeInEra → Rep TimeInEra x #

toRep TimeInEra x → TimeInEra #

Generic SlotInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep SlotInEra ∷ TypeType #

Methods

from ∷ SlotInEra → Rep SlotInEra x #

toRep SlotInEra x → SlotInEra #

Generic SlotInEpoch 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep SlotInEpoch ∷ TypeType #

Methods

from ∷ SlotInEpoch → Rep SlotInEpoch x #

toRep SlotInEpoch x → SlotInEpoch #

Generic EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep EpochSize ∷ TypeType #

Methods

from ∷ EpochSize → Rep EpochSize x #

toRep EpochSize x → EpochSize #

Generic IsEBB 
Instance details

Defined in Ouroboros.Consensus.Block.EBB

Associated Types

type Rep IsEBB ∷ TypeType #

Methods

from ∷ IsEBB → Rep IsEBB x #

toRep IsEBB x → IsEBB #

Generic TicknPredicateFailure 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Tickn

Associated Types

type Rep TicknPredicateFailure ∷ TypeType #

Methods

from ∷ TicknPredicateFailure → Rep TicknPredicateFailure x #

toRep TicknPredicateFailure x → TicknPredicateFailure #

Generic TicknState 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Tickn

Associated Types

type Rep TicknState ∷ TypeType #

Methods

from ∷ TicknState → Rep TicknState x #

toRep TicknState x → TicknState #

Generic KESPeriod 
Instance details

Defined in Cardano.Protocol.TPraos.OCert

Associated Types

type Rep KESPeriod ∷ TypeType #

Methods

from ∷ KESPeriod → Rep KESPeriod x #

toRep KESPeriod x → KESPeriod #

Generic ActiveSlotCoeff 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep ActiveSlotCoeff ∷ TypeType #

Methods

from ∷ ActiveSlotCoeff → Rep ActiveSlotCoeff x #

toRep ActiveSlotCoeff x → ActiveSlotCoeff #

Generic ValidityInterval 
Instance details

Defined in Cardano.Ledger.ShelleyMA.Timelocks

Associated Types

type Rep ValidityInterval ∷ TypeType #

Methods

from ∷ ValidityInterval → Rep ValidityInterval x #

toRep ValidityInterval x → ValidityInterval #

Generic InputVRF 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.VRF

Associated Types

type Rep InputVRF ∷ TypeType #

Methods

from ∷ InputVRF → Rep InputVRF x #

toRep InputVRF x → InputVRF #

Generic EpochInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep EpochInEra ∷ TypeType #

Methods

from ∷ EpochInEra → Rep EpochInEra x #

toRep EpochInEra x → EpochInEra #

Generic TimeInSlot 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep TimeInSlot ∷ TypeType #

Methods

from ∷ TimeInSlot → Rep TimeInSlot x #

toRep TimeInSlot x → TimeInSlot #

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuth ∷ TypeType #

Methods

from ∷ URIAuth → Rep URIAuth x #

toRep URIAuth x → URIAuth #

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URI ∷ TypeType #

Methods

from ∷ URI → Rep URI x #

toRep URI x → URI #

Generic BaseUrl 
Instance details

Defined in Servant.Client.Core.BaseUrl

Associated Types

type Rep BaseUrl ∷ TypeType #

Methods

from ∷ BaseUrl → Rep BaseUrl x #

toRep BaseUrl x → BaseUrl #

Generic Scheme 
Instance details

Defined in Servant.Client.Core.BaseUrl

Associated Types

type Rep Scheme ∷ TypeType #

Methods

from ∷ Scheme → Rep Scheme x #

toRep Scheme x → Scheme #

Generic ClientError 
Instance details

Defined in Servant.Client.Core.ClientError

Associated Types

type Rep ClientError ∷ TypeType #

Methods

from ∷ ClientError → Rep ClientError x #

toRep ClientError x → ClientError #

Generic RequestBody 
Instance details

Defined in Servant.Client.Core.Request

Associated Types

type Rep RequestBody ∷ TypeType #

Methods

from ∷ RequestBody → Rep RequestBody x #

toRep RequestBody x → RequestBody #

Generic CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Associated Types

type Rep CabalSpecVersion ∷ TypeType #

Methods

from ∷ CabalSpecVersion → Rep CabalSpecVersion x #

toRep CabalSpecVersion x → CabalSpecVersion #

Generic Structure 
Instance details

Defined in Distribution.Utils.Structured

Associated Types

type Rep Structure ∷ TypeType #

Methods

from ∷ Structure → Rep Structure x #

toRep Structure x → Structure #

Generic PError 
Instance details

Defined in Distribution.Parsec.Error

Associated Types

type Rep PError ∷ TypeType #

Methods

from ∷ PError → Rep PError x #

toRep PError x → PError #

Generic Position 
Instance details

Defined in Distribution.Parsec.Position

Associated Types

type Rep Position ∷ TypeType #

Methods

from ∷ Position → Rep Position x #

toRep Position x → Position #

Generic PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarnType ∷ TypeType #

Methods

from ∷ PWarnType → Rep PWarnType x #

toRep PWarnType x → PWarnType #

Generic PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarning ∷ TypeType #

Methods

from ∷ PWarning → Rep PWarning x #

toRep PWarning x → PWarning #

Generic Arch 
Instance details

Defined in Distribution.System

Associated Types

type Rep Arch ∷ TypeType #

Methods

from ∷ Arch → Rep Arch x #

toRep Arch x → Arch #

Generic OS 
Instance details

Defined in Distribution.System

Associated Types

type Rep OS ∷ TypeType #

Methods

from ∷ OS → Rep OS x #

toRep OS x → OS #

Generic Platform 
Instance details

Defined in Distribution.System

Associated Types

type Rep Platform ∷ TypeType #

Methods

from ∷ Platform → Rep Platform x #

toRep Platform x → Platform #

Generic AdjacencyIntMap 
Instance details

Defined in Algebra.Graph.AdjacencyIntMap

Associated Types

type Rep AdjacencyIntMap ∷ TypeType #

Methods

from ∷ AdjacencyIntMap → Rep AdjacencyIntMap x #

toRep AdjacencyIntMap x → AdjacencyIntMap #

Generic Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Associated Types

type Rep Alphabet ∷ TypeType #

Methods

from ∷ Alphabet → Rep Alphabet x #

toRep Alphabet x → Alphabet #

Generic ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Associated Types

type Rep ByteString64 ∷ TypeType #

Methods

from ∷ ByteString64 → Rep ByteString64 x #

toRep ByteString64 x → ByteString64 #

Generic Address 
Instance details

Defined in Cardano.Chain.Common.Address

Associated Types

type Rep Address ∷ TypeType #

Methods

from ∷ Address → Rep Address x #

toRep Address x → Address #

Generic NetworkMagic 
Instance details

Defined in Cardano.Chain.Common.NetworkMagic

Associated Types

type Rep NetworkMagic ∷ TypeType #

Methods

from ∷ NetworkMagic → Rep NetworkMagic x #

toRep NetworkMagic x → NetworkMagic #

Generic AddrAttributes 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Associated Types

type Rep AddrAttributes ∷ TypeType #

Methods

from ∷ AddrAttributes → Rep AddrAttributes x #

toRep AddrAttributes x → AddrAttributes #

Generic HDAddressPayload 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Associated Types

type Rep HDAddressPayload ∷ TypeType #

Methods

from ∷ HDAddressPayload → Rep HDAddressPayload x #

toRep HDAddressPayload x → HDAddressPayload #

Generic Address' 
Instance details

Defined in Cardano.Chain.Common.Address

Associated Types

type Rep Address' ∷ TypeType #

Methods

from ∷ Address' → Rep Address' x #

toRep Address' x → Address' #

Generic PubKeyHash 
Instance details

Defined in Plutus.V1.Ledger.Crypto

Associated Types

type Rep PubKeyHash ∷ TypeType #

Methods

from ∷ PubKeyHash → Rep PubKeyHash x #

toRep PubKeyHash x → PubKeyHash #

Generic MIRPot 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep MIRPot ∷ TypeType #

Methods

from ∷ MIRPot → Rep MIRPot x #

toRep MIRPot x → MIRPot #

Generic Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Url ∷ TypeType #

Methods

from ∷ Url → Rep Url x #

toRep Url x → Url #

Generic SignKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep SignKey ∷ TypeType #

Methods

from ∷ SignKey → Rep SignKey x #

toRep SignKey x → SignKey #

Generic VerKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep VerKey ∷ TypeType #

Methods

from ∷ VerKey → Rep VerKey x #

toRep VerKey x → VerKey #

Generic XPub 
Instance details

Defined in Cardano.Crypto.Wallet

Associated Types

type Rep XPub ∷ TypeType #

Methods

from ∷ XPub → Rep XPub x #

toRep XPub x → XPub #

Generic CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Associated Types

type Rep CekMachineCosts ∷ TypeType #

Methods

from ∷ CekMachineCosts → Rep CekMachineCosts x #

toRep CekMachineCosts x → CekMachineCosts #

Generic TxInWitness 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Associated Types

type Rep TxInWitness ∷ TypeType #

Methods

from ∷ TxInWitness → Rep TxInWitness x #

toRep TxInWitness x → TxInWitness #

Generic TxSigData 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Associated Types

type Rep TxSigData ∷ TypeType #

Methods

from ∷ TxSigData → Rep TxSigData x #

toRep TxSigData x → TxSigData #

Generic SignTag 
Instance details

Defined in Cardano.Crypto.Signing.Tag

Associated Types

type Rep SignTag ∷ TypeType #

Methods

from ∷ SignTag → Rep SignTag x #

toRep SignTag x → SignTag #

Generic IsValid 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep IsValid ∷ TypeType #

Methods

from ∷ IsValid → Rep IsValid x #

toRep IsValid x → IsValid #

Generic LangDepView 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep LangDepView ∷ TypeType #

Methods

from ∷ LangDepView → Rep LangDepView x #

toRep LangDepView x → LangDepView #

Generic RdmrPtr 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Associated Types

type Rep RdmrPtr ∷ TypeType #

Methods

from ∷ RdmrPtr → Rep RdmrPtr x #

toRep RdmrPtr x → RdmrPtr #

Generic TxIn 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep TxIn ∷ TypeType #

Methods

from ∷ TxIn → Rep TxIn x #

toRep TxIn x → TxIn #

Generic XPub 
Instance details

Defined in Cardano.Crypto.Wallet.Pure

Associated Types

type Rep XPub ∷ TypeType #

Methods

from ∷ XPub → Rep XPub x #

toRep XPub x → XPub #

Generic Point 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep Point ∷ TypeType #

Methods

from ∷ Point → Rep Point x #

toRep Point x → Point #

Generic Proof 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep Proof ∷ TypeType #

Methods

from ∷ Proof → Rep Proof x #

toRep Proof x → Proof #

Generic Output 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep Output ∷ TypeType #

Methods

from ∷ Output → Rep Output x #

toRep Output x → Output #

Generic RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

Associated Types

type Rep RedeemVerificationKey ∷ TypeType #

Methods

from ∷ RedeemVerificationKey → Rep RedeemVerificationKey x #

toRep RedeemVerificationKey x → RedeemVerificationKey #

Generic RedeemSigningKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.SigningKey

Associated Types

type Rep RedeemSigningKey ∷ TypeType #

Methods

from ∷ RedeemSigningKey → Rep RedeemSigningKey x #

toRep RedeemSigningKey x → RedeemSigningKey #

Generic Tag 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep Tag ∷ TypeType #

Methods

from ∷ Tag → Rep Tag x #

toRep Tag x → Tag #

Generic EvaluationContext 
Instance details

Defined in Plutus.ApiCommon

Associated Types

type Rep EvaluationContext ∷ TypeType #

Methods

from ∷ EvaluationContext → Rep EvaluationContext x #

toRep EvaluationContext x → EvaluationContext #

Generic ScriptResult 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep ScriptResult ∷ TypeType #

Methods

from ∷ ScriptResult → Rep ScriptResult x #

toRep ScriptResult x → ScriptResult #

Generic PlutusDebug 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep PlutusDebug ∷ TypeType #

Methods

from ∷ PlutusDebug → Rep PlutusDebug x #

toRep PlutusDebug x → PlutusDebug #

Generic ScriptFailure 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep ScriptFailure ∷ TypeType #

Methods

from ∷ ScriptFailure → Rep ScriptFailure x #

toRep ScriptFailure x → ScriptFailure #

Generic StakingCredential 
Instance details

Defined in Plutus.V1.Ledger.Credential

Associated Types

type Rep StakingCredential ∷ TypeType #

Methods

from ∷ StakingCredential → Rep StakingCredential x #

toRep StakingCredential x → StakingCredential #

Generic POSIXTime 
Instance details

Defined in Plutus.V1.Ledger.Time

Associated Types

type Rep POSIXTime ∷ TypeType #

Methods

from ∷ POSIXTime → Rep POSIXTime x #

toRep POSIXTime x → POSIXTime #

Generic Address 
Instance details

Defined in Plutus.V1.Ledger.Address

Associated Types

type Rep Address ∷ TypeType #

Methods

from ∷ Address → Rep Address x #

toRep Address x → Address #

Generic TxInInfo 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Associated Types

type Rep TxInInfo ∷ TypeType #

Methods

from ∷ TxInInfo → Rep TxInInfo x #

toRep TxInInfo x → TxInInfo #

Generic TxOut 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxOut ∷ TypeType #

Methods

from ∷ TxOut → Rep TxOut x #

toRep TxOut x → TxOut #

Generic CurrencySymbol 
Instance details

Defined in Plutus.V1.Ledger.Value

Associated Types

type Rep CurrencySymbol ∷ TypeType #

Methods

from ∷ CurrencySymbol → Rep CurrencySymbol x #

toRep CurrencySymbol x → CurrencySymbol #

Generic TokenName 
Instance details

Defined in Plutus.V1.Ledger.Value

Associated Types

type Rep TokenName ∷ TypeType #

Methods

from ∷ TokenName → Rep TokenName x #

toRep TokenName x → TokenName #

Generic TxInfo 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Associated Types

type Rep TxInfo ∷ TypeType #

Methods

from ∷ TxInfo → Rep TxInfo x #

toRep TxInfo x → TxInfo #

Generic TxInfo 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Associated Types

type Rep TxInfo ∷ TypeType #

Methods

from ∷ TxInfo → Rep TxInfo x #

toRep TxInfo x → TxInfo #

Generic Credential 
Instance details

Defined in Plutus.V1.Ledger.Credential

Associated Types

type Rep Credential ∷ TypeType #

Methods

from ∷ Credential → Rep Credential x #

toRep Credential x → Credential #

Generic DCert 
Instance details

Defined in Plutus.V1.Ledger.DCert

Associated Types

type Rep DCert ∷ TypeType #

Methods

from ∷ DCert → Rep DCert x #

toRep DCert x → DCert #

Generic DatumHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep DatumHash ∷ TypeType #

Methods

from ∷ DatumHash → Rep DatumHash x #

toRep DatumHash x → DatumHash #

Generic Datum 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep Datum ∷ TypeType #

Methods

from ∷ Datum → Rep Datum x #

toRep Datum x → Datum #

Generic ValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep ValidatorHash ∷ TypeType #

Methods

from ∷ ValidatorHash → Rep ValidatorHash x #

toRep ValidatorHash x → ValidatorHash #

Generic ScriptPurpose 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Associated Types

type Rep ScriptPurpose ∷ TypeType #

Methods

from ∷ ScriptPurpose → Rep ScriptPurpose x #

toRep ScriptPurpose x → ScriptPurpose #

Generic Value 
Instance details

Defined in Plutus.V1.Ledger.Value

Associated Types

type Rep Value ∷ TypeType #

Methods

from ∷ Value → Rep Value x #

toRep Value x → Value #

Generic TxId 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxId ∷ TypeType #

Methods

from ∷ TxId → Rep TxId x #

toRep TxId x → TxId #

Generic TxOutRef 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxOutRef ∷ TypeType #

Methods

from ∷ TxOutRef → Rep TxOutRef x #

toRep TxOutRef x → TxOutRef #

Generic FailureDescription 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep FailureDescription ∷ TypeType #

Methods

from ∷ FailureDescription → Rep FailureDescription x #

toRep FailureDescription x → FailureDescription #

Generic TagMismatchDescription 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep TagMismatchDescription ∷ TypeType #

Methods

from ∷ TagMismatchDescription → Rep TagMismatchDescription x #

toRep TagMismatchDescription x → TagMismatchDescription #

Generic DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep DnsName ∷ TypeType #

Methods

from ∷ DnsName → Rep DnsName x #

toRep DnsName x → DnsName #

Generic Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Port ∷ TypeType #

Methods

from ∷ Port → Rep Port x #

toRep Port x → Port #

Generic PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep PositiveInterval ∷ TypeType #

Methods

from ∷ PositiveInterval → Rep PositiveInterval x #

toRep PositiveInterval x → PositiveInterval #

Generic Seed 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep Seed ∷ TypeType #

Methods

from ∷ Seed → Rep Seed x #

toRep Seed x → Seed #

Generic ChainDifficulty 
Instance details

Defined in Cardano.Chain.Common.ChainDifficulty

Associated Types

type Rep ChainDifficulty ∷ TypeType #

Methods

from ∷ ChainDifficulty → Rep ChainDifficulty x #

toRep ChainDifficulty x → ChainDifficulty #

Generic Proof 
Instance details

Defined in Cardano.Chain.Block.Proof

Associated Types

type Rep Proof ∷ TypeType #

Methods

from ∷ Proof → Rep Proof x #

toRep Proof x → Proof #

Generic SscPayload 
Instance details

Defined in Cardano.Chain.Ssc

Associated Types

type Rep SscPayload ∷ TypeType #

Methods

from ∷ SscPayload → Rep SscPayload x #

toRep SscPayload x → SscPayload #

Generic ProposalBody 
Instance details

Defined in Cardano.Chain.Update.Proposal

Associated Types

type Rep ProposalBody ∷ TypeType #

Methods

from ∷ ProposalBody → Rep ProposalBody x #

toRep ProposalBody x → ProposalBody #

Generic SscProof 
Instance details

Defined in Cardano.Chain.Ssc

Associated Types

type Rep SscProof ∷ TypeType #

Methods

from ∷ SscProof → Rep SscProof x #

toRep SscProof x → SscProof #

Generic EpochAndSlotCount 
Instance details

Defined in Cardano.Chain.Slotting.EpochAndSlotCount

Associated Types

type Rep EpochAndSlotCount ∷ TypeType #

Methods

from ∷ EpochAndSlotCount → Rep EpochAndSlotCount x #

toRep EpochAndSlotCount x → EpochAndSlotCount #

Generic TxProof 
Instance details

Defined in Cardano.Chain.UTxO.TxProof

Associated Types

type Rep TxProof ∷ TypeType #

Methods

from ∷ TxProof → Rep TxProof x #

toRep TxProof x → TxProof #

Generic CompactTxIn 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxIn ∷ TypeType #

Methods

from ∷ CompactTxIn → Rep CompactTxIn x #

toRep CompactTxIn x → CompactTxIn #

Generic CompactTxOut 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxOut ∷ TypeType #

Methods

from ∷ CompactTxOut → Rep CompactTxOut x #

toRep CompactTxOut x → CompactTxOut #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Associated Types

type Rep State ∷ TypeType #

Methods

from ∷ State → Rep State x #

toRep State x → State #

Generic BlockCount 
Instance details

Defined in Cardano.Chain.Common.BlockCount

Associated Types

type Rep BlockCount ∷ TypeType #

Methods

from ∷ BlockCount → Rep BlockCount x #

toRep BlockCount x → BlockCount #

Generic UTxOConfiguration 
Instance details

Defined in Cardano.Chain.UTxO.UTxOConfiguration

Associated Types

type Rep UTxOConfiguration ∷ TypeType #

Methods

from ∷ UTxOConfiguration → Rep UTxOConfiguration x #

toRep UTxOConfiguration x → UTxOConfiguration #

Generic ApplicationName 
Instance details

Defined in Cardano.Chain.Update.ApplicationName

Associated Types

type Rep ApplicationName ∷ TypeType #

Methods

from ∷ ApplicationName → Rep ApplicationName x #

toRep ApplicationName x → ApplicationName #

Generic ApplicationVersion 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep ApplicationVersion ∷ TypeType #

Methods

from ∷ ApplicationVersion → Rep ApplicationVersion x #

toRep ApplicationVersion x → ApplicationVersion #

Generic ProtocolUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep ProtocolUpdateProposal ∷ TypeType #

Methods

from ∷ ProtocolUpdateProposal → Rep ProtocolUpdateProposal x #

toRep ProtocolUpdateProposal x → ProtocolUpdateProposal #

Generic SoftwareUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep SoftwareUpdateProposal ∷ TypeType #

Methods

from ∷ SoftwareUpdateProposal → Rep SoftwareUpdateProposal x #

toRep SoftwareUpdateProposal x → SoftwareUpdateProposal #

Generic SlotCount 
Instance details

Defined in Cardano.Chain.Slotting.SlotCount

Associated Types

type Rep SlotCount ∷ TypeType #

Methods

from ∷ SlotCount → Rep SlotCount x #

toRep SlotCount x → SlotCount #

Generic TxOut 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep TxOut ∷ TypeType #

Methods

from ∷ TxOut → Rep TxOut x #

toRep TxOut x → TxOut #

Generic AddrType 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Associated Types

type Rep AddrType ∷ TypeType #

Methods

from ∷ AddrType → Rep AddrType x #

toRep AddrType x → AddrType #

Generic CompactTxId 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxId ∷ TypeType #

Methods

from ∷ CompactTxId → Rep CompactTxId x #

toRep CompactTxId x → CompactTxId #

Generic Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Associated Types

type Rep Environment ∷ TypeType #

Methods

from ∷ Environment → Rep Environment x #

toRep Environment x → Environment #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep State ∷ TypeType #

Methods

from ∷ State → Rep State x #

toRep State x → State #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Activation

Associated Types

type Rep State ∷ TypeType #

Methods

from ∷ State → Rep State x #

toRep State x → State #

Generic Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep Environment ∷ TypeType #

Methods

from ∷ Environment → Rep Environment x #

toRep Environment x → Environment #

Generic UnparsedFields 
Instance details

Defined in Cardano.Chain.Common.Attributes

Associated Types

type Rep UnparsedFields ∷ TypeType #

Methods

from ∷ UnparsedFields → Rep UnparsedFields x #

toRep UnparsedFields x → UnparsedFields #

Generic AddrSpendingData 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Associated Types

type Rep AddrSpendingData ∷ TypeType #

Methods

from ∷ AddrSpendingData → Rep AddrSpendingData x #

toRep AddrSpendingData x → AddrSpendingData #

Generic LovelacePortion 
Instance details

Defined in Cardano.Chain.Common.LovelacePortion

Associated Types

type Rep LovelacePortion ∷ TypeType #

Methods

from ∷ LovelacePortion → Rep LovelacePortion x #

toRep LovelacePortion x → LovelacePortion #

Generic TxFeePolicy 
Instance details

Defined in Cardano.Chain.Common.TxFeePolicy

Associated Types

type Rep TxFeePolicy ∷ TypeType #

Methods

from ∷ TxFeePolicy → Rep TxFeePolicy x #

toRep TxFeePolicy x → TxFeePolicy #

Generic TxSizeLinear 
Instance details

Defined in Cardano.Chain.Common.TxSizeLinear

Associated Types

type Rep TxSizeLinear ∷ TypeType #

Methods

from ∷ TxSizeLinear → Rep TxSizeLinear x #

toRep TxSizeLinear x → TxSizeLinear #

Generic GenesisData 
Instance details

Defined in Cardano.Chain.Genesis.Data

Associated Types

type Rep GenesisData ∷ TypeType #

Methods

from ∷ GenesisData → Rep GenesisData x #

toRep GenesisData x → GenesisData #

Generic SoftforkRule 
Instance details

Defined in Cardano.Chain.Update.SoftforkRule

Associated Types

type Rep SoftforkRule ∷ TypeType #

Methods

from ∷ SoftforkRule → Rep SoftforkRule x #

toRep SoftforkRule x → SoftforkRule #

Generic GeneratedSecrets 
Instance details

Defined in Cardano.Chain.Genesis.Generate

Associated Types

type Rep GeneratedSecrets ∷ TypeType #

Methods

from ∷ GeneratedSecrets → Rep GeneratedSecrets x #

toRep GeneratedSecrets x → GeneratedSecrets #

Generic PoorSecret 
Instance details

Defined in Cardano.Chain.Genesis.Generate

Associated Types

type Rep PoorSecret ∷ TypeType #

Methods

from ∷ PoorSecret → Rep PoorSecret x #

toRep PoorSecret x → PoorSecret #

Generic GenesisSpec 
Instance details

Defined in Cardano.Chain.Genesis.Spec

Associated Types

type Rep GenesisSpec ∷ TypeType #

Methods

from ∷ GenesisSpec → Rep GenesisSpec x #

toRep GenesisSpec x → GenesisSpec #

Generic FakeAvvmOptions 
Instance details

Defined in Cardano.Chain.Genesis.Initializer

Associated Types

type Rep FakeAvvmOptions ∷ TypeType #

Methods

from ∷ FakeAvvmOptions → Rep FakeAvvmOptions x #

toRep FakeAvvmOptions x → FakeAvvmOptions #

Generic InstallerHash 
Instance details

Defined in Cardano.Chain.Update.InstallerHash

Associated Types

type Rep InstallerHash ∷ TypeType #

Methods

from ∷ InstallerHash → Rep InstallerHash x #

toRep InstallerHash x → InstallerHash #

Generic SystemTag 
Instance details

Defined in Cardano.Chain.Update.SystemTag

Associated Types

type Rep SystemTag ∷ TypeType #

Methods

from ∷ SystemTag → Rep SystemTag x #

toRep SystemTag x → SystemTag #

Generic ProtocolParametersUpdate 
Instance details

Defined in Cardano.Chain.Update.ProtocolParametersUpdate

Associated Types

type Rep ProtocolParametersUpdate ∷ TypeType #

Methods

from ∷ ProtocolParametersUpdate → Rep ProtocolParametersUpdate x #

toRep ProtocolParametersUpdate x → ProtocolParametersUpdate #

Generic Environment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Associated Types

type Rep Environment ∷ TypeType #

Methods

from ∷ Environment → Rep Environment x #

toRep Environment x → Environment #

Generic RegistrationEnvironment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Associated Types

type Rep RegistrationEnvironment ∷ TypeType #

Methods

from ∷ RegistrationEnvironment → Rep RegistrationEnvironment x #

toRep RegistrationEnvironment x → RegistrationEnvironment #

Generic Duration 
Instance details

Defined in Cardano.Ledger.Slot

Associated Types

type Rep Duration ∷ TypeType #

Methods

from ∷ Duration → Rep Duration x #

toRep Duration x → Duration #

Generic ChainChecksPParams 
Instance details

Defined in Cardano.Ledger.Chain

Associated Types

type Rep ChainChecksPParams ∷ TypeType #

Methods

from ∷ ChainChecksPParams → Rep ChainChecksPParams x #

toRep ChainChecksPParams x → ChainChecksPParams #

Generic ChainCode 
Instance details

Defined in Cardano.Ledger.Shelley.Address.Bootstrap

Associated Types

type Rep ChainCode ∷ TypeType #

Methods

from ∷ ChainCode → Rep ChainCode x #

toRep ChainCode x → ChainCode #

Generic Histogram 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep Histogram ∷ TypeType #

Methods

from ∷ Histogram → Rep Histogram x #

toRep Histogram x → Histogram #

Generic PerformanceEstimate 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep PerformanceEstimate ∷ TypeType #

Methods

from ∷ PerformanceEstimate → Rep PerformanceEstimate x #

toRep PerformanceEstimate x → PerformanceEstimate #

Generic StakeShare 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep StakeShare ∷ TypeType #

Methods

from ∷ StakeShare → Rep StakeShare x #

toRep StakeShare x → StakeShare #

Generic VotingPeriod 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ppup

Associated Types

type Rep VotingPeriod ∷ TypeType #

Methods

from ∷ VotingPeriod → Rep VotingPeriod x #

toRep VotingPeriod x → VotingPeriod #

Generic Filler 
Instance details

Defined in Flat.Filler

Associated Types

type Rep Filler ∷ TypeType #

Methods

from ∷ Filler → Rep Filler x #

toRep Filler x → Filler #

Generic Half 
Instance details

Defined in Numeric.Half.Internal

Associated Types

type Rep Half ∷ TypeType #

Methods

from ∷ Half → Rep Half x #

toRep Half x → Half #

Generic NewtonParam 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep NewtonParam ∷ TypeType #

Methods

from ∷ NewtonParam → Rep NewtonParam x #

toRep NewtonParam x → NewtonParam #

Generic NewtonStep 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep NewtonStep ∷ TypeType #

Methods

from ∷ NewtonStep → Rep NewtonStep x #

toRep NewtonStep x → NewtonStep #

Generic RiddersParam 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep RiddersParam ∷ TypeType #

Methods

from ∷ RiddersParam → Rep RiddersParam x #

toRep RiddersParam x → RiddersParam #

Generic RiddersStep 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep RiddersStep ∷ TypeType #

Methods

from ∷ RiddersStep → Rep RiddersStep x #

toRep RiddersStep x → RiddersStep #

Generic Tolerance 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep Tolerance ∷ TypeType #

Methods

from ∷ Tolerance → Rep Tolerance x #

toRep Tolerance x → Tolerance #

Generic Pos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep Pos ∷ TypeType #

Methods

from ∷ Pos → Rep Pos x #

toRep Pos x → Pos #

Generic InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep InvalidPosException ∷ TypeType #

Methods

from ∷ InvalidPosException → Rep InvalidPosException x #

toRep InvalidPosException x → InvalidPosException #

Generic MuxError 
Instance details

Defined in Network.Mux.Trace

Associated Types

type Rep MuxError ∷ TypeType #

Methods

from ∷ MuxError → Rep MuxError x #

toRep MuxError x → MuxError #

Generic SDUSize 
Instance details

Defined in Network.Mux.Types

Associated Types

type Rep SDUSize ∷ TypeType #

Methods

from ∷ SDUSize → Rep SDUSize x #

toRep SDUSize x → SDUSize #

Generic MaxSlotNo 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep MaxSlotNo ∷ TypeType #

Methods

from ∷ MaxSlotNo → Rep MaxSlotNo x #

toRep MaxSlotNo x → MaxSlotNo #

Generic CurrentSlot 
Instance details

Defined in Ouroboros.Consensus.BlockchainTime.API

Associated Types

type Rep CurrentSlot ∷ TypeType #

Methods

from ∷ CurrentSlot → Rep CurrentSlot x #

toRep CurrentSlot x → CurrentSlot #

Generic NodeId 
Instance details

Defined in Ouroboros.Consensus.NodeId

Associated Types

type Rep NodeId ∷ TypeType #

Methods

from ∷ NodeId → Rep NodeId x #

toRep NodeId x → NodeId #

Generic PBftParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftParams ∷ TypeType #

Methods

from ∷ PBftParams → Rep PBftParams x #

toRep PBftParams x → PBftParams #

Generic PBftMockVerKeyHash 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.Crypto

Associated Types

type Rep PBftMockVerKeyHash ∷ TypeType #

Methods

from ∷ PBftMockVerKeyHash → Rep PBftMockVerKeyHash x #

toRep PBftMockVerKeyHash x → PBftMockVerKeyHash #

Generic ChainType 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Associated Types

type Rep ChainType ∷ TypeType #

Methods

from ∷ ChainType → Rep ChainType x #

toRep ChainType x → ChainType #

Generic ScheduledGc 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.Impl.Background

Associated Types

type Rep ScheduledGc ∷ TypeType #

Methods

from ∷ ScheduledGc → Rep ScheduledGc x #

toRep ScheduledGc x → ScheduledGc #

Generic DiskSnapshot 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.OnDisk

Associated Types

type Rep DiskSnapshot ∷ TypeType #

Methods

from ∷ DiskSnapshot → Rep DiskSnapshot x #

toRep DiskSnapshot x → DiskSnapshot #

Generic SnapshotInterval 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.DiskPolicy

Associated Types

type Rep SnapshotInterval ∷ TypeType #

Methods

from ∷ SnapshotInterval → Rep SnapshotInterval x #

toRep SnapshotInterval x → SnapshotInterval #

Generic ChunkNo 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Chunks.Internal

Associated Types

type Rep ChunkNo ∷ TypeType #

Methods

from ∷ ChunkNo → Rep ChunkNo x #

toRep ChunkNo x → ChunkNo #

Generic CRC 
Instance details

Defined in Ouroboros.Consensus.Storage.FS.CRC

Associated Types

type Rep CRC ∷ TypeType #

Methods

from ∷ CRC → Rep CRC x #

toRep CRC x → CRC #

Generic ChunkSize 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Chunks.Internal

Associated Types

type Rep ChunkSize ∷ TypeType #

Methods

from ∷ ChunkSize → Rep ChunkSize x #

toRep ChunkSize x → ChunkSize #

Generic RelativeSlot 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Chunks.Internal

Associated Types

type Rep RelativeSlot ∷ TypeType #

Methods

from ∷ RelativeSlot → Rep RelativeSlot x #

toRep RelativeSlot x → RelativeSlot #

Generic ChunkSlot 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Chunks.Layout

Associated Types

type Rep ChunkSlot ∷ TypeType #

Methods

from ∷ ChunkSlot → Rep ChunkSlot x #

toRep ChunkSlot x → ChunkSlot #

Generic BlockOrEBB 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Impl.Types

Associated Types

type Rep BlockOrEBB ∷ TypeType #

Methods

from ∷ BlockOrEBB → Rep BlockOrEBB x #

toRep BlockOrEBB x → BlockOrEBB #

Generic PrimaryIndex 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Impl.Index.Primary

Associated Types

type Rep PrimaryIndex ∷ TypeType #

Methods

from ∷ PrimaryIndex → Rep PrimaryIndex x #

toRep PrimaryIndex x → PrimaryIndex #

Generic TraceCacheEvent 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Impl.Types

Associated Types

type Rep TraceCacheEvent ∷ TypeType #

Methods

from ∷ TraceCacheEvent → Rep TraceCacheEvent x #

toRep TraceCacheEvent x → TraceCacheEvent #

Generic BlockSize 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Impl.Index.Secondary

Associated Types

type Rep BlockSize ∷ TypeType #

Methods

from ∷ BlockSize → Rep BlockSize x #

toRep BlockSize x → BlockSize #

Generic ValidationPolicy 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.Impl.Types

Associated Types

type Rep ValidationPolicy ∷ TypeType #

Methods

from ∷ ValidationPolicy → Rep ValidationPolicy x #

toRep ValidationPolicy x → ValidationPolicy #

Generic BlocksPerFile 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.Impl.Types

Associated Types

type Rep BlocksPerFile ∷ TypeType #

Methods

from ∷ BlocksPerFile → Rep BlocksPerFile x #

toRep BlocksPerFile x → BlocksPerFile #

Generic BlockOffset 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.Impl.Types

Associated Types

type Rep BlockOffset ∷ TypeType #

Methods

from ∷ BlockOffset → Rep BlockOffset x #

toRep BlockOffset x → BlockOffset #

Generic BlockSize 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.Impl.Types

Associated Types

type Rep BlockSize ∷ TypeType #

Methods

from ∷ BlockSize → Rep BlockSize x #

toRep BlockSize x → BlockSize #

Generic Appender 
Instance details

Defined in Ouroboros.Consensus.Util.MonadSTM.RAWLock

Associated Types

type Rep Appender ∷ TypeType #

Methods

from ∷ Appender → Rep Appender x #

toRep Appender x → Appender #

Generic RegistryStatus 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep RegistryStatus ∷ TypeType #

Methods

from ∷ RegistryStatus → Rep RegistryStatus x #

toRep RegistryStatus x → RegistryStatus #

Generic Fingerprint 
Instance details

Defined in Ouroboros.Consensus.Util.STM

Associated Types

type Rep Fingerprint ∷ TypeType #

Methods

from ∷ Fingerprint → Rep Fingerprint x #

toRep Fingerprint x → Fingerprint #

Generic PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.Types

Associated Types

type Rep PeerAdvertise ∷ TypeType #

Methods

from ∷ PeerAdvertise → Rep PeerAdvertise x #

toRep PeerAdvertise x → PeerAdvertise #

Generic FileDescriptor 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep FileDescriptor ∷ TypeType #

Methods

from ∷ FileDescriptor → Rep FileDescriptor x #

toRep FileDescriptor x → FileDescriptor #

Generic LocalAddress 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep LocalAddress ∷ TypeType #

Methods

from ∷ LocalAddress → Rep LocalAddress x #

toRep LocalAddress x → LocalAddress #

Generic LocalSocket 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep LocalSocket ∷ TypeType #

Methods

from ∷ LocalSocket → Rep LocalSocket x #

toRep LocalSocket x → LocalSocket #

Generic SatInt 
Instance details

Defined in Data.SatInt

Associated Types

type Rep SatInt ∷ TypeType #

Methods

from ∷ SatInt → Rep SatInt x #

toRep SatInt x → SatInt #

Generic ModelAddedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelAddedSizes ∷ TypeType #

Methods

from ∷ ModelAddedSizes → Rep ModelAddedSizes x #

toRep ModelAddedSizes x → ModelAddedSizes #

Generic ModelConstantOrLinear 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelConstantOrLinear ∷ TypeType #

Methods

from ∷ ModelConstantOrLinear → Rep ModelConstantOrLinear x #

toRep ModelConstantOrLinear x → ModelConstantOrLinear #

Generic ModelConstantOrTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelConstantOrTwoArguments ∷ TypeType #

Methods

from ∷ ModelConstantOrTwoArguments → Rep ModelConstantOrTwoArguments x #

toRep ModelConstantOrTwoArguments x → ModelConstantOrTwoArguments #

Generic ModelFiveArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelFiveArguments ∷ TypeType #

Methods

from ∷ ModelFiveArguments → Rep ModelFiveArguments x #

toRep ModelFiveArguments x → ModelFiveArguments #

Generic ModelFourArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelFourArguments ∷ TypeType #

Methods

from ∷ ModelFourArguments → Rep ModelFourArguments x #

toRep ModelFourArguments x → ModelFourArguments #

Generic ModelLinearSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelLinearSize ∷ TypeType #

Methods

from ∷ ModelLinearSize → Rep ModelLinearSize x #

toRep ModelLinearSize x → ModelLinearSize #

Generic ModelMaxSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelMaxSize ∷ TypeType #

Methods

from ∷ ModelMaxSize → Rep ModelMaxSize x #

toRep ModelMaxSize x → ModelMaxSize #

Generic ModelMinSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelMinSize ∷ TypeType #

Methods

from ∷ ModelMinSize → Rep ModelMinSize x #

toRep ModelMinSize x → ModelMinSize #

Generic ModelMultipliedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelMultipliedSizes ∷ TypeType #

Methods

from ∷ ModelMultipliedSizes → Rep ModelMultipliedSizes x #

toRep ModelMultipliedSizes x → ModelMultipliedSizes #

Generic ModelOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelOneArgument ∷ TypeType #

Methods

from ∷ ModelOneArgument → Rep ModelOneArgument x #

toRep ModelOneArgument x → ModelOneArgument #

Generic ModelSixArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelSixArguments ∷ TypeType #

Methods

from ∷ ModelSixArguments → Rep ModelSixArguments x #

toRep ModelSixArguments x → ModelSixArguments #

Generic ModelSubtractedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelSubtractedSizes ∷ TypeType #

Methods

from ∷ ModelSubtractedSizes → Rep ModelSubtractedSizes x #

toRep ModelSubtractedSizes x → ModelSubtractedSizes #

Generic ModelThreeArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelThreeArguments ∷ TypeType #

Methods

from ∷ ModelThreeArguments → Rep ModelThreeArguments x #

toRep ModelThreeArguments x → ModelThreeArguments #

Generic ModelTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep ModelTwoArguments ∷ TypeType #

Methods

from ∷ ModelTwoArguments → Rep ModelTwoArguments x #

toRep ModelTwoArguments x → ModelTwoArguments #

Generic Support 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep Support ∷ TypeType #

Methods

from ∷ Support → Rep Support x #

toRep Support x → Support #

Generic CkUserError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Ck

Associated Types

type Rep CkUserError ∷ TypeType #

Methods

from ∷ CkUserError → Rep CkUserError x #

toRep CkUserError x → CkUserError #

Generic CekUserError 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep CekUserError ∷ TypeType #

Methods

from ∷ CekUserError → Rep CekUserError x #

toRep CekUserError x → CekUserError #

Generic StepKind 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep StepKind ∷ TypeType #

Methods

from ∷ StepKind → Rep StepKind x #

toRep StepKind x → StepKind #

Generic LedgerBytes 
Instance details

Defined in Plutus.V1.Ledger.Bytes

Associated Types

type Rep LedgerBytes ∷ TypeType #

Methods

from ∷ LedgerBytes → Rep LedgerBytes x #

toRep LedgerBytes x → LedgerBytes #

Generic ScriptContext 
Instance details

Defined in Plutus.V1.Ledger.Contexts

Associated Types

type Rep ScriptContext ∷ TypeType #

Methods

from ∷ ScriptContext → Rep ScriptContext x #

toRep ScriptContext x → ScriptContext #

Generic MintingPolicy 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep MintingPolicy ∷ TypeType #

Methods

from ∷ MintingPolicy → Rep MintingPolicy x #

toRep MintingPolicy x → MintingPolicy #

Generic MintingPolicyHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep MintingPolicyHash ∷ TypeType #

Methods

from ∷ MintingPolicyHash → Rep MintingPolicyHash x #

toRep MintingPolicyHash x → MintingPolicyHash #

Generic Redeemer 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep Redeemer ∷ TypeType #

Methods

from ∷ Redeemer → Rep Redeemer x #

toRep Redeemer x → Redeemer #

Generic RedeemerHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep RedeemerHash ∷ TypeType #

Methods

from ∷ RedeemerHash → Rep RedeemerHash x #

toRep RedeemerHash x → RedeemerHash #

Generic Script 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep Script ∷ TypeType #

Methods

from ∷ Script → Rep Script x #

toRep Script x → Script #

Generic ScriptError 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep ScriptError ∷ TypeType #

Methods

from ∷ ScriptError → Rep ScriptError x #

toRep ScriptError x → ScriptError #

Generic ScriptHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep ScriptHash ∷ TypeType #

Methods

from ∷ ScriptHash → Rep ScriptHash x #

toRep ScriptHash x → ScriptHash #

Generic StakeValidator 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep StakeValidator ∷ TypeType #

Methods

from ∷ StakeValidator → Rep StakeValidator x #

toRep StakeValidator x → StakeValidator #

Generic StakeValidatorHash 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep StakeValidatorHash ∷ TypeType #

Methods

from ∷ StakeValidatorHash → Rep StakeValidatorHash x #

toRep StakeValidatorHash x → StakeValidatorHash #

Generic Validator 
Instance details

Defined in Plutus.V1.Ledger.Scripts

Associated Types

type Rep Validator ∷ TypeType #

Methods

from ∷ Validator → Rep Validator x #

toRep Validator x → Validator #

Generic DiffMilliSeconds 
Instance details

Defined in Plutus.V1.Ledger.Time

Associated Types

type Rep DiffMilliSeconds ∷ TypeType #

Methods

from ∷ DiffMilliSeconds → Rep DiffMilliSeconds x #

toRep DiffMilliSeconds x → DiffMilliSeconds #

Generic RedeemerPtr 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep RedeemerPtr ∷ TypeType #

Methods

from ∷ RedeemerPtr → Rep RedeemerPtr x #

toRep RedeemerPtr x → RedeemerPtr #

Generic ScriptTag 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep ScriptTag ∷ TypeType #

Methods

from ∷ ScriptTag → Rep ScriptTag x #

toRep ScriptTag x → ScriptTag #

Generic TxIn 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxIn ∷ TypeType #

Methods

from ∷ TxIn → Rep TxIn x #

toRep TxIn x → TxIn #

Generic TxInType 
Instance details

Defined in Plutus.V1.Ledger.Tx

Associated Types

type Rep TxInType ∷ TypeType #

Methods

from ∷ TxInType → Rep TxInType x #

toRep TxInType x → TxInType #

Generic AssetClass 
Instance details

Defined in Plutus.V1.Ledger.Value

Associated Types

type Rep AssetClass ∷ TypeType #

Methods

from ∷ AssetClass → Rep AssetClass x #

toRep AssetClass x → AssetClass #

Generic ScriptContext 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Associated Types

type Rep ScriptContext ∷ TypeType #

Methods

from ∷ ScriptContext → Rep ScriptContext x #

toRep ScriptContext x → ScriptContext #

Generic TxInInfo 
Instance details

Defined in Plutus.V2.Ledger.Contexts

Associated Types

type Rep TxInInfo ∷ TypeType #

Methods

from ∷ TxInInfo → Rep TxInInfo x #

toRep TxInInfo x → TxInInfo #

Generic TxOut 
Instance details

Defined in Plutus.V2.Ledger.Tx

Associated Types

type Rep TxOut ∷ TypeType #

Methods

from ∷ TxOut → Rep TxOut x #

toRep TxOut x → TxOut #

Generic OutputDatum 
Instance details

Defined in Plutus.V2.Ledger.Tx

Associated Types

type Rep OutputDatum ∷ TypeType #

Methods

from ∷ OutputDatum → Rep OutputDatum x #

toRep OutputDatum x → OutputDatum #

Generic CovLoc 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CovLoc ∷ TypeType #

Methods

from ∷ CovLoc → Rep CovLoc x #

toRep CovLoc x → CovLoc #

Generic CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageAnnotation ∷ TypeType #

Methods

from ∷ CoverageAnnotation → Rep CoverageAnnotation x #

toRep CoverageAnnotation x → CoverageAnnotation #

Generic CoverageData 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageData ∷ TypeType #

Methods

from ∷ CoverageData → Rep CoverageData x #

toRep CoverageData x → CoverageData #

Generic CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageIndex ∷ TypeType #

Methods

from ∷ CoverageIndex → Rep CoverageIndex x #

toRep CoverageIndex x → CoverageIndex #

Generic CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageMetadata ∷ TypeType #

Methods

from ∷ CoverageMetadata → Rep CoverageMetadata x #

toRep CoverageMetadata x → CoverageMetadata #

Generic CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageReport ∷ TypeType #

Methods

from ∷ CoverageReport → Rep CoverageReport x #

toRep CoverageReport x → CoverageReport #

Generic Metadata 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep Metadata ∷ TypeType #

Methods

from ∷ Metadata → Rep Metadata x #

toRep Metadata x → Metadata #

Generic StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

Associated Types

type Rep StudentT ∷ TypeType #

Methods

from ∷ StudentT → Rep StudentT x #

toRep StudentT x → StudentT #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant ∷ TypeType #

Methods

from ∷ ConstructorVariant → Rep ConstructorVariant x #

toRep ConstructorVariant x → ConstructorVariant #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant ∷ TypeType #

Methods

from ∷ DatatypeVariant → Rep DatatypeVariant x #

toRep DatatypeVariant x → DatatypeVariant #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness ∷ TypeType #

Methods

from ∷ FieldStrictness → Rep FieldStrictness x #

toRep FieldStrictness x → FieldStrictness #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness ∷ TypeType #

Methods

from ∷ Strictness → Rep Strictness x #

toRep Strictness x → Strictness #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness ∷ TypeType #

Methods

from ∷ Unpackedness → Rep Unpackedness x #

toRep Unpackedness x → Unpackedness #

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Datatype.TyVarBndr

Associated Types

type Rep Specificity ∷ TypeType #

Methods

from ∷ Specificity → Rep Specificity x #

toRep Specificity x → Specificity #

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel ∷ TypeType #

Methods

from ∷ CompressionLevel → Rep CompressionLevel x #

toRep CompressionLevel x → CompressionLevel #

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy ∷ TypeType #

Methods

from ∷ CompressionStrategy → Rep CompressionStrategy x #

toRep CompressionStrategy x → CompressionStrategy #

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Format ∷ TypeType #

Methods

from ∷ Format → Rep Format x #

toRep Format x → Format #

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel ∷ TypeType #

Methods

from ∷ MemoryLevel → Rep MemoryLevel x #

toRep MemoryLevel x → MemoryLevel #

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Method ∷ TypeType #

Methods

from ∷ Method → Rep Method x #

toRep Method x → Method #

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits ∷ TypeType #

Methods

from ∷ WindowBits → Rep WindowBits x #

toRep WindowBits x → WindowBits #

Generic Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Associated Types

type Rep Form ∷ TypeType #

Methods

from ∷ Form → Rep Form x #

toRep Form x → Form #

Generic AcceptHeader 
Instance details

Defined in Servant.API.ContentTypes

Associated Types

type Rep AcceptHeader ∷ TypeType #

Methods

from ∷ AcceptHeader → Rep AcceptHeader x #

toRep AcceptHeader x → AcceptHeader #

Generic NoContent 
Instance details

Defined in Servant.API.ContentTypes

Associated Types

type Rep NoContent ∷ TypeType #

Methods

from ∷ NoContent → Rep NoContent x #

toRep NoContent x → NoContent #

Generic IsSecure 
Instance details

Defined in Servant.API.IsSecure

Associated Types

type Rep IsSecure ∷ TypeType #

Methods

from ∷ IsSecure → Rep IsSecure x #

toRep IsSecure x → IsSecure #

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep Environment ∷ TypeType #

Methods

from ∷ Environment → Rep Environment x #

toRep Environment x → Environment #

Generic LogStr 
Instance details

Defined in Katip.Core

Associated Types

type Rep LogStr ∷ TypeType #

Methods

from ∷ LogStr → Rep LogStr x #

toRep LogStr x → LogStr #

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep Namespace ∷ TypeType #

Methods

from ∷ Namespace → Rep Namespace x #

toRep Namespace x → Namespace #

Generic Severity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Severity ∷ TypeType #

Methods

from ∷ Severity → Rep Severity x #

toRep Severity x → Severity #

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Verbosity ∷ TypeType #

Methods

from ∷ Verbosity → Rep Verbosity x #

toRep Verbosity x → Verbosity #

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IP ∷ TypeType #

Methods

from ∷ IP → Rep IP x #

toRep IP x → IP #

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRange ∷ TypeType #

Methods

from ∷ IPRange → Rep IPRange x #

toRep IPRange x → IPRange #

Generic ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Associated Types

type Rep ConnectInfo ∷ TypeType #

Methods

from ∷ ConnectInfo → Rep ConnectInfo x #

toRep ConnectInfo x → ConnectInfo #

Generic Clock 
Instance details

Defined in System.Clock

Associated Types

type Rep Clock ∷ TypeType #

Methods

from ∷ Clock → Rep Clock x #

toRep Clock x → Clock #

Generic TimeSpec 
Instance details

Defined in System.Clock

Associated Types

type Rep TimeSpec ∷ TypeType #

Methods

from ∷ TimeSpec → Rep TimeSpec x #

toRep TimeSpec x → TimeSpec #

Generic Outcome 
Instance details

Defined in Test.Tasty.Core

Associated Types

type Rep Outcome ∷ TypeType #

Methods

from ∷ Outcome → Rep Outcome x #

toRep Outcome x → Outcome #

Generic Expr 
Instance details

Defined in Test.Tasty.Patterns.Types

Associated Types

type Rep Expr ∷ TypeType #

Methods

from ∷ Expr → Rep Expr x #

toRep Expr x → Expr #

Generic GYEra # 
Instance details

Defined in GeniusYield.Types.Era

Associated Types

type Rep GYEraTypeType #

Methods

fromGYEraRep GYEra x #

toRep GYEra x → GYEra #

Generic ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ApiKeyLocation ∷ TypeType #

Methods

from ∷ ApiKeyLocation → Rep ApiKeyLocation x #

toRep ApiKeyLocation x → ApiKeyLocation #

Generic ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ApiKeyParams ∷ TypeType #

Methods

from ∷ ApiKeyParams → Rep ApiKeyParams x #

toRep ApiKeyParams x → ApiKeyParams #

Generic Contact 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Contact ∷ TypeType #

Methods

from ∷ Contact → Rep Contact x #

toRep Contact x → Contact #

Generic Example 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Example ∷ TypeType #

Methods

from ∷ Example → Rep Example x #

toRep Example x → Example #

Generic ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ExternalDocs ∷ TypeType #

Methods

from ∷ ExternalDocs → Rep ExternalDocs x #

toRep ExternalDocs x → ExternalDocs #

Generic Header 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Header ∷ TypeType #

Methods

from ∷ Header → Rep Header x #

toRep Header x → Header #

Generic Host 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Host ∷ TypeType #

Methods

from ∷ Host → Rep Host x #

toRep Host x → Host #

Generic Info 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Info ∷ TypeType #

Methods

from ∷ Info → Rep Info x #

toRep Info x → Info #

Generic License 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep License ∷ TypeType #

Methods

from ∷ License → Rep License x #

toRep License x → License #

Generic NamedSchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep NamedSchema ∷ TypeType #

Methods

from ∷ NamedSchema → Rep NamedSchema x #

toRep NamedSchema x → NamedSchema #

Generic OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep OAuth2Flow ∷ TypeType #

Methods

from ∷ OAuth2Flow → Rep OAuth2Flow x #

toRep OAuth2Flow x → OAuth2Flow #

Generic OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep OAuth2Params ∷ TypeType #

Methods

from ∷ OAuth2Params → Rep OAuth2Params x #

toRep OAuth2Params x → OAuth2Params #

Generic Operation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Operation ∷ TypeType #

Methods

from ∷ Operation → Rep Operation x #

toRep Operation x → Operation #

Generic Param 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Param ∷ TypeType #

Methods

from ∷ Param → Rep Param x #

toRep Param x → Param #

Generic ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamAnySchema ∷ TypeType #

Methods

from ∷ ParamAnySchema → Rep ParamAnySchema x #

toRep ParamAnySchema x → ParamAnySchema #

Generic ParamLocation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamLocation ∷ TypeType #

Methods

from ∷ ParamLocation → Rep ParamLocation x #

toRep ParamLocation x → ParamLocation #

Generic ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamOtherSchema ∷ TypeType #

Methods

from ∷ ParamOtherSchema → Rep ParamOtherSchema x #

toRep ParamOtherSchema x → ParamOtherSchema #

Generic PathItem 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep PathItem ∷ TypeType #

Methods

from ∷ PathItem → Rep PathItem x #

toRep PathItem x → PathItem #

Generic Response 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Response ∷ TypeType #

Methods

from ∷ Response → Rep Response x #

toRep Response x → Response #

Generic Responses 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Responses ∷ TypeType #

Methods

from ∷ Responses → Rep Responses x #

toRep Responses x → Responses #

Generic Schema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Schema ∷ TypeType #

Methods

from ∷ Schema → Rep Schema x #

toRep Schema x → Schema #

Generic Scheme 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Scheme ∷ TypeType #

Methods

from ∷ Scheme → Rep Scheme x #

toRep Scheme x → Scheme #

Generic SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecurityDefinitions ∷ TypeType #

Methods

from ∷ SecurityDefinitions → Rep SecurityDefinitions x #

toRep SecurityDefinitions x → SecurityDefinitions #

Generic SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecurityScheme ∷ TypeType #

Methods

from ∷ SecurityScheme → Rep SecurityScheme x #

toRep SecurityScheme x → SecurityScheme #

Generic SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecuritySchemeType ∷ TypeType #

Methods

from ∷ SecuritySchemeType → Rep SecuritySchemeType x #

toRep SecuritySchemeType x → SecuritySchemeType #

Generic Swagger 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Swagger ∷ TypeType #

Methods

from ∷ Swagger → Rep Swagger x #

toRep Swagger x → Swagger #

Generic Tag 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Tag ∷ TypeType #

Methods

from ∷ Tag → Rep Tag x #

toRep Tag x → Tag #

Generic Xml 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep Xml ∷ TypeType #

Methods

from ∷ Xml → Rep Xml x #

toRep Xml x → Xml #

Generic GYRational # 
Instance details

Defined in GeniusYield.Types.Rational

Associated Types

type Rep GYRationalTypeType #

Generic GYAddress # 
Instance details

Defined in GeniusYield.Types.Address

Associated Types

type Rep GYAddressTypeType #

Methods

fromGYAddressRep GYAddress x #

toRep GYAddress x → GYAddress #

Generic GYAssetClass # 
Instance details

Defined in GeniusYield.Types.Value

Associated Types

type Rep GYAssetClassTypeType #

Generic AddressInfo 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep AddressInfo ∷ TypeType #

Methods

from ∷ AddressInfo → Rep AddressInfo x #

toRep AddressInfo x → AddressInfo #

Generic ErrInspectAddress