atlas-0.1.0.0: Application backend for Plutus smart contracts on Cardano
Copyright(c) 2023 GYELD GMBH
LicenseApache 2.0
Maintainersupport@geniusyield.co
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 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 Skip 
Instance details

Defined in Hedgehog.Internal.Property

Methods

fromStringString → Skip #

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

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 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 TimeSpec 
Instance details

Defined in System.Clock

Associated Types

type Rep TimeSpec ∷ TypeType #

Methods

from ∷ TimeSpec → Rep TimeSpec x #

toRep TimeSpec x → TimeSpec #

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 CaseStyle 
Instance details

Defined in Data.Text.Class

Associated Types

type Rep CaseStyle ∷ TypeType #

Methods

from ∷ CaseStyle → Rep CaseStyle x #

toRep CaseStyle x → CaseStyle #

Generic BalanceInsufficientError 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep BalanceInsufficientError ∷ TypeType #

Methods

from ∷ BalanceInsufficientError → Rep BalanceInsufficientError x #

toRep BalanceInsufficientError x → BalanceInsufficientError #

Generic UTxOBalanceSufficiencyInfo 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep UTxOBalanceSufficiencyInfo ∷ TypeType #

Methods

from ∷ UTxOBalanceSufficiencyInfo → Rep UTxOBalanceSufficiencyInfo x #

toRep UTxOBalanceSufficiencyInfo x → UTxOBalanceSufficiencyInfo #

Generic UnableToConstructChangeError 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep UnableToConstructChangeError ∷ TypeType #

Methods

from ∷ UnableToConstructChangeError → Rep UnableToConstructChangeError x #

toRep UnableToConstructChangeError x → UnableToConstructChangeError #

Generic TokenMap 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep TokenMap ∷ TypeType #

Methods

from ∷ TokenMap → Rep TokenMap x #

toRep TokenMap x → TokenMap #

Generic TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenPolicyId ∷ TypeType #

Methods

from ∷ TokenPolicyId → Rep TokenPolicyId x #

toRep TokenPolicyId x → TokenPolicyId #

Generic TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenName ∷ TypeType #

Methods

from ∷ TokenName → Rep TokenName x #

toRep TokenName x → TokenName #

Generic TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

Associated Types

type Rep TokenQuantity ∷ TypeType #

Methods

from ∷ TokenQuantity → Rep TokenQuantity x #

toRep TokenQuantity x → TokenQuantity #

Generic TokenBundle 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenBundle

Associated Types

type Rep TokenBundle ∷ TypeType #

Methods

from ∷ TokenBundle → Rep TokenBundle x #

toRep TokenBundle x → TokenBundle #

Generic AssetId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep AssetId ∷ TypeType #

Methods

from ∷ AssetId → Rep AssetId x #

toRep AssetId x → AssetId #

Generic Coin 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Coin

Associated Types

type Rep Coin ∷ TypeType #

Methods

from ∷ Coin → Rep Coin x #

toRep Coin x → Coin #

Generic TokenBundleSizeAssessment 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.Constraints

Associated Types

type Rep TokenBundleSizeAssessment ∷ TypeType #

Methods

from ∷ TokenBundleSizeAssessment → Rep TokenBundleSizeAssessment x #

toRep TokenBundleSizeAssessment x → TokenBundleSizeAssessment #

Generic TokenBundleSizeAssessor 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.Constraints

Associated Types

type Rep TokenBundleSizeAssessor ∷ TypeType #

Methods

from ∷ TokenBundleSizeAssessor → Rep TokenBundleSizeAssessor x #

toRep TokenBundleSizeAssessor x → TokenBundleSizeAssessor #

Generic Asset 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOIndex.Internal

Associated Types

type Rep Asset ∷ TypeType #

Methods

from ∷ Asset → Rep Asset x #

toRep Asset x → Asset #

Generic SelectionConstraints 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionConstraints ∷ TypeType #

Methods

from ∷ SelectionConstraints → Rep SelectionConstraints x #

toRep SelectionConstraints x → SelectionConstraints #

Generic SelectionParams 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionParams ∷ TypeType #

Methods

from ∷ SelectionParams → Rep SelectionParams x #

toRep SelectionParams x → SelectionParams #

Generic SelectionReportDetailed 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReportDetailed ∷ TypeType #

Methods

from ∷ SelectionReportDetailed → Rep SelectionReportDetailed x #

toRep SelectionReportDetailed x → SelectionReportDetailed #

Generic SelectionReportSummarized 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReportSummarized ∷ TypeType #

Methods

from ∷ SelectionReportSummarized → Rep SelectionReportSummarized x #

toRep SelectionReportSummarized x → SelectionReportSummarized #

Generic SelectionSkeleton 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionSkeleton ∷ TypeType #

Methods

from ∷ SelectionSkeleton → Rep SelectionSkeleton x #

toRep SelectionSkeleton x → SelectionSkeleton #

Generic WalletUTxO 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep WalletUTxO ∷ TypeType #

Methods

from ∷ WalletUTxO → Rep WalletUTxO x #

toRep WalletUTxO x → WalletUTxO #

Generic SelectionCollateralRequirement 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep SelectionCollateralRequirement ∷ TypeType #

Methods

from ∷ SelectionCollateralRequirement → Rep SelectionCollateralRequirement x #

toRep SelectionCollateralRequirement x → SelectionCollateralRequirement #

Generic TxOut 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.TxOut

Associated Types

type Rep TxOut ∷ TypeType #

Methods

from ∷ TxOut → Rep TxOut x #

toRep TxOut x → TxOut #

Generic TxIn 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.TxIn

Associated Types

type Rep TxIn ∷ TypeType #

Methods

from ∷ TxIn → Rep TxIn x #

toRep TxIn x → TxIn #

Generic SelectionReport 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReport ∷ TypeType #

Methods

from ∷ SelectionReport → Rep SelectionReport x #

toRep SelectionReport x → SelectionReport #

Generic Address 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Address

Associated Types

type Rep Address ∷ TypeType #

Methods

from ∷ Address → Rep Address x #

toRep Address x → Address #

Generic UTxO 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxO

Associated Types

type Rep UTxO ∷ TypeType #

Methods

from ∷ UTxO → Rep UTxO x #

toRep UTxO x → UTxO #

Generic AddressState 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Address

Associated Types

type Rep AddressState ∷ TypeType #

Methods

from ∷ AddressState → Rep AddressState x #

toRep AddressState x → AddressState #

Generic FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep FlatAssetQuantity ∷ TypeType #

Methods

from ∷ FlatAssetQuantity → Rep FlatAssetQuantity x #

toRep FlatAssetQuantity x → FlatAssetQuantity #

Generic NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep NestedMapEntry ∷ TypeType #

Methods

from ∷ NestedMapEntry → Rep NestedMapEntry x #

toRep NestedMapEntry x → NestedMapEntry #

Generic NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep NestedTokenQuantity ∷ TypeType #

Methods

from ∷ NestedTokenQuantity → Rep NestedTokenQuantity x #

toRep NestedTokenQuantity x → NestedTokenQuantity #

Generic AssetDecimals 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetDecimals ∷ TypeType #

Methods

from ∷ AssetDecimals → Rep AssetDecimals x #

toRep AssetDecimals x → AssetDecimals #

Generic AssetLogo 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetLogo ∷ TypeType #

Methods

from ∷ AssetLogo → Rep AssetLogo x #

toRep AssetLogo x → AssetLogo #

Generic AssetMetadata 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetMetadata ∷ TypeType #

Methods

from ∷ AssetMetadata → Rep AssetMetadata x #

toRep AssetMetadata x → AssetMetadata #

Generic AssetURL 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetURL ∷ TypeType #

Methods

from ∷ AssetURL → Rep AssetURL x #

toRep AssetURL x → AssetURL #

Generic TokenFingerprint 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenFingerprint ∷ TypeType #

Methods

from ∷ TokenFingerprint → Rep TokenFingerprint x #

toRep TokenFingerprint x → TokenFingerprint #

Generic TxConstraints 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.Constraints

Associated Types

type Rep TxConstraints ∷ TypeType #

Methods

from ∷ TxConstraints → Rep TxConstraints x #

toRep TxConstraints x → TxConstraints #

Generic TxSize 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Tx.Constraints

Associated Types

type Rep TxSize ∷ TypeType #

Methods

from ∷ TxSize → Rep TxSize x #

toRep TxSize x → TxSize #

Generic ComputeMinimumCollateralParams 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep ComputeMinimumCollateralParams ∷ TypeType #

Methods

from ∷ ComputeMinimumCollateralParams → Rep ComputeMinimumCollateralParams x #

toRep ComputeMinimumCollateralParams x → ComputeMinimumCollateralParams #

Generic SelectionConstraints 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep SelectionConstraints ∷ TypeType #

Methods

from ∷ SelectionConstraints → Rep SelectionConstraints x #

toRep SelectionConstraints x → SelectionConstraints #

Generic DeltaUTxO 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxO

Associated Types

type Rep DeltaUTxO ∷ TypeType #

Methods

from ∷ DeltaUTxO → Rep DeltaUTxO x #

toRep DeltaUTxO x → DeltaUTxO #

Generic Percentage 
Instance details

Defined in Data.Quantity

Associated Types

type Rep Percentage ∷ TypeType #

Methods

from ∷ Percentage → Rep Percentage x #

toRep Percentage x → Percentage #

Generic Ada 
Instance details

Defined in Plutus.Model.Ada

Associated Types

type Rep Ada ∷ TypeType #

Methods

from ∷ Ada → Rep Ada x #

toRep Ada x → Ada #

Generic Slot 
Instance details

Defined in Plutus.Model.Fork.Ledger.Slot

Associated Types

type Rep Slot ∷ TypeType #

Methods

from ∷ Slot → Rep Slot x #

toRep Slot x → Slot #

Generic SlotConfig 
Instance details

Defined in Plutus.Model.Fork.Ledger.TimeSlot

Associated Types

type Rep SlotConfig ∷ TypeType #

Methods

from ∷ SlotConfig → Rep SlotConfig x #

toRep SlotConfig x → SlotConfig #

Generic SlotConversionError 
Instance details

Defined in Plutus.Model.Fork.Ledger.TimeSlot

Associated Types

type Rep SlotConversionError ∷ TypeType #

Methods

from ∷ SlotConversionError → Rep SlotConversionError x #

toRep SlotConversionError x → SlotConversionError #

Generic Tx 
Instance details

Defined in Plutus.Model.Fork.Ledger.Tx

Associated Types

type Rep Tx ∷ TypeType #

Methods

from ∷ Tx → Rep Tx x #

toRep Tx x → Tx #

Generic TxIn 
Instance details

Defined in Plutus.Model.Fork.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.Model.Fork.Ledger.Tx

Associated Types

type Rep TxInType ∷ TypeType #

Methods

from ∷ TxInType → Rep TxInType x #

toRep TxInType x → TxInType #

Generic TxStripped 
Instance details

Defined in Plutus.Model.Fork.Ledger.Tx

Associated Types

type Rep TxStripped ∷ TypeType #

Methods

from ∷ TxStripped → Rep TxStripped x #

toRep TxStripped x → TxStripped #

Generic MaestroUtxo # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroUtxoTypeType #

Generic MaestroDatumOption # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroDatumOptionTypeType #

Generic MaestroDatumOptionType # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroDatumOptionTypeTypeType #

Generic MaestroScript # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroScriptTypeType #

Generic MaestroScriptType # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroScriptTypeTypeType #

Generic MaestroAsset # 
Instance details

Defined in GeniusYield.Providers.Maestro

Associated Types

type Rep MaestroAssetTypeType #

Generic [a]

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] ∷ TypeType #

Methods

from ∷ [a] → Rep [a] x #

toRep [a] x → [a] #

Generic (Maybe a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) ∷ TypeType #

Methods

fromMaybe a → Rep (Maybe a) x #

toRep (Maybe a) x → Maybe a #

Generic (Par1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) ∷ TypeType #

Methods

fromPar1 p → Rep (Par1 p) x #

toRep (Par1 p) x → Par1 p #

Generic (Complex a)

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) ∷ TypeType #

Methods

fromComplex a → Rep (Complex a) x #

toRep (Complex a) x → Complex a #

Generic (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) ∷ TypeType #

Methods

fromMin a → Rep (Min a) x #

toRep (Min a) x → Min a #

Generic (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) ∷ TypeType #

Methods

fromMax a → Rep (Max a) x #

toRep (Max a) x → Max a #

Generic (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) ∷ TypeType #

Methods

fromFirst a → Rep (First a) x #

toRep (First a) x → First a #

Generic (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) ∷ TypeType #

Methods

fromLast a → Rep (Last a) x #

toRep (Last a) x → Last a #

Generic (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) ∷ TypeType #

Methods

fromWrappedMonoid m → Rep (WrappedMonoid m) x #

toRep (WrappedMonoid m) x → WrappedMonoid m #

Generic (Option a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Option a) ∷ TypeType #

Methods

fromOption a → Rep (Option a) x #

toRep (Option a) x → Option a #

Generic (ZipList a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) ∷ TypeType #

Methods

fromZipList a → Rep (ZipList a) x #

toRep (ZipList a) x → ZipList a #

Generic (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) ∷ TypeType #

Methods

fromIdentity a → Rep (Identity a) x #

toRep (Identity a) x → Identity a #

Generic (First a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) ∷ TypeType #

Methods

fromFirst a → Rep (First a) x #

toRep (First a) x → First a #

Generic (Last a)

Since: base-4.7.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) ∷ TypeType #

Methods

fromLast a → Rep (Last a) x #

toRep (Last a) x → Last a #

Generic (Dual a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) ∷ TypeType #

Methods

fromDual a → Rep (Dual a) x #

toRep (Dual a) x → Dual a #

Generic (Endo a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) ∷ TypeType #

Methods

fromEndo a → Rep (Endo a) x #

toRep (Endo a) x → Endo a #

Generic (Sum a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) ∷ TypeType #

Methods

fromSum a → Rep (Sum a) x #

toRep (Sum a) x → Sum a #

Generic (Product a)

Since: base-4.7.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) ∷ TypeType #

Methods

fromProduct a → Rep (Product a) x #

toRep (Product a) x → Product a #

Generic (Down a)

Since: base-4.12.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) ∷ TypeType #

Methods

fromDown a → Rep (Down a) x #

toRep (Down a) x → Down a #

Generic (NonEmpty a)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) ∷ TypeType #

Methods

fromNonEmpty a → Rep (NonEmpty a) x #

toRep (NonEmpty a) x → NonEmpty a #

Generic (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Associated Types

type Rep (SCC vertex) ∷ TypeType #

Methods

fromSCC vertex → Rep (SCC vertex) x #

toRep (SCC vertex) x → SCC vertex #

Generic (Tree a)

Since: containers-0.5.8

Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) ∷ TypeType #

Methods

fromTree a → Rep (Tree a) x #

toRep (Tree a) x → Tree a #

Generic (FingerTree a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) ∷ TypeType #

Methods

fromFingerTree a → Rep (FingerTree a) x #

toRep (FingerTree a) x → FingerTree a #

Generic (Digit a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) ∷ TypeType #

Methods

fromDigit a → Rep (Digit a) x #

toRep (Digit a) x → Digit a #

Generic (Node a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) ∷ TypeType #

Methods

fromNode a → Rep (Node a) x #

toRep (Node a) x → Node a #

Generic (Elem a)

Since: containers-0.6.1

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) ∷ TypeType #

Methods

fromElem a → Rep (Elem a) x #

toRep (Elem a) x → Elem a #

Generic (ViewL a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) ∷ TypeType #

Methods

fromViewL a → Rep (ViewL a) x #

toRep (ViewL a) x → ViewL a #

Generic (ViewR a)

Since: containers-0.5.8

Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) ∷ TypeType #

Methods

fromViewR a → Rep (ViewR a) x #

toRep (ViewR a) x → ViewR a #

Generic (GenClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep (GenClosure b) ∷ TypeType #

Methods

fromGenClosure b → Rep (GenClosure b) x #

toRep (GenClosure b) x → GenClosure b #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) ∷ TypeType #

Methods

fromDoc a → Rep (Doc a) x #

toRep (Doc a) x → Doc a #

Generic (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

Associated Types

type Rep (TxOutValue era) ∷ TypeType #

Methods

from ∷ TxOutValue era → Rep (TxOutValue era) x #

toRep (TxOutValue era) x → TxOutValue era #

Generic (Header (ShelleyBlock proto era)) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Block

Associated Types

type Rep (Header (ShelleyBlock proto era)) ∷ TypeType #

Methods

from ∷ Header (ShelleyBlock proto era) → Rep (Header (ShelleyBlock proto era)) x #

toRep (Header (ShelleyBlock proto era)) x → Header (ShelleyBlock proto era) #

Generic (Header ByronBlock) 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Block

Associated Types

type Rep (Header ByronBlock) ∷ TypeType #

Methods

from ∷ Header ByronBlock → Rep (Header ByronBlock) x #

toRep (Header ByronBlock) x → Header ByronBlock #

Generic (HardForkLedgerConfig xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Basics

Associated Types

type Rep (HardForkLedgerConfig xs) ∷ TypeType #

Methods

from ∷ HardForkLedgerConfig xs → Rep (HardForkLedgerConfig xs) x #

toRep (HardForkLedgerConfig xs) x → HardForkLedgerConfig xs #

Generic (HardForkEnvelopeErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Ledger

Associated Types

type Rep (HardForkEnvelopeErr xs) ∷ TypeType #

Methods

from ∷ HardForkEnvelopeErr xs → Rep (HardForkEnvelopeErr xs) x #

toRep (HardForkEnvelopeErr xs) x → HardForkEnvelopeErr xs #

Generic (HardForkLedgerError xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Ledger

Associated Types

type Rep (HardForkLedgerError xs) ∷ TypeType #

Methods

from ∷ HardForkLedgerError xs → Rep (HardForkLedgerError xs) x #

toRep (HardForkLedgerError xs) x → HardForkLedgerError xs #

Generic (HardForkApplyTxErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Mempool

Associated Types

type Rep (HardForkApplyTxErr xs) ∷ TypeType #

Methods

from ∷ HardForkApplyTxErr xs → Rep (HardForkApplyTxErr xs) x #

toRep (HardForkApplyTxErr xs) x → HardForkApplyTxErr xs #

Generic (ConsensusConfig (TPraos c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (ConsensusConfig (TPraos c)) ∷ TypeType #

Methods

from ∷ ConsensusConfig (TPraos c) → Rep (ConsensusConfig (TPraos c)) x #

toRep (ConsensusConfig (TPraos c)) x → ConsensusConfig (TPraos c) #

Generic (ConsensusConfig (Praos c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (ConsensusConfig (Praos c)) ∷ TypeType #

Methods

from ∷ ConsensusConfig (Praos c) → Rep (ConsensusConfig (Praos c)) x #

toRep (ConsensusConfig (Praos c)) x → ConsensusConfig (Praos c) #

Generic (ConsensusConfig (HardForkProtocol xs)) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Basics

Associated Types

type Rep (ConsensusConfig (HardForkProtocol xs)) ∷ TypeType #

Methods

from ∷ ConsensusConfig (HardForkProtocol xs) → Rep (ConsensusConfig (HardForkProtocol xs)) x #

toRep (ConsensusConfig (HardForkProtocol xs)) x → ConsensusConfig (HardForkProtocol xs) #

Generic (ConsensusConfig (PBft c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (ConsensusConfig (PBft c)) ∷ TypeType #

Methods

from ∷ ConsensusConfig (PBft c) → Rep (ConsensusConfig (PBft c)) x #

toRep (ConsensusConfig (PBft c)) x → ConsensusConfig (PBft c) #

Generic (I a) 
Instance details

Defined in Data.SOP.BasicFunctors

Associated Types

type Rep (I a) ∷ TypeType #

Methods

from ∷ I a → Rep (I a) x #

toRep (I a) x → I a #

Generic (WithOrigin t) 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep (WithOrigin t) ∷ TypeType #

Methods

from ∷ WithOrigin t → Rep (WithOrigin t) x #

toRep (WithOrigin t) x → WithOrigin t #

Generic (ShelleyHash crypto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Protocol.Abstract

Associated Types

type Rep (ShelleyHash crypto) ∷ TypeType #

Methods

from ∷ ShelleyHash crypto → Rep (ShelleyHash crypto) x #

toRep (ShelleyHash crypto) x → ShelleyHash crypto #

Generic (LedgerView crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (LedgerView crypto) ∷ TypeType #

Methods

from ∷ LedgerView crypto → Rep (LedgerView crypto) x #

toRep (LedgerView crypto) x → LedgerView crypto #

Generic (VerKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (VerKeyDSIGN Ed25519DSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN Ed25519DSIGN → Rep (VerKeyDSIGN Ed25519DSIGN) x #

toRep (VerKeyDSIGN Ed25519DSIGN) x → VerKeyDSIGN Ed25519DSIGN #

Generic (VerKeyDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (VerKeyDSIGN ByronDSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN ByronDSIGN → Rep (VerKeyDSIGN ByronDSIGN) x #

toRep (VerKeyDSIGN ByronDSIGN) x → VerKeyDSIGN ByronDSIGN #

Generic (VerKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (VerKeyDSIGN MockDSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN MockDSIGN → Rep (VerKeyDSIGN MockDSIGN) x #

toRep (VerKeyDSIGN MockDSIGN) x → VerKeyDSIGN MockDSIGN #

Generic (VerKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (VerKeyDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN EcdsaSecp256k1DSIGN → Rep (VerKeyDSIGN EcdsaSecp256k1DSIGN) x #

toRep (VerKeyDSIGN EcdsaSecp256k1DSIGN) x → VerKeyDSIGN EcdsaSecp256k1DSIGN #

Generic (VerKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (VerKeyDSIGN Ed448DSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN Ed448DSIGN → Rep (VerKeyDSIGN Ed448DSIGN) x #

toRep (VerKeyDSIGN Ed448DSIGN) x → VerKeyDSIGN Ed448DSIGN #

Generic (VerKeyDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (VerKeyDSIGN NeverDSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN NeverDSIGN → Rep (VerKeyDSIGN NeverDSIGN) x #

toRep (VerKeyDSIGN NeverDSIGN) x → VerKeyDSIGN NeverDSIGN #

Generic (VerKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (VerKeyDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ VerKeyDSIGN SchnorrSecp256k1DSIGN → Rep (VerKeyDSIGN SchnorrSecp256k1DSIGN) x #

toRep (VerKeyDSIGN SchnorrSecp256k1DSIGN) x → VerKeyDSIGN SchnorrSecp256k1DSIGN #

Generic (VerKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (VerKeyVRF PraosVRF) ∷ TypeType #

Methods

from ∷ VerKeyVRF PraosVRF → Rep (VerKeyVRF PraosVRF) x #

toRep (VerKeyVRF PraosVRF) x → VerKeyVRF PraosVRF #

Generic (VerKeyVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (VerKeyVRF MockVRF) ∷ TypeType #

Methods

from ∷ VerKeyVRF MockVRF → Rep (VerKeyVRF MockVRF) x #

toRep (VerKeyVRF MockVRF) x → VerKeyVRF MockVRF #

Generic (VerKeyVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (VerKeyVRF NeverVRF) ∷ TypeType #

Methods

from ∷ VerKeyVRF NeverVRF → Rep (VerKeyVRF NeverVRF) x #

toRep (VerKeyVRF NeverVRF) x → VerKeyVRF NeverVRF #

Generic (VerKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (VerKeyVRF SimpleVRF) ∷ TypeType #

Methods

from ∷ VerKeyVRF SimpleVRF → Rep (VerKeyVRF SimpleVRF) x #

toRep (VerKeyVRF SimpleVRF) x → VerKeyVRF SimpleVRF #

Generic (TPraosState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosState c) ∷ TypeType #

Methods

from ∷ TPraosState c → Rep (TPraosState c) x #

toRep (TPraosState c) x → TPraosState c #

Generic (IndividualPoolStake crypto) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Associated Types

type Rep (IndividualPoolStake crypto) ∷ TypeType #

Methods

from ∷ IndividualPoolStake crypto → Rep (IndividualPoolStake crypto) x #

toRep (IndividualPoolStake crypto) x → IndividualPoolStake crypto #

Generic (TopLevelConfig blk) 
Instance details

Defined in Ouroboros.Consensus.Config

Associated Types

type Rep (TopLevelConfig blk) ∷ TypeType #

Methods

from ∷ TopLevelConfig blk → Rep (TopLevelConfig blk) x #

toRep (TopLevelConfig blk) x → TopLevelConfig blk #

Generic (AHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (AHeader a) ∷ TypeType #

Methods

from ∷ AHeader a → Rep (AHeader a) x #

toRep (AHeader a) x → AHeader a #

Generic (ShelleyPartialLedgerConfig era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.ShelleyHFC

Associated Types

type Rep (ShelleyPartialLedgerConfig era) ∷ TypeType #

Methods

from ∷ ShelleyPartialLedgerConfig era → Rep (ShelleyPartialLedgerConfig era) x #

toRep (ShelleyPartialLedgerConfig era) x → ShelleyPartialLedgerConfig era #

Generic (SingleEraInfo blk) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Info

Associated Types

type Rep (SingleEraInfo blk) ∷ TypeType #

Methods

from ∷ SingleEraInfo blk → Rep (SingleEraInfo blk) x #

toRep (SingleEraInfo blk) x → SingleEraInfo blk #

Generic (PraosChainSelectView c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep (PraosChainSelectView c) ∷ TypeType #

Methods

from ∷ PraosChainSelectView c → Rep (PraosChainSelectView c) x #

toRep (PraosChainSelectView c) x → PraosChainSelectView c #

Generic (Point block) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (Point block) ∷ TypeType #

Methods

from ∷ Point block → Rep (Point block) x #

toRep (Point block) x → Point block #

Generic (PBftCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftCannotForge c) ∷ TypeType #

Methods

from ∷ PBftCannotForge c → Rep (PBftCannotForge c) x #

toRep (PBftCannotForge c) x → PBftCannotForge c #

Generic (ExtLedgerState blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtLedgerState blk) ∷ TypeType #

Methods

from ∷ ExtLedgerState blk → Rep (ExtLedgerState blk) x #

toRep (ExtLedgerState blk) x → ExtLedgerState blk #

Generic (SignKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (SignKeyDSIGN Ed25519DSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN Ed25519DSIGN → Rep (SignKeyDSIGN Ed25519DSIGN) x #

toRep (SignKeyDSIGN Ed25519DSIGN) x → SignKeyDSIGN Ed25519DSIGN #

Generic (SignKeyDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (SignKeyDSIGN ByronDSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN ByronDSIGN → Rep (SignKeyDSIGN ByronDSIGN) x #

toRep (SignKeyDSIGN ByronDSIGN) x → SignKeyDSIGN ByronDSIGN #

Generic (SignKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (SignKeyDSIGN MockDSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN MockDSIGN → Rep (SignKeyDSIGN MockDSIGN) x #

toRep (SignKeyDSIGN MockDSIGN) x → SignKeyDSIGN MockDSIGN #

Generic (SignKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (SignKeyDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN EcdsaSecp256k1DSIGN → Rep (SignKeyDSIGN EcdsaSecp256k1DSIGN) x #

toRep (SignKeyDSIGN EcdsaSecp256k1DSIGN) x → SignKeyDSIGN EcdsaSecp256k1DSIGN #

Generic (SignKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (SignKeyDSIGN Ed448DSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN Ed448DSIGN → Rep (SignKeyDSIGN Ed448DSIGN) x #

toRep (SignKeyDSIGN Ed448DSIGN) x → SignKeyDSIGN Ed448DSIGN #

Generic (SignKeyDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (SignKeyDSIGN NeverDSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN NeverDSIGN → Rep (SignKeyDSIGN NeverDSIGN) x #

toRep (SignKeyDSIGN NeverDSIGN) x → SignKeyDSIGN NeverDSIGN #

Generic (SignKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (SignKeyDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ SignKeyDSIGN SchnorrSecp256k1DSIGN → Rep (SignKeyDSIGN SchnorrSecp256k1DSIGN) x #

toRep (SignKeyDSIGN SchnorrSecp256k1DSIGN) x → SignKeyDSIGN SchnorrSecp256k1DSIGN #

Generic (HeaderState blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderState blk) ∷ TypeType #

Methods

from ∷ HeaderState blk → Rep (HeaderState blk) x #

toRep (HeaderState blk) x → HeaderState blk #

Generic (AnnTip blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (AnnTip blk) ∷ TypeType #

Methods

from ∷ AnnTip blk → Rep (AnnTip blk) x #

toRep (AnnTip blk) x → AnnTip blk #

Generic (PBftState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.State

Associated Types

type Rep (PBftState c) ∷ TypeType #

Methods

from ∷ PBftState c → Rep (PBftState c) x #

toRep (PBftState c) x → PBftState c #

Generic (ATxAux a) 
Instance details

Defined in Cardano.Chain.UTxO.TxAux

Associated Types

type Rep (ATxAux a) ∷ TypeType #

Methods

from ∷ ATxAux a → Rep (ATxAux a) x #

toRep (ATxAux a) x → ATxAux a #

Generic (ACertificate a) 
Instance details

Defined in Cardano.Chain.Delegation.Certificate

Associated Types

type Rep (ACertificate a) ∷ TypeType #

Methods

from ∷ ACertificate a → Rep (ACertificate a) x #

toRep (ACertificate a) x → ACertificate a #

Generic (AProposal a) 
Instance details

Defined in Cardano.Chain.Update.Proposal

Associated Types

type Rep (AProposal a) ∷ TypeType #

Methods

from ∷ AProposal a → Rep (AProposal a) x #

toRep (AProposal a) x → AProposal a #

Generic (AVote a) 
Instance details

Defined in Cardano.Chain.Update.Vote

Associated Types

type Rep (AVote a) ∷ TypeType #

Methods

from ∷ AVote a → Rep (AVote a) x #

toRep (AVote a) x → AVote a #

Generic (ABlockOrBoundary a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlockOrBoundary a) ∷ TypeType #

Methods

from ∷ ABlockOrBoundary a → Rep (ABlockOrBoundary a) x #

toRep (ABlockOrBoundary a) x → ABlockOrBoundary a #

Generic (ExtLedgerCfg blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtLedgerCfg blk) ∷ TypeType #

Methods

from ∷ ExtLedgerCfg blk → Rep (ExtLedgerCfg blk) x #

toRep (ExtLedgerCfg blk) x → ExtLedgerCfg blk #

Generic (PBftLedgerView c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftLedgerView c) ∷ TypeType #

Methods

from ∷ PBftLedgerView c → Rep (PBftLedgerView c) x #

toRep (PBftLedgerView c) x → PBftLedgerView c #

Generic (PBftSigner c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.State

Associated Types

type Rep (PBftSigner c) ∷ TypeType #

Methods

from ∷ PBftSigner c → Rep (PBftSigner c) x #

toRep (PBftSigner c) x → PBftSigner c #

Generic (TipInfoIsEBB blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (TipInfoIsEBB blk) ∷ TypeType #

Methods

from ∷ TipInfoIsEBB blk → Rep (TipInfoIsEBB blk) x #

toRep (TipInfoIsEBB blk) x → TipInfoIsEBB blk #

Generic (PBftIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftIsLeader c) ∷ TypeType #

Methods

from ∷ PBftIsLeader c → Rep (PBftIsLeader c) x #

toRep (PBftIsLeader c) x → PBftIsLeader c #

Generic (PBftValidationErr c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftValidationErr c) ∷ TypeType #

Methods

from ∷ PBftValidationErr c → Rep (PBftValidationErr c) x #

toRep (PBftValidationErr c) x → PBftValidationErr c #

Generic (ABlockOrBoundaryHdr a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlockOrBoundaryHdr a) ∷ TypeType #

Methods

from ∷ ABlockOrBoundaryHdr a → Rep (ABlockOrBoundaryHdr a) x #

toRep (ABlockOrBoundaryHdr a) x → ABlockOrBoundaryHdr a #

Generic (ABoundaryHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (ABoundaryHeader a) ∷ TypeType #

Methods

from ∷ ABoundaryHeader a → Rep (ABoundaryHeader a) x #

toRep (ABoundaryHeader a) x → ABoundaryHeader a #

Generic (ABoundaryBlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABoundaryBlock a) ∷ TypeType #

Methods

from ∷ ABoundaryBlock a → Rep (ABoundaryBlock a) x #

toRep (ABoundaryBlock a) x → ABoundaryBlock a #

Generic (BHeader crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (BHeader crypto) ∷ TypeType #

Methods

from ∷ BHeader crypto → Rep (BHeader crypto) x #

toRep (BHeader crypto) x → BHeader crypto #

Generic (PrevHash crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (PrevHash crypto) ∷ TypeType #

Methods

from ∷ PrevHash crypto → Rep (PrevHash crypto) x #

toRep (PrevHash crypto) x → PrevHash crypto #

Generic (HeaderBody crypto) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Header

Associated Types

type Rep (HeaderBody crypto) ∷ TypeType #

Methods

from ∷ HeaderBody crypto → Rep (HeaderBody crypto) x #

toRep (HeaderBody crypto) x → HeaderBody crypto #

Generic (PraosCanBeLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep (PraosCanBeLeader c) ∷ TypeType #

Methods

from ∷ PraosCanBeLeader c → Rep (PraosCanBeLeader c) x #

toRep (PraosCanBeLeader c) x → PraosCanBeLeader c #

Generic (HeaderRaw crypto) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Header

Associated Types

type Rep (HeaderRaw crypto) ∷ TypeType #

Methods

from ∷ HeaderRaw crypto → Rep (HeaderRaw crypto) x #

toRep (HeaderRaw crypto) x → HeaderRaw crypto #

Generic (VerKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (VerKeyKES (SingleKES d)) ∷ TypeType #

Methods

from ∷ VerKeyKES (SingleKES d) → Rep (VerKeyKES (SingleKES d)) x #

toRep (VerKeyKES (SingleKES d)) x → VerKeyKES (SingleKES d) #

Generic (VerKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (VerKeyKES (SumKES h d)) ∷ TypeType #

Methods

from ∷ VerKeyKES (SumKES h d) → Rep (VerKeyKES (SumKES h d)) x #

toRep (VerKeyKES (SumKES h d)) x → VerKeyKES (SumKES h d) #

Generic (VerKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

type Rep (VerKeyKES (CompactSingleKES d)) ∷ TypeType #

Methods

from ∷ VerKeyKES (CompactSingleKES d) → Rep (VerKeyKES (CompactSingleKES d)) x #

toRep (VerKeyKES (CompactSingleKES d)) x → VerKeyKES (CompactSingleKES d) #

Generic (VerKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

type Rep (VerKeyKES (CompactSumKES h d)) ∷ TypeType #

Methods

from ∷ VerKeyKES (CompactSumKES h d) → Rep (VerKeyKES (CompactSumKES h d)) x #

toRep (VerKeyKES (CompactSumKES h d)) x → VerKeyKES (CompactSumKES h d) #

Generic (VerKeyKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (VerKeyKES (MockKES t)) ∷ TypeType #

Methods

from ∷ VerKeyKES (MockKES t) → Rep (VerKeyKES (MockKES t)) x #

toRep (VerKeyKES (MockKES t)) x → VerKeyKES (MockKES t) #

Generic (VerKeyKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (VerKeyKES NeverKES) ∷ TypeType #

Methods

from ∷ VerKeyKES NeverKES → Rep (VerKeyKES NeverKES) x #

toRep (VerKeyKES NeverKES) x → VerKeyKES NeverKES #

Generic (VerKeyKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (VerKeyKES (SimpleKES d t)) ∷ TypeType #

Methods

from ∷ VerKeyKES (SimpleKES d t) → Rep (VerKeyKES (SimpleKES d t)) x #

toRep (VerKeyKES (SimpleKES d t)) x → VerKeyKES (SimpleKES d t) #

Generic (SigKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (SigKES (SingleKES d)) ∷ TypeType #

Methods

from ∷ SigKES (SingleKES d) → Rep (SigKES (SingleKES d)) x #

toRep (SigKES (SingleKES d)) x → SigKES (SingleKES d) #

Generic (SigKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (SigKES (SumKES h d)) ∷ TypeType #

Methods

from ∷ SigKES (SumKES h d) → Rep (SigKES (SumKES h d)) x #

toRep (SigKES (SumKES h d)) x → SigKES (SumKES h d) #

Generic (SigKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

type Rep (SigKES (CompactSingleKES d)) ∷ TypeType #

Methods

from ∷ SigKES (CompactSingleKES d) → Rep (SigKES (CompactSingleKES d)) x #

toRep (SigKES (CompactSingleKES d)) x → SigKES (CompactSingleKES d) #

Generic (SigKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

type Rep (SigKES (CompactSumKES h d)) ∷ TypeType #

Methods

from ∷ SigKES (CompactSumKES h d) → Rep (SigKES (CompactSumKES h d)) x #

toRep (SigKES (CompactSumKES h d)) x → SigKES (CompactSumKES h d) #

Generic (SigKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SigKES (MockKES t)) ∷ TypeType #

Methods

from ∷ SigKES (MockKES t) → Rep (SigKES (MockKES t)) x #

toRep (SigKES (MockKES t)) x → SigKES (MockKES t) #

Generic (SigKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SigKES NeverKES) ∷ TypeType #

Methods

from ∷ SigKES NeverKES → Rep (SigKES NeverKES) x #

toRep (SigKES NeverKES) x → SigKES NeverKES #

Generic (SigKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (SigKES (SimpleKES d t)) ∷ TypeType #

Methods

from ∷ SigKES (SimpleKES d t) → Rep (SigKES (SimpleKES d t)) x #

toRep (SigKES (SimpleKES d t)) x → SigKES (SimpleKES d t) #

Generic (PraosCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosCannotForge c) ∷ TypeType #

Methods

from ∷ PraosCannotForge c → Rep (PraosCannotForge c) x #

toRep (PraosCannotForge c) x → PraosCannotForge c #

Generic (ShelleyLedgerConfig era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyLedgerConfig era) ∷ TypeType #

Methods

from ∷ ShelleyLedgerConfig era → Rep (ShelleyLedgerConfig era) x #

toRep (ShelleyLedgerConfig era) x → ShelleyLedgerConfig era #

Generic (ShelleyGenesisStaking crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Associated Types

type Rep (ShelleyGenesisStaking crypto) ∷ TypeType #

Methods

from ∷ ShelleyGenesisStaking crypto → Rep (ShelleyGenesisStaking crypto) x #

toRep (ShelleyGenesisStaking crypto) x → ShelleyGenesisStaking crypto #

Generic (Addr crypto) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (Addr crypto) ∷ TypeType #

Methods

from ∷ Addr crypto → Rep (Addr crypto) x #

toRep (Addr crypto) x → Addr crypto #

Generic (GenDelegPair crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GenDelegPair crypto) ∷ TypeType #

Methods

from ∷ GenDelegPair crypto → Rep (GenDelegPair crypto) x #

toRep (GenDelegPair crypto) x → GenDelegPair crypto #

Generic (NewEpochState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (NewEpochState era) ∷ TypeType #

Methods

from ∷ NewEpochState era → Rep (NewEpochState era) x #

toRep (NewEpochState era) x → NewEpochState era #

Generic (ShelleyGenesis era) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Associated Types

type Rep (ShelleyGenesis era) ∷ TypeType #

Methods

from ∷ ShelleyGenesis era → Rep (ShelleyGenesis era) x #

toRep (ShelleyGenesis era) x → ShelleyGenesis era #

Generic (CompactGenesis era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Config

Associated Types

type Rep (CompactGenesis era) ∷ TypeType #

Methods

from ∷ CompactGenesis era → Rep (CompactGenesis era) x #

toRep (CompactGenesis era) x → CompactGenesis era #

Generic (PPUPState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (PPUPState era) ∷ TypeType #

Methods

from ∷ PPUPState era → Rep (PPUPState era) x #

toRep (PPUPState era) x → PPUPState era #

Generic (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

Associated Types

type Rep (StrictMaybe a) ∷ TypeType #

Methods

from ∷ StrictMaybe a → Rep (StrictMaybe a) x #

toRep (StrictMaybe a) x → StrictMaybe a #

Generic (PraosState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosState c) ∷ TypeType #

Methods

from ∷ PraosState c → Rep (PraosState c) x #

toRep (PraosState c) x → PraosState c #

Generic (BHBody crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (BHBody crypto) ∷ TypeType #

Methods

from ∷ BHBody crypto → Rep (BHBody crypto) x #

toRep (BHBody crypto) x → BHBody crypto #

Generic (TPraosIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosIsLeader c) ∷ TypeType #

Methods

from ∷ TPraosIsLeader c → Rep (TPraosIsLeader c) x #

toRep (TPraosIsLeader c) x → TPraosIsLeader c #

Generic (TPraosToSign c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosToSign c) ∷ TypeType #

Methods

from ∷ TPraosToSign c → Rep (TPraosToSign c) x #

toRep (TPraosToSign c) x → TPraosToSign c #

Generic (TPraosCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosCannotForge c) ∷ TypeType #

Methods

from ∷ TPraosCannotForge c → Rep (TPraosCannotForge c) x #

toRep (TPraosCannotForge c) x → TPraosCannotForge c #

Generic (DPState crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (DPState crypto) ∷ TypeType #

Methods

from ∷ DPState crypto → Rep (DPState crypto) x #

toRep (DPState crypto) x → DPState crypto #

Generic (PoolParams crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (PoolParams crypto) ∷ TypeType #

Methods

from ∷ PoolParams crypto → Rep (PoolParams crypto) x #

toRep (PoolParams crypto) x → PoolParams crypto #

Generic (FutureGenDeleg crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (FutureGenDeleg crypto) ∷ TypeType #

Methods

from ∷ FutureGenDeleg crypto → Rep (FutureGenDeleg crypto) x #

toRep (FutureGenDeleg crypto) x → FutureGenDeleg crypto #

Generic (DState crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (DState crypto) ∷ TypeType #

Methods

from ∷ DState crypto → Rep (DState crypto) x #

toRep (DState crypto) x → DState crypto #

Generic (EpochState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (EpochState era) ∷ TypeType #

Methods

from ∷ EpochState era → Rep (EpochState era) x #

toRep (EpochState era) x → EpochState era #

Generic (TxIn crypto) 
Instance details

Defined in Cardano.Ledger.TxIn

Associated Types

type Rep (TxIn crypto) ∷ TypeType #

Methods

from ∷ TxIn crypto → Rep (TxIn crypto) x #

toRep (TxIn crypto) x → TxIn crypto #

Generic (LedgerState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (LedgerState era) ∷ TypeType #

Methods

from ∷ LedgerState era → Rep (LedgerState era) x #

toRep (LedgerState era) x → LedgerState era #

Generic (SnapShots crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.EpochBoundary

Associated Types

type Rep (SnapShots crypto) ∷ TypeType #

Methods

from ∷ SnapShots crypto → Rep (SnapShots crypto) x #

toRep (SnapShots crypto) x → SnapShots crypto #

Generic (SnapShot crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.EpochBoundary

Associated Types

type Rep (SnapShot crypto) ∷ TypeType #

Methods

from ∷ SnapShot crypto → Rep (SnapShot crypto) x #

toRep (SnapShot crypto) x → SnapShot crypto #

Generic (GenDelegs crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GenDelegs crypto) ∷ TypeType #

Methods

from ∷ GenDelegs crypto → Rep (GenDelegs crypto) x #

toRep (GenDelegs crypto) x → GenDelegs crypto #

Generic (IncrementalStake crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (IncrementalStake crypto) ∷ TypeType #

Methods

from ∷ IncrementalStake crypto → Rep (IncrementalStake crypto) x #

toRep (IncrementalStake crypto) x → IncrementalStake crypto #

Generic (InstantaneousRewards crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (InstantaneousRewards crypto) ∷ TypeType #

Methods

from ∷ InstantaneousRewards crypto → Rep (InstantaneousRewards crypto) x #

toRep (InstantaneousRewards crypto) x → InstantaneousRewards crypto #

Generic (NonMyopic crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep (NonMyopic crypto) ∷ TypeType #

Methods

from ∷ NonMyopic crypto → Rep (NonMyopic crypto) x #

toRep (NonMyopic crypto) x → NonMyopic crypto #

Generic (PState crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (PState crypto) ∷ TypeType #

Methods

from ∷ PState crypto → Rep (PState crypto) x #

toRep (PState crypto) x → PState crypto #

Generic (ProposedPPUpdates era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (ProposedPPUpdates era) ∷ TypeType #

Methods

from ∷ ProposedPPUpdates era → Rep (ProposedPPUpdates era) x #

toRep (ProposedPPUpdates era) x → ProposedPPUpdates era #

Generic (PulsingRewUpdate crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (PulsingRewUpdate crypto) ∷ TypeType #

Methods

from ∷ PulsingRewUpdate crypto → Rep (PulsingRewUpdate crypto) x #

toRep (PulsingRewUpdate crypto) x → PulsingRewUpdate crypto #

Generic (Reward crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep (Reward crypto) ∷ TypeType #

Methods

from ∷ Reward crypto → Rep (Reward crypto) x #

toRep (Reward crypto) x → Reward crypto #

Generic (RewardUpdate crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardUpdate crypto) ∷ TypeType #

Methods

from ∷ RewardUpdate crypto → Rep (RewardUpdate crypto) x #

toRep (RewardUpdate crypto) x → RewardUpdate crypto #

Generic (Script era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep (Script era) ∷ TypeType #

Methods

from ∷ Script era → Rep (Script era) x #

toRep (Script era) x → Script era #

Generic (Stake crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.EpochBoundary

Associated Types

type Rep (Stake crypto) ∷ TypeType #

Methods

from ∷ Stake crypto → Rep (Stake crypto) x #

toRep (Stake crypto) x → Stake crypto #

Generic (UTxO era) 
Instance details

Defined in Cardano.Ledger.Shelley.UTxO

Associated Types

type Rep (UTxO era) ∷ TypeType #

Methods

from ∷ UTxO era → Rep (UTxO era) x #

toRep (UTxO era) x → UTxO era #

Generic (UTxOState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (UTxOState era) ∷ TypeType #

Methods

from ∷ UTxOState era → Rep (UTxOState era) x #

toRep (UTxOState era) x → UTxOState era #

Generic (Value crypto) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Associated Types

type Rep (Value crypto) ∷ TypeType #

Methods

from ∷ Value crypto → Rep (Value crypto) x #

toRep (Value crypto) x → Value crypto #

Generic (TxId crypto) 
Instance details

Defined in Cardano.Ledger.TxIn

Associated Types

type Rep (TxId crypto) ∷ TypeType #

Methods

from ∷ TxId crypto → Rep (TxId crypto) x #

toRep (TxId crypto) x → TxId crypto #

Generic (ABlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlock a) ∷ TypeType #

Methods

from ∷ ABlock a → Rep (ABlock a) x #

toRep (ABlock a) x → ABlock a #

Generic (WithTop a) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Mempool

Associated Types

type Rep (WithTop a) ∷ TypeType #

Methods

from ∷ WithTop a → Rep (WithTop a) x #

toRep (WithTop a) x → WithTop a #

Generic (ExUnits' a) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep (ExUnits' a) ∷ TypeType #

Methods

from ∷ ExUnits' a → Rep (ExUnits' a) x #

toRep (ExUnits' a) x → ExUnits' a #

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) ∷ TypeType #

Methods

from ∷ Fix f → Rep (Fix f) x #

toRep (Fix f) x → Fix f #

Generic (RewardProvenance crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep (RewardProvenance crypto) ∷ TypeType #

Methods

from ∷ RewardProvenance crypto → Rep (RewardProvenance crypto) x #

toRep (RewardProvenance crypto) x → RewardProvenance crypto #

Generic (ShelleyLedgerError era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyLedgerError era) ∷ TypeType #

Methods

from ∷ ShelleyLedgerError era → Rep (ShelleyLedgerError era) x #

toRep (ShelleyLedgerError era) x → ShelleyLedgerError era #

Generic (BlockTransitionError era) 
Instance details

Defined in Cardano.Ledger.Shelley.API.Validation

Associated Types

type Rep (BlockTransitionError era) ∷ TypeType #

Methods

from ∷ BlockTransitionError era → Rep (BlockTransitionError era) x #

toRep (BlockTransitionError era) x → BlockTransitionError era #

Generic (HardForkValidationErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Protocol

Associated Types

type Rep (HardForkValidationErr xs) ∷ TypeType #

Methods

from ∷ HardForkValidationErr xs → Rep (HardForkValidationErr xs) x #

toRep (HardForkValidationErr xs) x → HardForkValidationErr xs #

Generic (HeaderFields b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (HeaderFields b) ∷ TypeType #

Methods

from ∷ HeaderFields b → Rep (HeaderFields b) x #

toRep (HeaderFields b) x → HeaderFields b #

Generic (ChainHash b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (ChainHash b) ∷ TypeType #

Methods

from ∷ ChainHash b → Rep (ChainHash b) x #

toRep (ChainHash b) x → ChainHash b #

Generic (BlocksMade crypto) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep (BlocksMade crypto) ∷ TypeType #

Methods

from ∷ BlocksMade crypto → Rep (BlocksMade crypto) x #

toRep (BlocksMade crypto) x → BlocksMade crypto #

Generic (Update era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (Update era) ∷ TypeType #

Methods

from ∷ Update era → Rep (Update era) x #

toRep (Update era) x → Update era #

Generic (AuxiliaryData era) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.AuxiliaryData

Associated Types

type Rep (AuxiliaryData era) ∷ TypeType #

Methods

from ∷ AuxiliaryData era → Rep (AuxiliaryData era) x #

toRep (AuxiliaryData era) x → AuxiliaryData era #

Generic (Timelock crypto) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.Timelocks

Associated Types

type Rep (Timelock crypto) ∷ TypeType #

Methods

from ∷ Timelock crypto → Rep (Timelock crypto) x #

toRep (Timelock crypto) x → Timelock crypto #

Generic (TxBody era) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.TxBody

Associated Types

type Rep (TxBody era) ∷ TypeType #

Methods

from ∷ TxBody era → Rep (TxBody era) x #

toRep (TxBody era) x → TxBody era #

Generic (ValidatedTx era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (ValidatedTx era) ∷ TypeType #

Methods

from ∷ ValidatedTx era → Rep (ValidatedTx era) x #

toRep (ValidatedTx era) x → ValidatedTx era #

Generic (MemoBytes t) 
Instance details

Defined in Data.MemoBytes

Associated Types

type Rep (MemoBytes t) ∷ TypeType #

Methods

from ∷ MemoBytes t → Rep (MemoBytes t) x #

toRep (MemoBytes t) x → MemoBytes t #

Generic (TimelockRaw crypto) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.Timelocks

Associated Types

type Rep (TimelockRaw crypto) ∷ TypeType #

Methods

from ∷ TimelockRaw crypto → Rep (TimelockRaw crypto) x #

toRep (TimelockRaw crypto) x → TimelockRaw crypto #

Generic (AuxiliaryDataRaw era) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.AuxiliaryData

Associated Types

type Rep (AuxiliaryDataRaw era) ∷ TypeType #

Methods

from ∷ AuxiliaryDataRaw era → Rep (AuxiliaryDataRaw era) x #

toRep (AuxiliaryDataRaw era) x → AuxiliaryDataRaw era #

Generic (TxSeq era) 
Instance details

Defined in Cardano.Ledger.Shelley.BlockChain

Associated Types

type Rep (TxSeq era) ∷ TypeType #

Methods

from ∷ TxSeq era → Rep (TxSeq era) x #

toRep (TxSeq era) x → TxSeq era #

Generic (LedgerPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ledger

Associated Types

type Rep (LedgerPredicateFailure era) ∷ TypeType #

Methods

from ∷ LedgerPredicateFailure era → Rep (LedgerPredicateFailure era) x #

toRep (LedgerPredicateFailure era) x → LedgerPredicateFailure era #

Generic (DelegsPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Delegs

Associated Types

type Rep (DelegsPredicateFailure era) ∷ TypeType #

Methods

from ∷ DelegsPredicateFailure era → Rep (DelegsPredicateFailure era) x #

toRep (DelegsPredicateFailure era) x → DelegsPredicateFailure era #

Generic (DelplPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Delpl

Associated Types

type Rep (DelplPredicateFailure era) ∷ TypeType #

Methods

from ∷ DelplPredicateFailure era → Rep (DelplPredicateFailure era) x #

toRep (DelplPredicateFailure era) x → DelplPredicateFailure era #

Generic (DCert crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (DCert crypto) ∷ TypeType #

Methods

from ∷ DCert crypto → Rep (DCert crypto) x #

toRep (DCert crypto) x → DCert crypto #

Generic (Wdrl crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (Wdrl crypto) ∷ TypeType #

Methods

from ∷ Wdrl crypto → Rep (Wdrl crypto) x #

toRep (Wdrl crypto) x → Wdrl crypto #

Generic (ScriptHash crypto) 
Instance details

Defined in Cardano.Ledger.Hashes

Associated Types

type Rep (ScriptHash crypto) ∷ TypeType #

Methods

from ∷ ScriptHash crypto → Rep (ScriptHash crypto) x #

toRep (ScriptHash crypto) x → ScriptHash crypto #

Generic (UtxoPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.Rules.Utxo

Associated Types

type Rep (UtxoPredicateFailure era) ∷ TypeType #

Methods

from ∷ UtxoPredicateFailure era → Rep (UtxoPredicateFailure era) x #

toRep (UtxoPredicateFailure era) x → UtxoPredicateFailure era #

Generic (UtxowPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Utxow

Associated Types

type Rep (UtxowPredicateFailure era) ∷ TypeType #

Methods

from ∷ UtxowPredicateFailure era → Rep (UtxowPredicateFailure era) x #

toRep (UtxowPredicateFailure era) x → UtxowPredicateFailure era #

Generic (Data era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Data

Associated Types

type Rep (Data era) ∷ TypeType #

Methods

from ∷ Data era → Rep (Data era) x #

toRep (Data era) x → Data era #

Generic (AuxiliaryDataRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Data

Associated Types

type Rep (AuxiliaryDataRaw era) ∷ TypeType #

Methods

from ∷ AuxiliaryDataRaw era → Rep (AuxiliaryDataRaw era) x #

toRep (AuxiliaryDataRaw era) x → AuxiliaryDataRaw era #

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) ∷ TypeType #

Methods

from ∷ Doc ann → Rep (Doc ann) x #

toRep (Doc ann) x → Doc ann #

Generic (Kind ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Kind ann) ∷ TypeType #

Methods

from ∷ Kind ann → Rep (Kind ann) x #

toRep (Kind ann) x → Kind ann #

Generic (Version ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Version ann) ∷ TypeType #

Methods

from ∷ Version ann → Rep (Version ann) x #

toRep (Version ann) x → Version ann #

Generic (Normalized a) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Normalized a) ∷ TypeType #

Methods

from ∷ Normalized a → Rep (Normalized a) x #

toRep (Normalized a) x → Normalized a #

Generic (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorItem t) ∷ TypeType #

Methods

from ∷ ErrorItem t → Rep (ErrorItem t) x #

toRep (ErrorItem t) x → ErrorItem t #

Generic (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorFancy e) ∷ TypeType #

Methods

from ∷ ErrorFancy e → Rep (ErrorFancy e) x #

toRep (ErrorFancy e) x → ErrorFancy e #

Generic (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (PosState s) ∷ TypeType #

Methods

from ∷ PosState s → Rep (PosState s) x #

toRep (PosState s) x → PosState s #

Generic (UniqueError ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (UniqueError ann) ∷ TypeType #

Methods

from ∷ UniqueError ann → Rep (UniqueError ann) x #

toRep (UniqueError ann) x → UniqueError ann #

Generic (RewardProvenancePool crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep (RewardProvenancePool crypto) ∷ TypeType #

Methods

from ∷ RewardProvenancePool crypto → Rep (RewardProvenancePool crypto) x #

toRep (RewardProvenancePool crypto) x → RewardProvenancePool crypto #

Generic (RewardAcnt crypto) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (RewardAcnt crypto) ∷ TypeType #

Methods

from ∷ RewardAcnt crypto → Rep (RewardAcnt crypto) x #

toRep (RewardAcnt crypto) x → RewardAcnt crypto #

Generic (Handle h) 
Instance details

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

Associated Types

type Rep (Handle h) ∷ TypeType #

Methods

from ∷ Handle h → Rep (Handle h) x #

toRep (Handle h) x → Handle h #

Generic (ConnectionId addr) 
Instance details

Defined in Ouroboros.Network.ConnectionId

Associated Types

type Rep (ConnectionId addr) ∷ TypeType #

Methods

from ∷ ConnectionId addr → Rep (ConnectionId addr) x #

toRep (ConnectionId addr) x → ConnectionId addr #

Generic (Solo a) 
Instance details

Defined in Data.Tuple.Solo

Associated Types

type Rep (Solo a) ∷ TypeType #

Methods

from ∷ Solo a → Rep (Solo a) x #

toRep (Solo a) x → Solo a #

Generic (SignKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (SignKeyKES (SingleKES d)) ∷ TypeType #

Methods

from ∷ SignKeyKES (SingleKES d) → Rep (SignKeyKES (SingleKES d)) x #

toRep (SignKeyKES (SingleKES d)) x → SignKeyKES (SingleKES d) #

Generic (SignKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (SignKeyKES (SumKES h d)) ∷ TypeType #

Methods

from ∷ SignKeyKES (SumKES h d) → Rep (SignKeyKES (SumKES h d)) x #

toRep (SignKeyKES (SumKES h d)) x → SignKeyKES (SumKES h d) #

Generic (SignKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

type Rep (SignKeyKES (CompactSingleKES d)) ∷ TypeType #

Methods

from ∷ SignKeyKES (CompactSingleKES d) → Rep (SignKeyKES (CompactSingleKES d)) x #

toRep (SignKeyKES (CompactSingleKES d)) x → SignKeyKES (CompactSingleKES d) #

Generic (SignKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

type Rep (SignKeyKES (CompactSumKES h d)) ∷ TypeType #

Methods

from ∷ SignKeyKES (CompactSumKES h d) → Rep (SignKeyKES (CompactSumKES h d)) x #

toRep (SignKeyKES (CompactSumKES h d)) x → SignKeyKES (CompactSumKES h d) #

Generic (SignKeyKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SignKeyKES (MockKES t)) ∷ TypeType #

Methods

from ∷ SignKeyKES (MockKES t) → Rep (SignKeyKES (MockKES t)) x #

toRep (SignKeyKES (MockKES t)) x → SignKeyKES (MockKES t) #

Generic (SignKeyKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SignKeyKES NeverKES) ∷ TypeType #

Methods

from ∷ SignKeyKES NeverKES → Rep (SignKeyKES NeverKES) x #

toRep (SignKeyKES NeverKES) x → SignKeyKES NeverKES #

Generic (SignKeyKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (SignKeyKES (SimpleKES d t)) ∷ TypeType #

Methods

from ∷ SignKeyKES (SimpleKES d t) → Rep (SignKeyKES (SimpleKES d t)) x #

toRep (SignKeyKES (SimpleKES d t)) x → SignKeyKES (SimpleKES d t) #

Generic (SigDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (SigDSIGN Ed25519DSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN Ed25519DSIGN → Rep (SigDSIGN Ed25519DSIGN) x #

toRep (SigDSIGN Ed25519DSIGN) x → SigDSIGN Ed25519DSIGN #

Generic (SigDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (SigDSIGN ByronDSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN ByronDSIGN → Rep (SigDSIGN ByronDSIGN) x #

toRep (SigDSIGN ByronDSIGN) x → SigDSIGN ByronDSIGN #

Generic (SigDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (SigDSIGN MockDSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN MockDSIGN → Rep (SigDSIGN MockDSIGN) x #

toRep (SigDSIGN MockDSIGN) x → SigDSIGN MockDSIGN #

Generic (SigDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (SigDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN EcdsaSecp256k1DSIGN → Rep (SigDSIGN EcdsaSecp256k1DSIGN) x #

toRep (SigDSIGN EcdsaSecp256k1DSIGN) x → SigDSIGN EcdsaSecp256k1DSIGN #

Generic (SigDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (SigDSIGN Ed448DSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN Ed448DSIGN → Rep (SigDSIGN Ed448DSIGN) x #

toRep (SigDSIGN Ed448DSIGN) x → SigDSIGN Ed448DSIGN #

Generic (SigDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (SigDSIGN NeverDSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN NeverDSIGN → Rep (SigDSIGN NeverDSIGN) x #

toRep (SigDSIGN NeverDSIGN) x → SigDSIGN NeverDSIGN #

Generic (SigDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (SigDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType #

Methods

from ∷ SigDSIGN SchnorrSecp256k1DSIGN → Rep (SigDSIGN SchnorrSecp256k1DSIGN) x #

toRep (SigDSIGN SchnorrSecp256k1DSIGN) x → SigDSIGN SchnorrSecp256k1DSIGN #

Generic (ChainTransitionError crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (ChainTransitionError crypto) ∷ TypeType #

Methods

from ∷ ChainTransitionError crypto → Rep (ChainTransitionError crypto) x #

toRep (ChainTransitionError crypto) x → ChainTransitionError crypto #

Generic (PrtclPredicateFailure crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclPredicateFailure crypto) ∷ TypeType #

Methods

from ∷ PrtclPredicateFailure crypto → Rep (PrtclPredicateFailure crypto) x #

toRep (PrtclPredicateFailure crypto) x → PrtclPredicateFailure crypto #

Generic (ChainDepState crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (ChainDepState crypto) ∷ TypeType #

Methods

from ∷ ChainDepState crypto → Rep (ChainDepState crypto) x #

toRep (ChainDepState crypto) x → ChainDepState crypto #

Generic (OCert crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.OCert

Associated Types

type Rep (OCert crypto) ∷ TypeType #

Methods

from ∷ OCert crypto → Rep (OCert crypto) x #

toRep (OCert crypto) x → OCert crypto #

Generic (PrtclState crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclState crypto) ∷ TypeType #

Methods

from ∷ PrtclState crypto → Rep (PrtclState crypto) x #

toRep (PrtclState crypto) x → PrtclState crypto #

Generic (TxBody era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (TxBody era) ∷ TypeType #

Methods

from ∷ TxBody era → Rep (TxBody era) x #

toRep (TxBody era) x → TxBody era #

Generic (Metadata era) 
Instance details

Defined in Cardano.Ledger.Shelley.Metadata

Associated Types

type Rep (Metadata era) ∷ TypeType #

Methods

from ∷ Metadata era → Rep (Metadata era) x #

toRep (Metadata era) x → Metadata era #

Generic (MultiSig crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Scripts

Associated Types

type Rep (MultiSig crypto) ∷ TypeType #

Methods

from ∷ MultiSig crypto → Rep (MultiSig crypto) x #

toRep (MultiSig crypto) x → MultiSig crypto #

Generic (TxSeq era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxSeq

Associated Types

type Rep (TxSeq era) ∷ TypeType #

Methods

from ∷ TxSeq era → Rep (TxSeq era) x #

toRep (TxSeq era) x → TxSeq era #

Generic (BootstrapWitness crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Address.Bootstrap

Associated Types

type Rep (BootstrapWitness crypto) ∷ TypeType #

Methods

from ∷ BootstrapWitness crypto → Rep (BootstrapWitness crypto) x #

toRep (BootstrapWitness crypto) x → BootstrapWitness crypto #

Generic (Sized a) 
Instance details

Defined in Cardano.Ledger.Serialization

Associated Types

type Rep (Sized a) ∷ TypeType #

Methods

from ∷ Sized a → Rep (Sized a) x #

toRep (Sized a) x → Sized a #

Generic (ScriptPurpose crypto) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (ScriptPurpose crypto) ∷ TypeType #

Methods

from ∷ ScriptPurpose crypto → Rep (ScriptPurpose crypto) x #

toRep (ScriptPurpose crypto) x → ScriptPurpose crypto #

Generic (TranslationError crypto) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep (TranslationError crypto) ∷ TypeType #

Methods

from ∷ TranslationError crypto → Rep (TranslationError crypto) x #

toRep (TranslationError crypto) x → TranslationError crypto #

Generic (PraosIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosIsLeader c) ∷ TypeType #

Methods

from ∷ PraosIsLeader c → Rep (PraosIsLeader c) x #

toRep (PraosIsLeader c) x → PraosIsLeader c #

Generic (PraosToSign c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosToSign c) ∷ TypeType #

Methods

from ∷ PraosToSign c → Rep (PraosToSign c) x #

toRep (PraosToSign c) x → PraosToSign c #

Generic (PraosValidationErr c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosValidationErr c) ∷ TypeType #

Methods

from ∷ PraosValidationErr c → Rep (PraosValidationErr c) x #

toRep (PraosValidationErr c) x → PraosValidationErr c #

Generic (TxWitnessRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Associated Types

type Rep (TxWitnessRaw era) ∷ TypeType #

Methods

from ∷ TxWitnessRaw era → Rep (TxWitnessRaw era) x #

toRep (TxWitnessRaw era) x → TxWitnessRaw era #

Generic (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) ∷ TypeType #

Methods

from ∷ Maybe a → Rep (Maybe a) x #

toRep (Maybe a) x → Maybe a #

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) ∷ TypeType #

Methods

from ∷ HistoriedResponse body → Rep (HistoriedResponse body) x #

toRep (HistoriedResponse body) x → HistoriedResponse body #

Generic (ClientM a) 
Instance details

Defined in Servant.Client.Internal.HttpClient

Associated Types

type Rep (ClientM a) ∷ TypeType #

Methods

from ∷ ClientM a → Rep (ClientM a) x #

toRep (ClientM a) x → ClientM a #

Generic (ResponseF a) 
Instance details

Defined in Servant.Client.Core.Response

Associated Types

type Rep (ResponseF a) ∷ TypeType #

Methods

from ∷ ResponseF a → Rep (ResponseF a) x #

toRep (ResponseF a) x → ResponseF a #

Generic (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Last' a) ∷ TypeType #

Methods

from ∷ Last' a → Rep (Last' a) x #

toRep (Last' a) x → Last' a #

Generic (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Option' a) ∷ TypeType #

Methods

from ∷ Option' a → Rep (Option' a) x #

toRep (Option' a) x → Option' a #

Generic (Only a) 
Instance details

Defined in Data.Tuple.Only

Associated Types

type Rep (Only a) ∷ TypeType #

Methods

from ∷ Only a → Rep (Only a) x #

toRep (Only a) x → Only a #

Generic (Graph a) 
Instance details

Defined in Algebra.Graph

Associated Types

type Rep (Graph a) ∷ TypeType #

Methods

from ∷ Graph a → Rep (Graph a) x #

toRep (Graph a) x → Graph a #

Generic (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.AdjacencyMap

Associated Types

type Rep (AdjacencyMap a) ∷ TypeType #

Methods

from ∷ AdjacencyMap a → Rep (AdjacencyMap a) x #

toRep (AdjacencyMap a) x → AdjacencyMap a #

Generic (Graph a) 
Instance details

Defined in Algebra.Graph.Undirected

Associated Types

type Rep (Graph a) ∷ TypeType #

Methods

from ∷ Graph a → Rep (Graph a) x #

toRep (Graph a) x → Graph a #

Generic (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

Associated Types

type Rep (AdjacencyMap a) ∷ TypeType #

Methods

from ∷ AdjacencyMap a → Rep (AdjacencyMap a) x #

toRep (AdjacencyMap a) x → AdjacencyMap a #

Generic (StakeReference crypto) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (StakeReference crypto) ∷ TypeType #

Methods

from ∷ StakeReference crypto → Rep (StakeReference crypto) x #

toRep (StakeReference crypto) x → StakeReference crypto #

Generic (TickfPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (TickfPredicateFailure era) ∷ TypeType #

Methods

from ∷ TickfPredicateFailure era → Rep (TickfPredicateFailure era) x #

toRep (TickfPredicateFailure era) x → TickfPredicateFailure era #

Generic (Tip b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (Tip b) ∷ TypeType #

Methods

from ∷ Tip b → Rep (Tip b) x #

toRep (Tip b) x → Tip b #

Generic (SignKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (SignKeyVRF PraosVRF) ∷ TypeType #

Methods

from ∷ SignKeyVRF PraosVRF → Rep (SignKeyVRF PraosVRF) x #

toRep (SignKeyVRF PraosVRF) x → SignKeyVRF PraosVRF #

Generic (SignKeyVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (SignKeyVRF MockVRF) ∷ TypeType #

Methods

from ∷ SignKeyVRF MockVRF → Rep (SignKeyVRF MockVRF) x #

toRep (SignKeyVRF MockVRF) x → SignKeyVRF MockVRF #

Generic (SignKeyVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (SignKeyVRF NeverVRF) ∷ TypeType #

Methods

from ∷ SignKeyVRF NeverVRF → Rep (SignKeyVRF NeverVRF) x #

toRep (SignKeyVRF NeverVRF) x → SignKeyVRF NeverVRF #

Generic (SignKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (SignKeyVRF SimpleVRF) ∷ TypeType #

Methods

from ∷ SignKeyVRF SimpleVRF → Rep (SignKeyVRF SimpleVRF) x #

toRep (SignKeyVRF SimpleVRF) x → SignKeyVRF SimpleVRF #

Generic (MultiSigRaw crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Scripts

Associated Types

type Rep (MultiSigRaw crypto) ∷ TypeType #

Methods

from ∷ MultiSigRaw crypto → Rep (MultiSigRaw crypto) x #

toRep (MultiSigRaw crypto) x → MultiSigRaw crypto #

Generic (TxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (TxBodyRaw era) ∷ TypeType #

Methods

from ∷ TxBodyRaw era → Rep (TxBodyRaw era) x #

toRep (TxBodyRaw era) x → TxBodyRaw era #

Generic (TxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.TxBody

Associated Types

type Rep (TxBodyRaw era) ∷ TypeType #

Methods

from ∷ TxBodyRaw era → Rep (TxBodyRaw era) x #

toRep (TxBodyRaw era) x → TxBodyRaw era #

Generic (TxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Associated Types

type Rep (TxBodyRaw era) ∷ TypeType #

Methods

from ∷ TxBodyRaw era → Rep (TxBodyRaw era) x #

toRep (TxBodyRaw era) x → TxBodyRaw era #

Generic (TxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Associated Types

type Rep (TxBodyRaw era) ∷ TypeType #

Methods

from ∷ TxBodyRaw era → Rep (TxBodyRaw era) x #

toRep (TxBodyRaw era) x → TxBodyRaw era #

Generic (RedeemersRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Associated Types

type Rep (RedeemersRaw era) ∷ TypeType #

Methods

from ∷ RedeemersRaw era → Rep (RedeemersRaw era) x #

toRep (RedeemersRaw era) x → RedeemersRaw era #

Generic (TxDatsRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Associated Types

type Rep (TxDatsRaw era) ∷ TypeType #

Methods

from ∷ TxDatsRaw era → Rep (TxDatsRaw era) x #

toRep (TxDatsRaw era) x → TxDatsRaw era #

Generic (CertVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (CertVRF PraosVRF) ∷ TypeType #

Methods

from ∷ CertVRF PraosVRF → Rep (CertVRF PraosVRF) x #

toRep (CertVRF PraosVRF) x → CertVRF PraosVRF #

Generic (CertVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (CertVRF MockVRF) ∷ TypeType #

Methods

from ∷ CertVRF MockVRF → Rep (CertVRF MockVRF) x #

toRep (CertVRF MockVRF) x → CertVRF MockVRF #

Generic (CertVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (CertVRF NeverVRF) ∷ TypeType #

Methods

from ∷ CertVRF NeverVRF → Rep (CertVRF NeverVRF) x #

toRep (CertVRF NeverVRF) x → CertVRF NeverVRF #

Generic (CertVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (CertVRF SimpleVRF) ∷ TypeType #

Methods

from ∷ CertVRF SimpleVRF → Rep (CertVRF SimpleVRF) x #

toRep (CertVRF SimpleVRF) x → CertVRF SimpleVRF #

Generic (AProtocolMagic a) 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep (AProtocolMagic a) ∷ TypeType #

Methods

from ∷ AProtocolMagic a → Rep (AProtocolMagic a) x #

toRep (AProtocolMagic a) x → AProtocolMagic a #

Generic (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

Associated Types

type Rep (RedeemSignature a) ∷ TypeType #

Methods

from ∷ RedeemSignature a → Rep (RedeemSignature a) x #

toRep (RedeemSignature a) x → RedeemSignature a #

Generic (Signature a) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Associated Types

type Rep (Signature a) ∷ TypeType #

Methods

from ∷ Signature a → Rep (Signature a) x #

toRep (Signature a) x → Signature a #

Generic (CollectError crypto) 
Instance details

Defined in Cardano.Ledger.Alonzo.PlutusScriptApi

Associated Types

type Rep (CollectError crypto) ∷ TypeType #

Methods

from ∷ CollectError crypto → Rep (CollectError crypto) x #

toRep (CollectError crypto) x → CollectError crypto #

Generic (ScriptIntegrity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (ScriptIntegrity era) ∷ TypeType #

Methods

from ∷ ScriptIntegrity era → Rep (ScriptIntegrity era) x #

toRep (ScriptIntegrity era) x → ScriptIntegrity era #

Generic (TxOutSource crypto) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep (TxOutSource crypto) ∷ TypeType #

Methods

from ∷ TxOutSource crypto → Rep (TxOutSource crypto) x #

toRep (TxOutSource crypto) x → TxOutSource crypto #

Generic (Interval a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Associated Types

type Rep (Interval a) ∷ TypeType #

Methods

from ∷ Interval a → Rep (Interval a) x #

toRep (Interval a) x → Interval a #

Generic (AlonzoBbodyPredFail era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Bbody

Associated Types

type Rep (AlonzoBbodyPredFail era) ∷ TypeType #

Methods

from ∷ AlonzoBbodyPredFail era → Rep (AlonzoBbodyPredFail era) x #

toRep (AlonzoBbodyPredFail era) x → AlonzoBbodyPredFail era #

Generic (BbodyPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Bbody

Associated Types

type Rep (BbodyPredicateFailure era) ∷ TypeType #

Methods

from ∷ BbodyPredicateFailure era → Rep (BbodyPredicateFailure era) x #

toRep (BbodyPredicateFailure era) x → BbodyPredicateFailure era #

Generic (UtxowPredicateFail era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxow

Associated Types

type Rep (UtxowPredicateFail era) ∷ TypeType #

Methods

from ∷ UtxowPredicateFail era → Rep (UtxowPredicateFail era) x #

toRep (UtxowPredicateFail era) x → UtxowPredicateFail era #

Generic (UtxoPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxo

Associated Types

type Rep (UtxoPredicateFailure era) ∷ TypeType #

Methods

from ∷ UtxoPredicateFailure era → Rep (UtxoPredicateFailure era) x #

toRep (UtxoPredicateFailure era) x → UtxoPredicateFailure era #

Generic (UtxosPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep (UtxosPredicateFailure era) ∷ TypeType #

Methods

from ∷ UtxosPredicateFailure era → Rep (UtxosPredicateFailure era) x #

toRep (UtxosPredicateFailure era) x → UtxosPredicateFailure era #

Generic (UtxoPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Utxo

Associated Types

type Rep (UtxoPredicateFailure era) ∷ TypeType #

Methods

from ∷ UtxoPredicateFailure era → Rep (UtxoPredicateFailure era) x #

toRep (UtxoPredicateFailure era) x → UtxoPredicateFailure era #

Generic (PpupPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ppup

Associated Types

type Rep (PpupPredicateFailure era) ∷ TypeType #

Methods

from ∷ PpupPredicateFailure era → Rep (PpupPredicateFailure era) x #

toRep (PpupPredicateFailure era) x → PpupPredicateFailure era #

Generic (WitHashes crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState

Associated Types

type Rep (WitHashes crypto) ∷ TypeType #

Methods

from ∷ WitHashes crypto → Rep (WitHashes crypto) x #

toRep (WitHashes crypto) x → WitHashes crypto #

Generic (PPUpdateEnv era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (PPUpdateEnv era) ∷ TypeType #

Methods

from ∷ PPUpdateEnv era → Rep (PPUpdateEnv era) x #

toRep (PPUpdateEnv era) x → PPUpdateEnv era #

Generic (ABoundaryBody a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABoundaryBody a) ∷ TypeType #

Methods

from ∷ ABoundaryBody a → Rep (ABoundaryBody a) x #

toRep (ABoundaryBody a) x → ABoundaryBody a #

Generic (ABody a) 
Instance details

Defined in Cardano.Chain.Block.Body

Associated Types

type Rep (ABody a) ∷ TypeType #

Methods

from ∷ ABody a → Rep (ABody a) x #

toRep (ABody a) x → ABody a #

Generic (APayload a) 
Instance details

Defined in Cardano.Chain.Delegation.Payload

Associated Types

type Rep (APayload a) ∷ TypeType #

Methods

from ∷ APayload a → Rep (APayload a) x #

toRep (APayload a) x → APayload a #

Generic (ABlockSignature a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (ABlockSignature a) ∷ TypeType #

Methods

from ∷ ABlockSignature a → Rep (ABlockSignature a) x #

toRep (ABlockSignature a) x → ABlockSignature a #

Generic (ATxPayload a) 
Instance details

Defined in Cardano.Chain.UTxO.TxPayload

Associated Types

type Rep (ATxPayload a) ∷ TypeType #

Methods

from ∷ ATxPayload a → Rep (ATxPayload a) x #

toRep (ATxPayload a) x → ATxPayload a #

Generic (APayload a) 
Instance details

Defined in Cardano.Chain.Update.Payload

Associated Types

type Rep (APayload a) ∷ TypeType #

Methods

from ∷ APayload a → Rep (APayload a) x #

toRep (APayload a) x → APayload a #

Generic (MerkleRoot a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleRoot a) ∷ TypeType #

Methods

from ∷ MerkleRoot a → Rep (MerkleRoot a) x #

toRep (MerkleRoot a) x → MerkleRoot a #

Generic (MerkleNode a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleNode a) ∷ TypeType #

Methods

from ∷ MerkleNode a → Rep (MerkleNode a) x #

toRep (MerkleNode a) x → MerkleNode a #

Generic (Attributes h) 
Instance details

Defined in Cardano.Chain.Common.Attributes

Associated Types

type Rep (Attributes h) ∷ TypeType #

Methods

from ∷ Attributes h → Rep (Attributes h) x #

toRep (Attributes h) x → Attributes h #

Generic (MerkleTree a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleTree a) ∷ TypeType #

Methods

from ∷ MerkleTree a → Rep (MerkleTree a) x #

toRep (MerkleTree a) x → MerkleTree a #

Generic (BootstrapAddress crypto) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (BootstrapAddress crypto) ∷ TypeType #

Methods

from ∷ BootstrapAddress crypto → Rep (BootstrapAddress crypto) x #

toRep (BootstrapAddress crypto) x → BootstrapAddress crypto #

Generic (GenesisCredential crypto) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (GenesisCredential crypto) ∷ TypeType #

Methods

from ∷ GenesisCredential crypto → Rep (GenesisCredential crypto) x #

toRep (GenesisCredential crypto) x → GenesisCredential crypto #

Generic (GKeys crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GKeys crypto) ∷ TypeType #

Methods

from ∷ GKeys crypto → Rep (GKeys crypto) x #

toRep (GKeys crypto) x → GKeys crypto #

Generic (TickTransitionError era) 
Instance details

Defined in Cardano.Ledger.Shelley.API.Validation

Associated Types

type Rep (TickTransitionError era) ∷ TypeType #

Methods

from ∷ TickTransitionError era → Rep (TickTransitionError era) x #

toRep (TickTransitionError era) x → TickTransitionError era #

Generic (TxRaw era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Associated Types

type Rep (TxRaw era) ∷ TypeType #

Methods

from ∷ TxRaw era → Rep (TxRaw era) x #

toRep (TxRaw era) x → TxRaw era #

Generic (RewardSnapShot crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardSnapShot crypto) ∷ TypeType #

Methods

from ∷ RewardSnapShot crypto → Rep (RewardSnapShot crypto) x #

toRep (RewardSnapShot crypto) x → RewardSnapShot crypto #

Generic (RewardAns c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardAns c) ∷ TypeType #

Methods

from ∷ RewardAns c → Rep (RewardAns c) x #

toRep (RewardAns c) x → RewardAns c #

Generic (FreeVars crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (FreeVars crypto) ∷ TypeType #

Methods

from ∷ FreeVars crypto → Rep (FreeVars crypto) x #

toRep (FreeVars crypto) x → FreeVars crypto #

Generic (PoolRewardInfo crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep (PoolRewardInfo crypto) ∷ TypeType #

Methods

from ∷ PoolRewardInfo crypto → Rep (PoolRewardInfo crypto) x #

toRep (PoolRewardInfo crypto) x → PoolRewardInfo crypto #

Generic (LeaderOnlyReward crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep (LeaderOnlyReward crypto) ∷ TypeType #

Methods

from ∷ LeaderOnlyReward crypto → Rep (LeaderOnlyReward crypto) x #

toRep (LeaderOnlyReward crypto) x → LeaderOnlyReward crypto #

Generic (DelegPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Deleg

Associated Types

type Rep (DelegPredicateFailure era) ∷ TypeType #

Methods

from ∷ DelegPredicateFailure era → Rep (DelegPredicateFailure era) x #

toRep (DelegPredicateFailure era) x → DelegPredicateFailure era #

Generic (PoolPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Pool

Associated Types

type Rep (PoolPredicateFailure era) ∷ TypeType #

Methods

from ∷ PoolPredicateFailure era → Rep (PoolPredicateFailure era) x #

toRep (PoolPredicateFailure era) x → PoolPredicateFailure era #

Generic (EpochPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Epoch

Associated Types

type Rep (EpochPredicateFailure era) ∷ TypeType #

Methods

from ∷ EpochPredicateFailure era → Rep (EpochPredicateFailure era) x #

toRep (EpochPredicateFailure era) x → EpochPredicateFailure era #

Generic (PoolreapPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.PoolReap

Associated Types

type Rep (PoolreapPredicateFailure era) ∷ TypeType #

Methods

from ∷ PoolreapPredicateFailure era → Rep (PoolreapPredicateFailure era) x #

toRep (PoolreapPredicateFailure era) x → PoolreapPredicateFailure era #

Generic (SnapPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Snap

Associated Types

type Rep (SnapPredicateFailure era) ∷ TypeType #

Methods

from ∷ SnapPredicateFailure era → Rep (SnapPredicateFailure era) x #

toRep (SnapPredicateFailure era) x → SnapPredicateFailure era #

Generic (UpecPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Upec

Associated Types

type Rep (UpecPredicateFailure era) ∷ TypeType #

Methods

from ∷ UpecPredicateFailure era → Rep (UpecPredicateFailure era) x #

toRep (UpecPredicateFailure era) x → UpecPredicateFailure era #

Generic (LedgersPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ledgers

Associated Types

type Rep (LedgersPredicateFailure era) ∷ TypeType #

Methods

from ∷ LedgersPredicateFailure era → Rep (LedgersPredicateFailure era) x #

toRep (LedgersPredicateFailure era) x → LedgersPredicateFailure era #

Generic (MirPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Mir

Associated Types

type Rep (MirPredicateFailure era) ∷ TypeType #

Methods

from ∷ MirPredicateFailure era → Rep (MirPredicateFailure era) x #

toRep (MirPredicateFailure era) x → MirPredicateFailure era #

Generic (NewEpochPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.NewEpoch

Associated Types

type Rep (NewEpochPredicateFailure era) ∷ TypeType #

Methods

from ∷ NewEpochPredicateFailure era → Rep (NewEpochPredicateFailure era) x #

toRep (NewEpochPredicateFailure era) x → NewEpochPredicateFailure era #

Generic (NewppPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Newpp

Associated Types

type Rep (NewppPredicateFailure era) ∷ TypeType #

Methods

from ∷ NewppPredicateFailure era → Rep (NewppPredicateFailure era) x #

toRep (NewppPredicateFailure era) x → NewppPredicateFailure era #

Generic (RupdPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Rupd

Associated Types

type Rep (RupdPredicateFailure era) ∷ TypeType #

Methods

from ∷ RupdPredicateFailure era → Rep (RupdPredicateFailure era) x #

toRep (RupdPredicateFailure era) x → RupdPredicateFailure era #

Generic (TickEvent era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (TickEvent era) ∷ TypeType #

Methods

from ∷ TickEvent era → Rep (TickEvent era) x #

toRep (TickEvent era) x → TickEvent era #

Generic (TickPredicateFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (TickPredicateFailure era) ∷ TypeType #

Methods

from ∷ TickPredicateFailure era → Rep (TickPredicateFailure era) x #

toRep (TickPredicateFailure era) x → TickPredicateFailure era #

Generic (DelegCert crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (DelegCert crypto) ∷ TypeType #

Methods

from ∷ DelegCert crypto → Rep (DelegCert crypto) x #

toRep (DelegCert crypto) x → DelegCert crypto #

Generic (Delegation crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (Delegation crypto) ∷ TypeType #

Methods

from ∷ Delegation crypto → Rep (Delegation crypto) x #

toRep (Delegation crypto) x → Delegation crypto #

Generic (GenesisDelegCert crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (GenesisDelegCert crypto) ∷ TypeType #

Methods

from ∷ GenesisDelegCert crypto → Rep (GenesisDelegCert crypto) x #

toRep (GenesisDelegCert crypto) x → GenesisDelegCert crypto #

Generic (MIRCert crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (MIRCert crypto) ∷ TypeType #

Methods

from ∷ MIRCert crypto → Rep (MIRCert crypto) x #

toRep (MIRCert crypto) x → MIRCert crypto #

Generic (MIRTarget crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (MIRTarget crypto) ∷ TypeType #

Methods

from ∷ MIRTarget crypto → Rep (MIRTarget crypto) x #

toRep (MIRTarget crypto) x → MIRTarget crypto #

Generic (PoolCert crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (PoolCert crypto) ∷ TypeType #

Methods

from ∷ PoolCert crypto → Rep (PoolCert crypto) x #

toRep (PoolCert crypto) x → PoolCert crypto #

Generic (StakeCreds crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (StakeCreds crypto) ∷ TypeType #

Methods

from ∷ StakeCreds crypto → Rep (StakeCreds crypto) x #

toRep (StakeCreds crypto) x → StakeCreds crypto #

Generic (HashHeader crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (HashHeader crypto) ∷ TypeType #

Methods

from ∷ HashHeader crypto → Rep (HashHeader crypto) x #

toRep (HashHeader crypto) x → HashHeader crypto #

Generic (LastAppliedBlock crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (LastAppliedBlock crypto) ∷ TypeType #

Methods

from ∷ LastAppliedBlock crypto → Rep (LastAppliedBlock crypto) x #

toRep (LastAppliedBlock crypto) x → LastAppliedBlock crypto #

Generic (OcertPredicateFailure crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.OCert

Associated Types

type Rep (OcertPredicateFailure crypto) ∷ TypeType #

Methods

from ∷ OcertPredicateFailure crypto → Rep (OcertPredicateFailure crypto) x #

toRep (OcertPredicateFailure crypto) x → OcertPredicateFailure crypto #

Generic (OBftSlot crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OBftSlot crypto) ∷ TypeType #

Methods

from ∷ OBftSlot crypto → Rep (OBftSlot crypto) x #

toRep (OBftSlot crypto) x → OBftSlot crypto #

Generic (OverlayEnv crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OverlayEnv crypto) ∷ TypeType #

Methods

from ∷ OverlayEnv crypto → Rep (OverlayEnv crypto) x #

toRep (OverlayEnv crypto) x → OverlayEnv crypto #

Generic (OverlayPredicateFailure crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OverlayPredicateFailure crypto) ∷ TypeType #

Methods

from ∷ OverlayPredicateFailure crypto → Rep (OverlayPredicateFailure crypto) x #

toRep (OverlayPredicateFailure crypto) x → OverlayPredicateFailure crypto #

Generic (PrtclEnv crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclEnv crypto) ∷ TypeType #

Methods

from ∷ PrtclEnv crypto → Rep (PrtclEnv crypto) x #

toRep (PrtclEnv crypto) x → PrtclEnv crypto #

Generic (PrtlSeqFailure crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtlSeqFailure crypto) ∷ TypeType #

Methods

from ∷ PrtlSeqFailure crypto → Rep (PrtlSeqFailure crypto) x #

toRep (PrtlSeqFailure crypto) x → PrtlSeqFailure crypto #

Generic (UpdnPredicateFailure crypto) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Updn

Associated Types

type Rep (UpdnPredicateFailure crypto) ∷ TypeType #

Methods

from ∷ UpdnPredicateFailure crypto → Rep (UpdnPredicateFailure crypto) x #

toRep (UpdnPredicateFailure crypto) x → UpdnPredicateFailure crypto #

Generic (Digit a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (Digit a) ∷ TypeType #

Methods

from ∷ Digit a → Rep (Digit a) x #

toRep (Digit a) x → Digit a #

Generic (PostAligned a) 
Instance details

Defined in Flat.Filler

Associated Types

type Rep (PostAligned a) ∷ TypeType #

Methods

from ∷ PostAligned a → Rep (PostAligned a) x #

toRep (PostAligned a) x → PostAligned a #

Generic (PreAligned a) 
Instance details

Defined in Flat.Filler

Associated Types

type Rep (PreAligned a) ∷ TypeType #

Methods

from ∷ PreAligned a → Rep (PreAligned a) x #

toRep (PreAligned a) x → PreAligned a #

Generic (Root a) 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep (Root a) ∷ TypeType #

Methods

from ∷ Root a → Rep (Root a) x #

toRep (Root a) x → Root a #

Generic (RealPoint blk) 
Instance details

Defined in Ouroboros.Consensus.Block.RealPoint

Associated Types

type Rep (RealPoint blk) ∷ TypeType #

Methods

from ∷ RealPoint blk → Rep (RealPoint blk) x #

toRep (RealPoint blk) x → RealPoint blk #

Generic (HeaderStateHistory blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderStateHistory

Associated Types

type Rep (HeaderStateHistory blk) ∷ TypeType #

Methods

from ∷ HeaderStateHistory blk → Rep (HeaderStateHistory blk) x #

toRep (HeaderStateHistory blk) x → HeaderStateHistory blk #

Generic (HeaderError blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderError blk) ∷ TypeType #

Methods

from ∷ HeaderError blk → Rep (HeaderError blk) x #

toRep (HeaderError blk) x → HeaderError blk #

Generic (HeaderEnvelopeError blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderEnvelopeError blk) ∷ TypeType #

Methods

from ∷ HeaderEnvelopeError blk → Rep (HeaderEnvelopeError blk) x #

toRep (HeaderEnvelopeError blk) x → HeaderEnvelopeError blk #

Generic (ExtValidationError blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtValidationError blk) ∷ TypeType #

Methods

from ∷ ExtValidationError blk → Rep (ExtValidationError blk) x #

toRep (ExtValidationError blk) x → ExtValidationError blk #

Generic (InternalState blk) 
Instance details

Defined in Ouroboros.Consensus.Mempool.Impl.Types

Associated Types

type Rep (InternalState blk) ∷ TypeType #

Methods

from ∷ InternalState blk → Rep (InternalState blk) x #

toRep (InternalState blk) x → InternalState blk #

Generic (TxTicket tx) 
Instance details

Defined in Ouroboros.Consensus.Mempool.TxSeq

Associated Types

type Rep (TxTicket tx) ∷ TypeType #

Methods

from ∷ TxTicket tx → Rep (TxTicket tx) x #

toRep (TxTicket tx) x → TxTicket tx #

Generic (InvalidBlockReason blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Associated Types

type Rep (InvalidBlockReason blk) ∷ TypeType #

Methods

from ∷ InvalidBlockReason blk → Rep (InvalidBlockReason blk) x #

toRep (InvalidBlockReason blk) x → InvalidBlockReason blk #

Generic (KnownIntersectionState blk) 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Associated Types

type Rep (KnownIntersectionState blk) ∷ TypeType #

Methods

from ∷ KnownIntersectionState blk → Rep (KnownIntersectionState blk) x #

toRep (KnownIntersectionState blk) x → KnownIntersectionState blk #

Generic (UnknownIntersectionState blk) 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Associated Types

type Rep (UnknownIntersectionState blk) ∷ TypeType #

Methods

from ∷ UnknownIntersectionState blk → Rep (UnknownIntersectionState blk) x #

toRep (UnknownIntersectionState blk) x → UnknownIntersectionState blk #

Generic (Anchor block) 
Instance details

Defined in Ouroboros.Network.AnchoredFragment

Associated Types

type Rep (Anchor block) ∷ TypeType #

Methods

from ∷ Anchor block → Rep (Anchor block) x #

toRep (Anchor block) x → Anchor block #

Generic (WithFingerprint a) 
Instance details

Defined in Ouroboros.Consensus.Util.STM

Associated Types

type Rep (WithFingerprint a) ∷ TypeType #

Methods

from ∷ WithFingerprint a → Rep (WithFingerprint a) x #

toRep (WithFingerprint a) x → WithFingerprint a #

Generic (LedgerDB l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.InMemory

Associated Types

type Rep (LedgerDB l) ∷ TypeType #

Methods

from ∷ LedgerDB l → Rep (LedgerDB l) x #

toRep (LedgerDB l) x → LedgerDB l #

Generic (PBftCanBeLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftCanBeLeader c) ∷ TypeType #

Methods

from ∷ PBftCanBeLeader c → Rep (PBftCanBeLeader c) x #

toRep (PBftCanBeLeader c) x → PBftCanBeLeader c #

Generic (StreamFrom blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep (StreamFrom blk) ∷ TypeType #

Methods

from ∷ StreamFrom blk → Rep (StreamFrom blk) x #

toRep (StreamFrom blk) x → StreamFrom blk #

Generic (StreamTo blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep (StreamTo blk) ∷ TypeType #

Methods

from ∷ StreamTo blk → Rep (StreamTo blk) x #

toRep (StreamTo blk) x → StreamTo blk #

Generic (ResourceRegistry m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (ResourceRegistry m) ∷ TypeType #

Methods

from ∷ ResourceRegistry m → Rep (ResourceRegistry m) x #

toRep (ResourceRegistry m) x → ResourceRegistry m #

Generic (Checkpoint l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.InMemory

Associated Types

type Rep (Checkpoint l) ∷ TypeType #

Methods

from ∷ Checkpoint l → Rep (Checkpoint l) x #

toRep (Checkpoint l) x → Checkpoint l #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType #

Methods

from ∷ TraceEvent blk → Rep (TraceEvent blk) x #

toRep (TraceEvent blk) x → TraceEvent blk #

Generic (InvalidBlockInfo blk) 
Instance details

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

Associated Types

type Rep (InvalidBlockInfo blk) ∷ TypeType #

Methods

from ∷ InvalidBlockInfo blk → Rep (InvalidBlockInfo blk) x #

toRep (InvalidBlockInfo blk) x → InvalidBlockInfo blk #

Generic (TraceAddBlockEvent blk) 
Instance details

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

Associated Types

type Rep (TraceAddBlockEvent blk) ∷ TypeType #

Methods

from ∷ TraceAddBlockEvent blk → Rep (TraceAddBlockEvent blk) x #

toRep (TraceAddBlockEvent blk) x → TraceAddBlockEvent blk #

Generic (TraceGCEvent blk) 
Instance details

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

Associated Types

type Rep (TraceGCEvent blk) ∷ TypeType #

Methods

from ∷ TraceGCEvent blk → Rep (TraceGCEvent blk) x #

toRep (TraceGCEvent blk) x → TraceGCEvent blk #

Generic (InImmutableDBEnd blk) 
Instance details

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

Associated Types

type Rep (InImmutableDBEnd blk) ∷ TypeType #

Methods

from ∷ InImmutableDBEnd blk → Rep (InImmutableDBEnd blk) x #

toRep (InImmutableDBEnd blk) x → InImmutableDBEnd blk #

Generic (TraceIteratorEvent blk) 
Instance details

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

Associated Types

type Rep (TraceIteratorEvent blk) ∷ TypeType #

Methods

from ∷ TraceIteratorEvent blk → Rep (TraceIteratorEvent blk) x #

toRep (TraceIteratorEvent blk) x → TraceIteratorEvent blk #

Generic (TraceEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.OnDisk

Associated Types

type Rep (TraceEvent blk) ∷ TypeType #

Methods

from ∷ TraceEvent blk → Rep (TraceEvent blk) x #

toRep (TraceEvent blk) x → TraceEvent blk #

Generic (TraceReplayEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.OnDisk

Associated Types

type Rep (TraceReplayEvent blk) ∷ TypeType #

Methods

from ∷ TraceReplayEvent blk → Rep (TraceReplayEvent blk) x #

toRep (TraceReplayEvent blk) x → TraceReplayEvent blk #

Generic (UpdateLedgerDbTraceEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Types

Associated Types

type Rep (UpdateLedgerDbTraceEvent blk) ∷ TypeType #

Methods

from ∷ UpdateLedgerDbTraceEvent blk → Rep (UpdateLedgerDbTraceEvent blk) x #

toRep (UpdateLedgerDbTraceEvent blk) x → UpdateLedgerDbTraceEvent blk #

Generic (InitFailure blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.OnDisk

Associated Types

type Rep (InitFailure blk) ∷ TypeType #

Methods

from ∷ InitFailure blk → Rep (InitFailure blk) x #

toRep (InitFailure blk) x → InitFailure blk #

Generic (InitLog blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.OnDisk

Associated Types

type Rep (InitLog blk) ∷ TypeType #

Methods

from ∷ InitLog blk → Rep (InitLog blk) x #

toRep (InitLog blk) x → InitLog blk #

Generic (LedgerDbCfg l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.InMemory

Associated Types

type Rep (LedgerDbCfg l) ∷ TypeType #

Methods

from ∷ LedgerDbCfg l → Rep (LedgerDbCfg l) x #

toRep (LedgerDbCfg l) x → LedgerDbCfg l #

Generic (FollowerRollState blk) 
Instance details

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

Associated Types

type Rep (FollowerRollState blk) ∷ TypeType #

Methods

from ∷ FollowerRollState blk → Rep (FollowerRollState blk) x #

toRep (FollowerRollState blk) x → FollowerRollState blk #

Generic (NewTipInfo blk) 
Instance details

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

Associated Types

type Rep (NewTipInfo blk) ∷ TypeType #

Methods

from ∷ NewTipInfo blk → Rep (NewTipInfo blk) x #

toRep (NewTipInfo blk) x → NewTipInfo blk #

Generic (TraceCopyToImmutableDBEvent blk) 
Instance details

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

Associated Types

type Rep (TraceCopyToImmutableDBEvent blk) ∷ TypeType #

Methods

from ∷ TraceCopyToImmutableDBEvent blk → Rep (TraceCopyToImmutableDBEvent blk) x #

toRep (TraceCopyToImmutableDBEvent blk) x → TraceCopyToImmutableDBEvent blk #

Generic (TraceFollowerEvent blk) 
Instance details

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

Associated Types

type Rep (TraceFollowerEvent blk) ∷ TypeType #

Methods

from ∷ TraceFollowerEvent blk → Rep (TraceFollowerEvent blk) x #

toRep (TraceFollowerEvent blk) x → TraceFollowerEvent blk #

Generic (TraceInitChainSelEvent blk) 
Instance details

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

Associated Types

type Rep (TraceInitChainSelEvent blk) ∷ TypeType #

Methods

from ∷ TraceInitChainSelEvent blk → Rep (TraceInitChainSelEvent blk) x #

toRep (TraceInitChainSelEvent blk) x → TraceInitChainSelEvent blk #

Generic (TraceOpenEvent blk) 
Instance details

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

Associated Types

type Rep (TraceOpenEvent blk) ∷ TypeType #

Methods

from ∷ TraceOpenEvent blk → Rep (TraceOpenEvent blk) x #

toRep (TraceOpenEvent blk) x → TraceOpenEvent blk #

Generic (TraceValidationEvent blk) 
Instance details

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

Associated Types

type Rep (TraceValidationEvent blk) ∷ TypeType #

Methods

from ∷ TraceValidationEvent blk → Rep (TraceValidationEvent blk) x #

toRep (TraceValidationEvent blk) x → TraceValidationEvent blk #

Generic (TentativeState blk) 
Instance details

Defined in Ouroboros.Consensus.Util.TentativeState

Associated Types

type Rep (TentativeState blk) ∷ TypeType #

Methods

from ∷ TentativeState blk → Rep (TentativeState blk) x #

toRep (TentativeState blk) x → TentativeState blk #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType #

Methods

from ∷ TraceEvent blk → Rep (TraceEvent blk) x #

toRep (TraceEvent blk) x → TraceEvent blk #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType #

Methods

from ∷ TraceEvent blk → Rep (TraceEvent blk) x #

toRep (TraceEvent blk) x → TraceEvent blk #

Generic (ImmutableDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (ImmutableDBError blk) ∷ TypeType #

Methods

from ∷ ImmutableDBError blk → Rep (ImmutableDBError blk) x #

toRep (ImmutableDBError blk) x → ImmutableDBError blk #

Generic (IteratorResult b) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (IteratorResult b) ∷ TypeType #

Methods

from ∷ IteratorResult b → Rep (IteratorResult b) x #

toRep (IteratorResult b) x → IteratorResult b #

Generic (MissingBlock blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (MissingBlock blk) ∷ TypeType #

Methods

from ∷ MissingBlock blk → Rep (MissingBlock blk) x #

toRep (MissingBlock blk) x → MissingBlock blk #

Generic (Tip blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (Tip blk) ∷ TypeType #

Methods

from ∷ Tip blk → Rep (Tip blk) x #

toRep (Tip blk) x → Tip blk #

Generic (Cached blk) 
Instance details

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

Associated Types

type Rep (Cached blk) ∷ TypeType #

Methods

from ∷ Cached blk → Rep (Cached blk) x #

toRep (Cached blk) x → Cached blk #

Generic (CurrentChunkInfo blk) 
Instance details

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

Associated Types

type Rep (CurrentChunkInfo blk) ∷ TypeType #

Methods

from ∷ CurrentChunkInfo blk → Rep (CurrentChunkInfo blk) x #

toRep (CurrentChunkInfo blk) x → CurrentChunkInfo blk #

Generic (PastChunkInfo blk) 
Instance details

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

Associated Types

type Rep (PastChunkInfo blk) ∷ TypeType #

Methods

from ∷ PastChunkInfo blk → Rep (PastChunkInfo blk) x #

toRep (PastChunkInfo blk) x → PastChunkInfo blk #

Generic (Entry blk) 
Instance details

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

Associated Types

type Rep (Entry blk) ∷ TypeType #

Methods

from ∷ Entry blk → Rep (Entry blk) x #

toRep (Entry blk) x → Entry blk #

Generic (WithBlockSize a) 
Instance details

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

Associated Types

type Rep (WithBlockSize a) ∷ TypeType #

Methods

from ∷ WithBlockSize a → Rep (WithBlockSize a) x #

toRep (WithBlockSize a) x → WithBlockSize a #

Generic (ResourceKey m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (ResourceKey m) ∷ TypeType #

Methods

from ∷ ResourceKey m → Rep (ResourceKey m) x #

toRep (ResourceKey m) x → ResourceKey m #

Generic (BlockInfo blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.API

Associated Types

type Rep (BlockInfo blk) ∷ TypeType #

Methods

from ∷ BlockInfo blk → Rep (BlockInfo blk) x #

toRep (BlockInfo blk) x → BlockInfo blk #

Generic (FileInfo blk) 
Instance details

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

Associated Types

type Rep (FileInfo blk) ∷ TypeType #

Methods

from ∷ FileInfo blk → Rep (FileInfo blk) x #

toRep (FileInfo blk) x → FileInfo blk #

Generic (Index blk) 
Instance details

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

Associated Types

type Rep (Index blk) ∷ TypeType #

Methods

from ∷ Index blk → Rep (Index blk) x #

toRep (Index blk) x → Index blk #

Generic (InternalBlockInfo blk) 
Instance details

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

Associated Types

type Rep (InternalBlockInfo blk) ∷ TypeType #

Methods

from ∷ InternalBlockInfo blk → Rep (InternalBlockInfo blk) x #

toRep (InternalBlockInfo blk) x → InternalBlockInfo blk #

Generic (RAWState st) 
Instance details

Defined in Ouroboros.Consensus.Util.MonadSTM.RAWLock

Associated Types

type Rep (RAWState st) ∷ TypeType #

Methods

from ∷ RAWState st → Rep (RAWState st) x #

toRep (RAWState st) x → RAWState st #

Generic (RegistryState m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (RegistryState m) ∷ TypeType #

Methods

from ∷ RegistryState m → Rep (RegistryState m) x #

toRep (RegistryState m) x → RegistryState m #

Generic (Resource m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (Resource m) ∷ TypeType #

Methods

from ∷ Resource m → Rep (Resource m) x #

toRep (Resource m) x → Resource m #

Generic (KESKey c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep (KESKey c) ∷ TypeType #

Methods

from ∷ KESKey c → Rep (KESKey c) x #

toRep (KESKey c) x → KESKey c #

Generic (KESState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep (KESState c) ∷ TypeType #

Methods

from ∷ KESState c → Rep (KESState c) x #

toRep (KESState c) x → KESState c #

Generic (TestAddress addr) 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep (TestAddress addr) ∷ TypeType #

Methods

from ∷ TestAddress addr → Rep (TestAddress addr) x #

toRep (TestAddress addr) x → TestAddress addr #

Generic (EvaluationResult a) 
Instance details

Defined in PlutusCore.Evaluation.Result

Associated Types

type Rep (EvaluationResult a) ∷ TypeType #

Methods

from ∷ EvaluationResult a → Rep (EvaluationResult a) x #

toRep (EvaluationResult a) x → EvaluationResult a #

Generic (BuiltinCostModelBase f) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep (BuiltinCostModelBase f) ∷ TypeType #

Methods

from ∷ BuiltinCostModelBase f → Rep (BuiltinCostModelBase f) x #

toRep (BuiltinCostModelBase f) x → BuiltinCostModelBase f #

Generic (CostingFun model) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep (CostingFun model) ∷ TypeType #

Methods

from ∷ CostingFun model → Rep (CostingFun model) x #

toRep (CostingFun model) x → CostingFun model #

Generic (LR a) 
Instance details

Defined in PlutusCore.Eq

Associated Types

type Rep (LR a) ∷ TypeType #

Methods

from ∷ LR a → Rep (LR a) x #

toRep (LR a) x → LR a #

Generic (RL a) 
Instance details

Defined in PlutusCore.Eq

Associated Types

type Rep (RL a) ∷ TypeType #

Methods

from ∷ RL a → Rep (RL a) x #

toRep (RL a) x → RL a #

Generic (MachineError fun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (MachineError fun) ∷ TypeType #

Methods

from ∷ MachineError fun → Rep (MachineError fun) x #

toRep (MachineError fun) x → MachineError fun #

Generic (CekExTally fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep (CekExTally fun) ∷ TypeType #

Methods

from ∷ CekExTally fun → Rep (CekExTally fun) x #

toRep (CekExTally fun) x → CekExTally fun #

Generic (TallyingSt fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep (TallyingSt fun) ∷ TypeType #

Methods

from ∷ TallyingSt fun → Rep (TallyingSt fun) x #

toRep (TallyingSt fun) x → TallyingSt fun #

Generic (ExBudgetCategory fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep (ExBudgetCategory fun) ∷ TypeType #

Methods

from ∷ ExBudgetCategory fun → Rep (ExBudgetCategory fun) x #

toRep (ExBudgetCategory fun) x → ExBudgetCategory fun #

Generic (Extended a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Associated Types

type Rep (Extended a) ∷ TypeType #

Methods

from ∷ Extended a → Rep (Extended a) x #

toRep (Extended a) x → Extended a #

Generic (LowerBound a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Associated Types

type Rep (LowerBound a) ∷ TypeType #

Methods

from ∷ LowerBound a → Rep (LowerBound a) x #

toRep (LowerBound a) x → LowerBound a #

Generic (UpperBound a) 
Instance details

Defined in Plutus.V1.Ledger.Interval

Associated Types

type Rep (UpperBound a) ∷ TypeType #

Methods

from ∷ UpperBound a → Rep (UpperBound a) x #

toRep (UpperBound a) x → UpperBound a #

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) ∷ TypeType #

Methods

from ∷ SimpleDocStream ann → Rep (SimpleDocStream ann) x #

toRep (SimpleDocStream ann) x → SimpleDocStream ann #

Generic (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

Associated Types

type Rep (LinearTransform d) ∷ TypeType #

Methods

from ∷ LinearTransform d → Rep (LinearTransform d) x #

toRep (LinearTransform d) x → LinearTransform d #

Generic (Window a) 
Instance details

Defined in System.Console.Terminal.Common

Associated Types

type Rep (Window a) ∷ TypeType #

Methods

from ∷ Window a → Rep (Window a) x #

toRep (Window a) x → Window a #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep (Doc a) ∷ TypeType #

Methods

from ∷ Doc a → Rep (Doc a) x #

toRep (Doc a) x → Doc a #

Generic (SimpleDoc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep (SimpleDoc a) ∷ TypeType #

Methods

from ∷ SimpleDoc a → Rep (SimpleDoc a) x #

toRep (SimpleDoc a) x → SimpleDoc a #

Generic (Item a) 
Instance details

Defined in Katip.Core

Associated Types

type Rep (Item a) ∷ TypeType #

Methods

from ∷ Item a → Rep (Item a) x #

toRep (Item a) x → Item a #

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) ∷ TypeType #

Methods

from ∷ AddrRange a → Rep (AddrRange a) x #

toRep (AddrRange a) x → AddrRange a #

Generic (ParamSchema t) 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep (ParamSchema t) ∷ TypeType #

Methods

from ∷ ParamSchema t → Rep (ParamSchema t) x #

toRep (ParamSchema t) x → ParamSchema t #

Generic (RunSelectionParams u) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (RunSelectionParams u) ∷ TypeType #

Methods

from ∷ RunSelectionParams u → Rep (RunSelectionParams u) x #

toRep (RunSelectionParams u) x → RunSelectionParams u #

Generic (SelectionBalanceError ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionBalanceError ctx) ∷ TypeType #

Methods

from ∷ SelectionBalanceError ctx → Rep (SelectionBalanceError ctx) x #

toRep (SelectionBalanceError ctx) x → SelectionBalanceError ctx #

Generic (SelectionConstraints ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionConstraints ctx) ∷ TypeType #

Methods

from ∷ SelectionConstraints ctx → Rep (SelectionConstraints ctx) x #

toRep (SelectionConstraints ctx) x → SelectionConstraints ctx #

Generic (SelectionLimitReachedError ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionLimitReachedError ctx) ∷ TypeType #

Methods

from ∷ SelectionLimitReachedError ctx → Rep (SelectionLimitReachedError ctx) x #

toRep (SelectionLimitReachedError ctx) x → SelectionLimitReachedError ctx #

Generic (SelectionSkeleton ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionSkeleton ctx) ∷ TypeType #

Methods

from ∷ SelectionSkeleton ctx → Rep (SelectionSkeleton ctx) x #

toRep (SelectionSkeleton ctx) x → SelectionSkeleton ctx #

Generic (UTxOSelection u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (UTxOSelection u) ∷ TypeType #

Methods

from ∷ UTxOSelection u → Rep (UTxOSelection u) x #

toRep (UTxOSelection u) x → UTxOSelection u #

Generic (UTxOSelectionNonEmpty u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (UTxOSelectionNonEmpty u) ∷ TypeType #

Methods

from ∷ UTxOSelectionNonEmpty u → Rep (UTxOSelectionNonEmpty u) x #

toRep (UTxOSelectionNonEmpty u) x → UTxOSelectionNonEmpty u #

Generic (SelectionOf change) 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep (SelectionOf change) ∷ TypeType #

Methods

from ∷ SelectionOf change → Rep (SelectionOf change) x #

toRep (SelectionOf change) x → SelectionOf change #

Generic (SelectionCollateralError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionCollateralError ctx) ∷ TypeType #

Methods

from ∷ SelectionCollateralError ctx → Rep (SelectionCollateralError ctx) x #

toRep (SelectionCollateralError ctx) x → SelectionCollateralError ctx #

Generic (SelectionOutputCoinInsufficientError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputCoinInsufficientError ctx) ∷ TypeType #

Methods

from ∷ SelectionOutputCoinInsufficientError ctx → Rep (SelectionOutputCoinInsufficientError ctx) x #

toRep (SelectionOutputCoinInsufficientError ctx) x → SelectionOutputCoinInsufficientError ctx #

Generic (SelectionOutputErrorInfo ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputErrorInfo ctx) ∷ TypeType #

Methods

from ∷ SelectionOutputErrorInfo ctx → Rep (SelectionOutputErrorInfo ctx) x #

toRep (SelectionOutputErrorInfo ctx) x → SelectionOutputErrorInfo ctx #

Generic (SelectionOutputSizeExceedsLimitError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputSizeExceedsLimitError ctx) ∷ TypeType #

Methods

from ∷ SelectionOutputSizeExceedsLimitError ctx → Rep (SelectionOutputSizeExceedsLimitError ctx) x #

toRep (SelectionOutputSizeExceedsLimitError ctx) x → SelectionOutputSizeExceedsLimitError ctx #

Generic (SelectionOutputTokenQuantityExceedsLimitError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputTokenQuantityExceedsLimitError ctx) ∷ TypeType #

Methods

from ∷ SelectionOutputTokenQuantityExceedsLimitError ctx → Rep (SelectionOutputTokenQuantityExceedsLimitError ctx) x #

toRep (SelectionOutputTokenQuantityExceedsLimitError ctx) x → SelectionOutputTokenQuantityExceedsLimitError ctx #

Generic (Flat a) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep (Flat a) ∷ TypeType #

Methods

from ∷ Flat a → Rep (Flat a) x #

toRep (Flat a) x → Flat a #

Generic (Selection ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (Selection ctx) ∷ TypeType #

Methods

from ∷ Selection ctx → Rep (Selection ctx) x #

toRep (Selection ctx) x → Selection ctx #

Generic (Hash tag) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Hash

Associated Types

type Rep (Hash tag) ∷ TypeType #

Methods

from ∷ Hash tag → Rep (Hash tag) x #

toRep (Hash tag) x → Hash tag #

Generic (Nested a) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep (Nested a) ∷ TypeType #

Methods

from ∷ Nested a → Rep (Nested a) x #

toRep (Nested a) x → Nested a #

Generic (UTxOIndex u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOIndex.Internal

Associated Types

type Rep (UTxOIndex u) ∷ TypeType #

Methods

from ∷ UTxOIndex u → Rep (UTxOIndex u) x #

toRep (UTxOIndex u) x → UTxOIndex u #

Generic (State u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (State u) ∷ TypeType #

Methods

from ∷ State u → Rep (State u) x #

toRep (State u) x → State u #

Generic (NonEmptySet a) 
Instance details

Defined in Data.Set.Strict.NonEmptySet

Associated Types

type Rep (NonEmptySet a) ∷ TypeType #

Methods

from ∷ NonEmptySet a → Rep (NonEmptySet a) x #

toRep (NonEmptySet a) x → NonEmptySet a #

Generic (SelectionConstraints ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionConstraints ctx) ∷ TypeType #

Methods

from ∷ SelectionConstraints ctx → Rep (SelectionConstraints ctx) x #

toRep (SelectionConstraints ctx) x → SelectionConstraints ctx #

Generic (SelectionParams ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionParams ctx) ∷ TypeType #

Methods

from ∷ SelectionParams ctx → Rep (SelectionParams ctx) x #

toRep (SelectionParams ctx) x → SelectionParams ctx #

Generic (SelectionParams u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionParams u) ∷ TypeType #

Methods

from ∷ SelectionParams u → Rep (SelectionParams u) x #

toRep (SelectionParams u) x → SelectionParams u #

Generic (SelectionCollateralError u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionCollateralError u) ∷ TypeType #

Methods

from ∷ SelectionCollateralError u → Rep (SelectionCollateralError u) x #

toRep (SelectionCollateralError u) x → SelectionCollateralError u #

Generic (SelectionResult u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionResult u) ∷ TypeType #

Methods

from ∷ SelectionResult u → Rep (SelectionResult u) x #

toRep (SelectionResult u) x → SelectionResult u #

Generic (ShowFmt a) 
Instance details

Defined in Cardano.Wallet.Util

Associated Types

type Rep (ShowFmt a) ∷ TypeType #

Methods

from ∷ ShowFmt a → Rep (ShowFmt a) x #

toRep (ShowFmt a) x → ShowFmt a #

Generic (NonRandom a) 
Instance details

Defined in Control.Monad.Random.NonRandom

Associated Types

type Rep (NonRandom a) ∷ TypeType #

Methods

from ∷ NonRandom a → Rep (NonRandom a) x #

toRep (NonRandom a) x → NonRandom a #

Generic (Versioned a) 
Instance details

Defined in Plutus.Model.Fork.Ledger.Scripts

Associated Types

type Rep (Versioned a) ∷ TypeType #

Methods

from ∷ Versioned a → Rep (Versioned a) x #

toRep (Versioned a) x → Versioned a #

Generic (Either a b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) ∷ TypeType #

Methods

fromEither a b → Rep (Either a b) x #

toRep (Either a b) x → Either a b #

Generic (V1 p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) ∷ TypeType #

Methods

fromV1 p → Rep (V1 p) x #

toRep (V1 p) x → V1 p #

Generic (U1 p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) ∷ TypeType #

Methods

fromU1 p → Rep (U1 p) x #

toRep (U1 p) x → U1 p #

Generic (a, b)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) ∷ TypeType #

Methods

from ∷ (a, b) → Rep (a, b) x #

toRep (a, b) x → (a, b) #

Generic (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) ∷ TypeType #

Methods

fromArg a b → Rep (Arg a b) x #

toRep (Arg a b) x → Arg a b #

Generic (WrappedMonad m a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) ∷ TypeType #

Methods

fromWrappedMonad m a → Rep (WrappedMonad m a) x #

toRep (WrappedMonad m a) x → WrappedMonad m a #

Generic (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) ∷ TypeType #

Methods

fromProxy t → Rep (Proxy t) x #

toRep (Proxy t) x → Proxy t #

Generic (Current f blk) 
Instance details

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

Associated Types

type Rep (Current f blk) ∷ TypeType #

Methods

from ∷ Current f blk → Rep (Current f blk) x #

toRep (Current f blk) x → Current f blk #

Generic (ShelleyTip proto era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyTip proto era) ∷ TypeType #

Methods

from ∷ ShelleyTip proto era → Rep (ShelleyTip proto era) x #

toRep (ShelleyTip proto era) x → ShelleyTip proto era #

Generic (KeyHash discriminator crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (KeyHash discriminator crypto) ∷ TypeType #

Methods

from ∷ KeyHash discriminator crypto → Rep (KeyHash discriminator crypto) x #

toRep (KeyHash discriminator crypto) x → KeyHash discriminator crypto #

Generic (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Associated Types

type Rep (Hash h a) ∷ TypeType #

Methods

from ∷ Hash h a → Rep (Hash h a) x #

toRep (Hash h a) x → Hash h a #

Generic (Block slot hash) 
Instance details

Defined in Ouroboros.Network.Point

Associated Types

type Rep (Block slot hash) ∷ TypeType #

Methods

from ∷ Block slot hash → Rep (Block slot hash) x #

toRep (Block slot hash) x → Block slot hash #

Generic (Annotated b a) 
Instance details

Defined in Cardano.Binary.Annotated

Associated Types

type Rep (Annotated b a) ∷ TypeType #

Methods

from ∷ Annotated b a → Rep (Annotated b a) x #

toRep (Annotated b a) x → Annotated b a #

Generic (Bimap a b) 
Instance details

Defined in Data.Bimap

Associated Types

type Rep (Bimap a b) ∷ TypeType #

Methods

from ∷ Bimap a b → Rep (Bimap a b) x #

toRep (Bimap a b) x → Bimap a b #

Generic (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

Associated Types

type Rep (AbstractHash algo a) ∷ TypeType #

Methods

from ∷ AbstractHash algo a → Rep (AbstractHash algo a) x #

toRep (AbstractHash algo a) x → AbstractHash algo a #

Generic (SignedKES v a) 
Instance details

Defined in Cardano.Crypto.KES.Class

Associated Types

type Rep (SignedKES v a) ∷ TypeType #

Methods

from ∷ SignedKES v a → Rep (SignedKES v a) x #

toRep (SignedKES v a) x → SignedKES v a #

Generic (PraosFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosFields c toSign) ∷ TypeType #

Methods

from ∷ PraosFields c toSign → Rep (PraosFields c toSign) x #

toRep (PraosFields c toSign) x → PraosFields c toSign #

Generic (VKey kd crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (VKey kd crypto) ∷ TypeType #

Methods

from ∷ VKey kd crypto → Rep (VKey kd crypto) x #

toRep (VKey kd crypto) x → VKey kd crypto #

Generic (TPraosFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosFields c toSign) ∷ TypeType #

Methods

from ∷ TPraosFields c toSign → Rep (TPraosFields c toSign) x #

toRep (TPraosFields c toSign) x → TPraosFields c toSign #

Generic (Credential kr crypto) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (Credential kr crypto) ∷ TypeType #

Methods

from ∷ Credential kr crypto → Rep (Credential kr crypto) x #

toRep (Credential kr crypto) x → Credential kr crypto #

Generic (PParams' f era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Associated Types

type Rep (PParams' f era) ∷ TypeType #

Methods

from ∷ PParams' f era → Rep (PParams' f era) x #

toRep (PParams' f era) x → PParams' f era #

Generic (PParams' f era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (PParams' f era) ∷ TypeType #

Methods

from ∷ PParams' f era → Rep (PParams' f era) x #

toRep (PParams' f era) x → PParams' f era #

Generic (PParams' f era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep (PParams' f era) ∷ TypeType #

Methods

from ∷ PParams' f era → Rep (PParams' f era) x #

toRep (PParams' f era) x → PParams' f era #

Generic (Block h era) 
Instance details

Defined in Cardano.Ledger.Block

Associated Types

type Rep (Block h era) ∷ TypeType #

Methods

from ∷ Block h era → Rep (Block h era) x #

toRep (Block h era) x → Block h era #

Era era ⇒ Generic (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Associated Types

type Rep (WitnessSetHKD Identity era) ∷ TypeType #

Methods

from ∷ WitnessSetHKD Identity era → Rep (WitnessSetHKD Identity era) x #

toRep (WitnessSetHKD Identity era) x → WitnessSetHKD Identity era #

Generic (WitVKey kr crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (WitVKey kr crypto) ∷ TypeType #

Methods

from ∷ WitVKey kr crypto → Rep (WitVKey kr crypto) x #

toRep (WitVKey kr crypto) x → WitVKey kr crypto #

Generic (TyVarDecl tyname ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (TyVarDecl tyname ann) ∷ TypeType #

Methods

from ∷ TyVarDecl tyname ann → Rep (TyVarDecl tyname ann) x #

toRep (TyVarDecl tyname ann) x → TyVarDecl tyname ann #

Generic (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseError s e) ∷ TypeType #

Methods

from ∷ ParseError s e → Rep (ParseError s e) x #

toRep (ParseError s e) x → ParseError s e #

Generic (State s e) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (State s e) ∷ TypeType #

Methods

from ∷ State s e → Rep (State s e) x #

toRep (State s e) x → State s e #

Generic (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseErrorBundle s e) ∷ TypeType #

Methods

from ∷ ParseErrorBundle s e → Rep (ParseErrorBundle s e) x #

toRep (ParseErrorBundle s e) x → ParseErrorBundle s e #

Generic (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (ErrorWithCause err cause) ∷ TypeType #

Methods

from ∷ ErrorWithCause err cause → Rep (ErrorWithCause err cause) x #

toRep (ErrorWithCause err cause) x → ErrorWithCause err cause #

Generic (WithMuxBearer peerid a) 
Instance details

Defined in Network.Mux.Trace

Associated Types

type Rep (WithMuxBearer peerid a) ∷ TypeType #

Methods

from ∷ WithMuxBearer peerid a → Rep (WithMuxBearer peerid a) x #

toRep (WithMuxBearer peerid a) x → WithMuxBearer peerid a #

Generic (CertifiedVRF v a) 
Instance details

Defined in Cardano.Crypto.VRF.Class

Associated Types

type Rep (CertifiedVRF v a) ∷ TypeType #

Methods

from ∷ CertifiedVRF v a → Rep (CertifiedVRF v a) x #

toRep (CertifiedVRF v a) x → CertifiedVRF v a #

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) ∷ TypeType #

Methods

from ∷ Either a b → Rep (Either a b) x #

toRep (Either a b) x → Either a b #

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) ∷ TypeType #

Methods

from ∷ Pair a b → Rep (Pair a b) x #

toRep (Pair a b) x → Pair a b #

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) ∷ TypeType #

Methods

from ∷ These a b → Rep (These a b) x #

toRep (These a b) x → These a b #

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) ∷ TypeType #

Methods

from ∷ These a b → Rep (These a b) x #

toRep (These a b) x → These a b #

Generic (RequestF body path) 
Instance details

Defined in Servant.Client.Core.Request

Associated Types

type Rep (RequestF body path) ∷ TypeType #

Methods

from ∷ RequestF body path → Rep (RequestF body path) x #

toRep (RequestF body path) x → RequestF body path #

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) ∷ TypeType #

Methods

from ∷ Cofree f a → Rep (Cofree f a) x #

toRep (Cofree f a) x → Cofree f a #

Generic (AdjacencyMap e a) 
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

Associated Types

type Rep (AdjacencyMap e a) ∷ TypeType #

Methods

from ∷ AdjacencyMap e a → Rep (AdjacencyMap e a) x #

toRep (AdjacencyMap e a) x → AdjacencyMap e a #

Generic (Graph e a) 
Instance details

Defined in Algebra.Graph.Labelled

Associated Types

type Rep (Graph e a) ∷ TypeType #

Methods

from ∷ Graph e a → Rep (Graph e a) x #

toRep (Graph e a) x → Graph e a #

Generic (Container b a) 
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep (Container b a) ∷ TypeType #

Methods

from ∷ Container b a → Rep (Container b a) x #

toRep (Container b a) x → Container b a #

Generic (ErrorContainer b e) 
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep (ErrorContainer b e) ∷ TypeType #

Methods

from ∷ ErrorContainer b e → Rep (ErrorContainer b e) x #

toRep (ErrorContainer b e) x → ErrorContainer b e #

Generic (Unit f) 
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep (Unit f) ∷ TypeType #

Methods

from ∷ Unit f → Rep (Unit f) x #

toRep (Unit f) x → Unit f #

Generic (Void f) 
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep (Void f) ∷ TypeType #

Methods

from ∷ Void f → Rep (Void f) x #

toRep (Void f) x → Void f #

Generic (ListN n a) 
Instance details

Defined in Basement.Sized.List

Associated Types

type Rep (ListN n a) ∷ TypeType #

Methods

from ∷ ListN n a → Rep (ListN n a) x #

toRep (ListN n a) x → ListN n a #

Generic (SignedDSIGN v a) 
Instance details

Defined in Cardano.Crypto.DSIGN.Class

Associated Types

type Rep (SignedDSIGN v a) ∷ TypeType #

Methods

from ∷ SignedDSIGN v a → Rep (SignedDSIGN v a) x #

toRep (SignedDSIGN v a) x → SignedDSIGN v a #

Generic (Map k v) 
Instance details

Defined in PlutusTx.AssocMap

Associated Types

type Rep (Map k v) ∷ TypeType #

Methods

from ∷ Map k v → Rep (Map k v) x #

toRep (Map k v) x → Map k v #

Generic (Validation e a) 
Instance details

Defined in Validation

Associated Types

type Rep (Validation e a) ∷ TypeType #

Methods

from ∷ Validation e a → Rep (Validation e a) x #

toRep (Validation e a) x → Validation e a #

Generic (BoundedRatio b a) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep (BoundedRatio b a) ∷ TypeType #

Methods

from ∷ BoundedRatio b a → Rep (BoundedRatio b a) x #

toRep (BoundedRatio b a) x → BoundedRatio b a #

Generic (Of a b) 
Instance details

Defined in Data.Functor.Of

Associated Types

type Rep (Of a b) ∷ TypeType #

Methods

from ∷ Of a b → Rep (Of a b) x #

toRep (Of a b) x → Of a b #

Generic (KeyPair kd crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (KeyPair kd crypto) ∷ TypeType #

Methods

from ∷ KeyPair kd crypto → Rep (KeyPair kd crypto) x #

toRep (KeyPair kd crypto) x → KeyPair kd crypto #

Generic (FingerTree v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (FingerTree v a) ∷ TypeType #

Methods

from ∷ FingerTree v a → Rep (FingerTree v a) x #

toRep (FingerTree v a) x → FingerTree v a #

Generic (SearchResult v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (SearchResult v a) ∷ TypeType #

Methods

from ∷ SearchResult v a → Rep (SearchResult v a) x #

toRep (SearchResult v a) x → SearchResult v a #

Generic (ViewL s a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (ViewL s a) ∷ TypeType #

Methods

from ∷ ViewL s a → Rep (ViewL s a) x #

toRep (ViewL s a) x → ViewL s a #

Generic (ViewR s a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (ViewR s a) ∷ TypeType #

Methods

from ∷ ViewR s a → Rep (ViewR s a) x #

toRep (ViewR s a) x → ViewR s a #

Generic (Node v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (Node v a) ∷ TypeType #

Methods

from ∷ Node v a → Rep (Node v a) x #

toRep (Node v a) x → Node v a #

Generic (Tuple2 a b) 
Instance details

Defined in Foundation.Tuple

Associated Types

type Rep (Tuple2 a b) ∷ TypeType #

Methods

from ∷ Tuple2 a b → Rep (Tuple2 a b) x #

toRep (Tuple2 a b) x → Tuple2 a b #

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) ∷ TypeType #

Methods

from ∷ Free f a → Rep (Free f a) x #

toRep (Free f a) x → Free f a #

Generic (ListT m a) 
Instance details

Defined in ListT

Associated Types

type Rep (ListT m a) ∷ TypeType #

Methods

from ∷ ListT m a → Rep (ListT m a) x #

toRep (ListT m a) x → ListT m a #

Generic (FirstToFinish m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (FirstToFinish m a) ∷ TypeType #

Methods

from ∷ FirstToFinish m a → Rep (FirstToFinish m a) x #

toRep (FirstToFinish m a) x → FirstToFinish m a #

Generic (LastToFinish m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (LastToFinish m a) ∷ TypeType #

Methods

from ∷ LastToFinish m a → Rep (LastToFinish m a) x #

toRep (LastToFinish m a) x → LastToFinish m a #

Generic (LastToFinishM m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (LastToFinishM m a) ∷ TypeType #

Methods

from ∷ LastToFinishM m a → Rep (LastToFinishM m a) x #

toRep (LastToFinishM m a) x → LastToFinishM m a #

Generic (PBftFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftFields c toSign) ∷ TypeType #

Methods

from ∷ PBftFields c toSign → Rep (PBftFields c toSign) x #

toRep (PBftFields c toSign) x → PBftFields c toSign #

Generic (ChainDbEnv m blk) 
Instance details

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

Associated Types

type Rep (ChainDbEnv m blk) ∷ TypeType #

Methods

from ∷ ChainDbEnv m blk → Rep (ChainDbEnv m blk) x #

toRep (ChainDbEnv m blk) x → ChainDbEnv m blk #

Generic (LgrDB m blk) 
Instance details

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

Associated Types

type Rep (LgrDB m blk) ∷ TypeType #

Methods

from ∷ LgrDB m blk → Rep (LgrDB m blk) x #

toRep (LgrDB m blk) x → LgrDB m blk #

Generic (ChainDbState m blk) 
Instance details

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

Associated Types

type Rep (ChainDbState m blk) ∷ TypeType #

Methods

from ∷ ChainDbState m blk → Rep (ChainDbState m blk) x #

toRep (ChainDbState m blk) x → ChainDbState m blk #

Generic (TraceChunkValidation blk validateTo) 
Instance details

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

Associated Types

type Rep (TraceChunkValidation blk validateTo) ∷ TypeType #

Methods

from ∷ TraceChunkValidation blk validateTo → Rep (TraceChunkValidation blk validateTo) x #

toRep (TraceChunkValidation blk validateTo) x → TraceChunkValidation blk validateTo #

Generic (InternalState blk h) 
Instance details

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

Associated Types

type Rep (InternalState blk h) ∷ TypeType #

Methods

from ∷ InternalState blk h → Rep (InternalState blk h) x #

toRep (InternalState blk h) x → InternalState blk h #

Generic (OpenState blk h) 
Instance details

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

Associated Types

type Rep (OpenState blk h) ∷ TypeType #

Methods

from ∷ OpenState blk h → Rep (OpenState blk h) x #

toRep (OpenState blk h) x → OpenState blk h #

Generic (ServerState txid tx) 
Instance details

Defined in Ouroboros.Network.TxSubmission.Inbound

Associated Types

type Rep (ServerState txid tx) ∷ TypeType #

Methods

from ∷ ServerState txid tx → Rep (ServerState txid tx) x #

toRep (ServerState txid tx) x → ServerState txid tx #

Generic (EvaluationError user internal) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (EvaluationError user internal) ∷ TypeType #

Methods

from ∷ EvaluationError user internal → Rep (EvaluationError user internal) x #

toRep (EvaluationError user internal) x → EvaluationError user internal #

Generic (Def var val) 
Instance details

Defined in PlutusCore.MkPlc

Associated Types

type Rep (Def var val) ∷ TypeType #

Methods

from ∷ Def var val → Rep (Def var val) x #

toRep (Def var val) x → Def var val #

Generic (TypeErrorExt uni ann) 
Instance details

Defined in PlutusIR.Error

Associated Types

type Rep (TypeErrorExt uni ann) ∷ TypeType #

Methods

from ∷ TypeErrorExt uni ann → Rep (TypeErrorExt uni ann) x #

toRep (TypeErrorExt uni ann) x → TypeErrorExt uni ann #

Generic (ListF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (ListF a b) ∷ TypeType #

Methods

from ∷ ListF a b → Rep (ListF a b) x #

toRep (ListF a b) x → ListF a b #

Generic (NonEmptyF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (NonEmptyF a b) ∷ TypeType #

Methods

from ∷ NonEmptyF a b → Rep (NonEmptyF a b) x #

toRep (NonEmptyF a b) x → NonEmptyF a b #

Generic (TreeF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (TreeF a b) ∷ TypeType #

Methods

from ∷ TreeF a b → Rep (TreeF a b) x #

toRep (TreeF a b) x → TreeF a b #

Generic (UVarDecl name ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

type Rep (UVarDecl name ann) ∷ TypeType #

Methods

from ∷ UVarDecl name ann → Rep (UVarDecl name ann) x #

toRep (UVarDecl name ann) x → UVarDecl name ann #

Generic (SearchResult v a) 
Instance details

Defined in Data.FingerTree.Strict

Associated Types

type Rep (SearchResult v a) ∷ TypeType #

Methods

from ∷ SearchResult v a → Rep (SearchResult v a) x #

toRep (SearchResult v a) x → SearchResult v a #

Generic (NoContentVerb method) 
Instance details

Defined in Servant.API.Verbs

Associated Types

type Rep (NoContentVerb method) ∷ TypeType #

Methods

from ∷ NoContentVerb method → Rep (NoContentVerb method) x #

toRep (NoContentVerb method) x → NoContentVerb method #

Generic (MakeChangeCriteria minCoinFor bundleSizeAssessor) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (MakeChangeCriteria minCoinFor bundleSizeAssessor) ∷ TypeType #

Methods

from ∷ MakeChangeCriteria minCoinFor bundleSizeAssessor → Rep (MakeChangeCriteria minCoinFor bundleSizeAssessor) x #

toRep (MakeChangeCriteria minCoinFor bundleSizeAssessor) x → MakeChangeCriteria minCoinFor bundleSizeAssessor #

Generic (SelectionParamsOf f ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionParamsOf f ctx) ∷ TypeType #

Methods

from ∷ SelectionParamsOf f ctx → Rep (SelectionParamsOf f ctx) x #

toRep (SelectionParamsOf f ctx) x → SelectionParamsOf f ctx #

Generic (SelectionResultOf f ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionResultOf f ctx) ∷ TypeType #

Methods

from ∷ SelectionResultOf f ctx → Rep (SelectionResultOf f ctx) x #

toRep (SelectionResultOf f ctx) x → SelectionResultOf f ctx #

Generic (NonEmptyMap k v) 
Instance details

Defined in Data.Map.Strict.NonEmptyMap.Internal

Associated Types

type Rep (NonEmptyMap k v) ∷ TypeType #

Methods

from ∷ NonEmptyMap k v → Rep (NonEmptyMap k v) x #

toRep (NonEmptyMap k v) x → NonEmptyMap k v #

Generic (Quantity unit a) 
Instance details

Defined in Data.Quantity

Associated Types

type Rep (Quantity unit a) ∷ TypeType #

Methods

from ∷ Quantity unit a → Rep (Quantity unit a) x #

toRep (Quantity unit a) x → Quantity unit a #

Generic (Rec1 f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) ∷ TypeType #

Methods

fromRec1 f p → Rep (Rec1 f p) x #

toRep (Rec1 f p) x → Rec1 f p #

Generic (URec (Ptr ()) p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) ∷ TypeType #

Methods

fromURec (Ptr ()) p → Rep (URec (Ptr ()) p) x #

toRep (URec (Ptr ()) p) x → URec (Ptr ()) p #

Generic (URec Char p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) ∷ TypeType #

Methods

fromURec Char p → Rep (URec Char p) x #

toRep (URec Char p) x → URec Char p #

Generic (URec Double p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) ∷ TypeType #

Methods

fromURec Double p → Rep (URec Double p) x #

toRep (URec Double p) x → URec Double p #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) ∷ TypeType #

Methods

fromURec Float p → Rep (URec Float p) x #

toRep (URec Float p) x → URec Float p #

Generic (URec Int p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) ∷ TypeType #

Methods

fromURec Int p → Rep (URec Int p) x #

toRep (URec Int p) x → URec Int p #

Generic (URec Word p)

Since: base-4.9.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) ∷ TypeType #

Methods

fromURec Word p → Rep (URec Word p) x #

toRep (URec Word p) x → URec Word p #

Generic (a, b, c)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) ∷ TypeType #

Methods

from ∷ (a, b, c) → Rep (a, b, c) x #

toRep (a, b, c) x → (a, b, c) #

Generic (WrappedArrow a b c)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) ∷ TypeType #

Methods

fromWrappedArrow a b c → Rep (WrappedArrow a b c) x #

toRep (WrappedArrow a b c) x → WrappedArrow a b c #

Generic (Kleisli m a b)

Since: base-4.14.0.0

Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) ∷ TypeType #

Methods

fromKleisli m a b → Rep (Kleisli m a b) x #

toRep (Kleisli m a b) x → Kleisli m a b #

Generic (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) ∷ TypeType #

Methods

fromConst a b → Rep (Const a b) x #

toRep (Const a b) x → Const a b #

Generic (Ap f a)

Since: base-4.12.0.0

Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) ∷ TypeType #

Methods

fromAp f a → Rep (Ap f a) x #

toRep (Ap f a) x → Ap f a #

Generic (Alt f a)

Since: base-4.8.0.0

Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) ∷ TypeType #

Methods

fromAlt f a → Rep (Alt f a) x #

toRep (Alt f a) x → Alt f a #

Generic (K a b) 
Instance details

Defined in Data.SOP.BasicFunctors

Associated Types

type Rep (K a b) ∷ TypeType #

Methods

from ∷ K a b → Rep (K a b) x #

toRep (K a b) x → K a b #

Generic (Trip coin ptr pool) 
Instance details

Defined in Data.UMap

Associated Types

type Rep (Trip coin ptr pool) ∷ TypeType #

Methods

from ∷ Trip coin ptr pool → Rep (Trip coin ptr pool) x #

toRep (Trip coin ptr pool) x → Trip coin ptr pool #

Generic (WithBlockNo f a) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Protocol.ChainSel

Associated Types

type Rep (WithBlockNo f a) ∷ TypeType #

Methods

from ∷ WithBlockNo f a → Rep (WithBlockNo f a) x #

toRep (WithBlockNo f a) x → WithBlockNo f a #

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) ∷ TypeType #

Methods

from ∷ Tagged s b → Rep (Tagged s b) x #

toRep (Tagged s b) x → Tagged s b #

Generic (Type tyname uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Type tyname uni ann) ∷ TypeType #

Methods

from ∷ Type tyname uni ann → Rep (Type tyname uni ann) x #

toRep (Type tyname uni ann) x → Type tyname uni ann #

Generic (Error uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (Error uni fun ann) ∷ TypeType #

Methods

from ∷ Error uni fun ann → Rep (Error uni fun ann) x #

toRep (Error uni fun ann) x → Error uni fun ann #

Generic (KVVector kv vv a) 
Instance details

Defined in Data.VMap.KVVector

Associated Types

type Rep (KVVector kv vv a) ∷ TypeType #

Methods

from ∷ KVVector kv vv a → Rep (KVVector kv vv a) x #

toRep (KVVector kv vv a) x → KVVector kv vv a #

Generic (AnchoredSeq v a b) 
Instance details

Defined in Ouroboros.Network.AnchoredSeq

Associated Types

type Rep (AnchoredSeq v a b) ∷ TypeType #

Methods

from ∷ AnchoredSeq v a b → Rep (AnchoredSeq v a b) x #

toRep (AnchoredSeq v a b) x → AnchoredSeq v a b #

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) ∷ TypeType #

Methods

from ∷ These1 f g a → Rep (These1 f g a) x #

toRep (These1 f g a) x → These1 f g a #

Generic (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Associated Types

type Rep (Fix p a) ∷ TypeType #

Methods

from ∷ Fix p a → Rep (Fix p a) x #

toRep (Fix p a) x → Fix p a #

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) ∷ TypeType #

Methods

from ∷ Join p a → Rep (Join p a) x #

toRep (Join p a) x → Join p a #

Generic (Tuple3 a b c) 
Instance details

Defined in Foundation.Tuple

Associated Types

type Rep (Tuple3 a b c) ∷ TypeType #

Methods

from ∷ Tuple3 a b c → Rep (Tuple3 a b c) x #

toRep (Tuple3 a b c) x → Tuple3 a b c #

Generic (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Associated Types

type Rep (CofreeF f a b) ∷ TypeType #

Methods

from ∷ CofreeF f a b → Rep (CofreeF f a b) x #

toRep (CofreeF f a b) x → CofreeF f a b #

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) ∷ TypeType #

Methods

from ∷ FreeF f a b → Rep (FreeF f a b) x #

toRep (FreeF f a b) x → FreeF f a b #

Generic (MeasuredWith v a b) 
Instance details

Defined in Ouroboros.Network.AnchoredSeq

Associated Types

type Rep (MeasuredWith v a b) ∷ TypeType #

Methods

from ∷ MeasuredWith v a b → Rep (MeasuredWith v a b) x #

toRep (MeasuredWith v a b) x → MeasuredWith v a b #

Generic (IteratorState m blk b) 
Instance details

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

Associated Types

type Rep (IteratorState m blk b) ∷ TypeType #

Methods

from ∷ IteratorState m blk b → Rep (IteratorState m blk b) x #

toRep (IteratorState m blk b) x → IteratorState m blk b #

Generic (FollowerState m blk b) 
Instance details

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

Associated Types

type Rep (FollowerState m blk b) ∷ TypeType #

Methods

from ∷ FollowerState m blk b → Rep (FollowerState m blk b) x #

toRep (FollowerState m blk b) x → FollowerState m blk b #

Generic (IteratorState m blk h) 
Instance details

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

Associated Types

type Rep (IteratorState m blk h) ∷ TypeType #

Methods

from ∷ IteratorState m blk h → Rep (IteratorState m blk h) x #

toRep (IteratorState m blk h) x → IteratorState m blk h #

Generic (IteratorStateOrExhausted m hash h) 
Instance details

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

Associated Types

type Rep (IteratorStateOrExhausted m hash h) ∷ TypeType #

Methods

from ∷ IteratorStateOrExhausted m hash h → Rep (IteratorStateOrExhausted m hash h) x #

toRep (IteratorStateOrExhausted m hash h) x → IteratorStateOrExhausted m hash h #

Generic (InternalState m blk h) 
Instance details

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

Associated Types

type Rep (InternalState m blk h) ∷ TypeType #

Methods

from ∷ InternalState m blk h → Rep (InternalState m blk h) x #

toRep (InternalState m blk h) x → InternalState m blk h #

Generic (OpenState m blk h) 
Instance details

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

Associated Types

type Rep (OpenState m blk h) ∷ TypeType #

Methods

from ∷ OpenState m blk h → Rep (OpenState m blk h) x #

toRep (OpenState m blk h) x → OpenState m blk h #

Generic (TyDecl tyname uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (TyDecl tyname uni ann) ∷ TypeType #

Methods

from ∷ TyDecl tyname uni ann → Rep (TyDecl tyname uni ann) x #

toRep (TyDecl tyname uni ann) x → TyDecl tyname uni ann #

Generic (K1 i c p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) ∷ TypeType #

Methods

fromK1 i c p → Rep (K1 i c p) x #

toRep (K1 i c p) x → K1 i c p #

Generic ((f :+: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) ∷ TypeType #

Methods

from ∷ (f :+: g) p → Rep ((f :+: g) p) x #

toRep ((f :+: g) p) x → (f :+: g) p #

Generic ((f :*: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) ∷ TypeType #

Methods

from ∷ (f :*: g) p → Rep ((f :*: g) p) x #

toRep ((f :*: g) p) x → (f :*: g) p #

Generic (a, b, c, d)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) ∷ TypeType #

Methods

from ∷ (a, b, c, d) → Rep (a, b, c, d) x #

toRep (a, b, c, d) x → (a, b, c, d) #

Generic (Product f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) ∷ TypeType #

Methods

fromProduct f g a → Rep (Product f g a) x #

toRep (Product f g a) x → Product f g a #

Generic (Sum f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) ∷ TypeType #

Methods

fromSum f g a → Rep (Sum f g a) x #

toRep (Sum f g a) x → Sum f g a #

Generic (Product2 f g x y) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Util.Functors

Associated Types

type Rep (Product2 f g x y) ∷ TypeType #

Methods

from ∷ Product2 f g x y → Rep (Product2 f g x y) x0 #

toRep (Product2 f g x y) x0 → Product2 f g x y #

Generic (UMap coin cred pool ptr) 
Instance details

Defined in Data.UMap

Associated Types

type Rep (UMap coin cred pool ptr) ∷ TypeType #

Methods

from ∷ UMap coin cred pool ptr → Rep (UMap coin cred pool ptr) x #

toRep (UMap coin cred pool ptr) x → UMap coin cred pool ptr #

Generic (VMap kv vv k v) 
Instance details

Defined in Data.VMap

Associated Types

type Rep (VMap kv vv k v) ∷ TypeType #

Methods

from ∷ VMap kv vv k v → Rep (VMap kv vv k v) x #

toRep (VMap kv vv k v) x → VMap kv vv k v #

Generic (Program name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

type Rep (Program name uni fun ann) ∷ TypeType #

Methods

from ∷ Program name uni fun ann → Rep (Program name uni fun ann) x #

toRep (Program name uni fun ann) x → Program name uni fun ann #

Generic (Term name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

type Rep (Term name uni fun ann) ∷ TypeType #

Methods

from ∷ Term name uni fun ann → Rep (Term name uni fun ann) x #

toRep (Term name uni fun ann) x → Term name uni fun ann #

Generic (TypeError term uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (TypeError term uni fun ann) ∷ TypeType #

Methods

from ∷ TypeError term uni fun ann → Rep (TypeError term uni fun ann) x #

toRep (TypeError term uni fun ann) x → TypeError term uni fun ann #

Generic (Tuple4 a b c d) 
Instance details

Defined in Foundation.Tuple

Associated Types

type Rep (Tuple4 a b c d) ∷ TypeType #

Methods

from ∷ Tuple4 a b c d → Rep (Tuple4 a b c d) x #

toRep (Tuple4 a b c d) x → Tuple4 a b c d #

Generic (MachineParameters machinecosts term uni fun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.MachineParameters

Associated Types

type Rep (MachineParameters machinecosts term uni fun) ∷ TypeType #

Methods

from ∷ MachineParameters machinecosts term uni fun → Rep (MachineParameters machinecosts term uni fun) x #

toRep (MachineParameters machinecosts term uni fun) x → MachineParameters machinecosts term uni fun #

Generic (Subst name uni fun a) 
Instance details

Defined in UntypedPlutusCore.Transform.Inline

Associated Types

type Rep (Subst name uni fun a) ∷ TypeType #

Methods

from ∷ Subst name uni fun a → Rep (Subst name uni fun a) x #

toRep (Subst name uni fun a) x → Subst name uni fun a #

Generic (StreamBody' mods framing contentType a) 
Instance details

Defined in Servant.API.Stream

Associated Types

type Rep (StreamBody' mods framing contentType a) ∷ TypeType #

Methods

from ∷ StreamBody' mods framing contentType a → Rep (StreamBody' mods framing contentType a) x #

toRep (StreamBody' mods framing contentType a) x → StreamBody' mods framing contentType a #

Generic (M1 i c f p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) ∷ TypeType #

Methods

fromM1 i c f p → Rep (M1 i c f p) x #

toRep (M1 i c f p) x → M1 i c f p #

Generic ((f :.: g) p)

Since: base-4.7.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) ∷ TypeType #

Methods

from ∷ (f :.: g) p → Rep ((f :.: g) p) x #

toRep ((f :.: g) p) x → (f :.: g) p #

Generic (a, b, c, d, e)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) ∷ TypeType #

Methods

from ∷ (a, b, c, d, e) → Rep (a, b, c, d, e) x #

toRep (a, b, c, d, e) x → (a, b, c, d, e) #

Generic (Compose f g a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) ∷ TypeType #

Methods

fromCompose f g a → Rep (Compose f g a) x #

toRep (Compose f g a) x → Compose f g a #

Generic ((f :.: g) p) 
Instance details

Defined in Data.SOP.BasicFunctors

Associated Types

type Rep ((f :.: g) p) ∷ TypeType #

Methods

from ∷ (f :.: g) p → Rep ((f :.: g) p) x #

toRep ((f :.: g) p) x → (f :.: g) p #

Generic (Term tyname name uni fun a) 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep (Term tyname name uni fun a) ∷ TypeType #

Methods

from ∷ Term tyname name uni fun a → Rep (Term tyname name uni fun a) x #

toRep (Term tyname name uni fun a) x → Term tyname name uni fun a #

Generic (Datatype tyname name uni fun a) 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep (Datatype tyname name uni fun a) ∷ TypeType #

Methods

from ∷ Datatype tyname name uni fun a → Rep (Datatype tyname name uni fun a) x #

toRep (Datatype tyname name uni fun a) x → Datatype tyname name uni fun a #

Generic (Program tyname name uni fun ann) 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep (Program tyname name uni fun ann) ∷ TypeType #

Methods

from ∷ Program tyname name uni fun ann → Rep (Program tyname name uni fun ann) x #

toRep (Program tyname name uni fun ann) x → Program tyname name uni fun ann #

Generic (Binding tyname name uni fun a) 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep (Binding tyname name uni fun a) ∷ TypeType #

Methods

from ∷ Binding tyname name uni fun a → Rep (Binding tyname name uni fun a) x #

toRep (Binding tyname name uni fun a) x → Binding tyname name uni fun a #

Generic (Term tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Term tyname name uni fun ann) ∷ TypeType #

Methods

from ∷ Term tyname name uni fun ann → Rep (Term tyname name uni fun ann) x #

toRep (Term tyname name uni fun ann) x → Term tyname name uni fun ann #

Generic (Program tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Program tyname name uni fun ann) ∷ TypeType #

Methods

from ∷ Program tyname name uni fun ann → Rep (Program tyname name uni fun ann) x #

toRep (Program tyname name uni fun ann) x → Program tyname name uni fun ann #

Generic (NormCheckError tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (NormCheckError tyname name uni fun ann) ∷ TypeType #

Methods

from ∷ NormCheckError tyname name uni fun ann → Rep (NormCheckError tyname name uni fun ann) x #

toRep (NormCheckError tyname name uni fun ann) x → NormCheckError tyname name uni fun ann #

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) ∷ TypeType #

Methods

from ∷ Clown f a b → Rep (Clown f a b) x #

toRep (Clown f a b) x → Clown f a b #

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) ∷ TypeType #

Methods

from ∷ Flip p a b → Rep (Flip p a b) x #

toRep (Flip p a b) x → Flip p a b #

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) ∷ TypeType #

Methods

from ∷ Joker g a b → Rep (Joker g a b) x #

toRep (Joker g a b) x → Joker g a b #

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) ∷ TypeType #

Methods

from ∷ WrappedBifunctor p a b → Rep (WrappedBifunctor p a b) x #

toRep (WrappedBifunctor p a b) x → WrappedBifunctor p a b #

Generic (Subst tyname name uni fun a) 
Instance details

Defined in PlutusIR.Transform.Inline

Associated Types

type Rep (Subst tyname name uni fun a) ∷ TypeType #

Methods

from ∷ Subst tyname name uni fun a → Rep (Subst tyname name uni fun a) x #

toRep (Subst tyname name uni fun a) x → Subst tyname name uni fun a #

Generic (BindingGrp tyname name uni fun a) 
Instance details

Defined in PlutusIR.Transform.LetFloat

Associated Types

type Rep (BindingGrp tyname name uni fun a) ∷ TypeType #

Methods

from ∷ BindingGrp tyname name uni fun a → Rep (BindingGrp tyname name uni fun a) x #

toRep (BindingGrp tyname name uni fun a) x → BindingGrp tyname name uni fun a #

Generic (Verb method statusCode contentTypes a) 
Instance details

Defined in Servant.API.Verbs

Associated Types

type Rep (Verb method statusCode contentTypes a) ∷ TypeType #

Methods

from ∷ Verb method statusCode contentTypes a → Rep (Verb method statusCode contentTypes a) x #

toRep (Verb method statusCode contentTypes a) x → Verb method statusCode contentTypes a #

Generic (a, b, c, d, e, f)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) ∷ TypeType #

Methods

from ∷ (a, b, c, d, e, f) → Rep (a, b, c, d, e, f) x #

toRep (a, b, c, d, e, f) x → (a, b, c, d, e, f) #

Generic (VarDecl tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (VarDecl tyname name uni fun ann) ∷ TypeType #

Methods

from ∷ VarDecl tyname name uni fun ann → Rep (VarDecl tyname name uni fun ann) x #

toRep (VarDecl tyname name uni fun ann) x → VarDecl tyname name uni fun ann #

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) ∷ TypeType #

Methods

from ∷ Product f g a b → Rep (Product f g a b) x #

toRep (Product f g a b) x → Product f g a b #

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) ∷ TypeType #

Methods

from ∷ Sum p q a b → Rep (Sum p q a b) x #

toRep (Sum p q a b) x → Sum p q a b #

Generic (Stream method status framing contentType a) 
Instance details

Defined in Servant.API.Stream

Associated Types

type Rep (Stream method status framing contentType a) ∷ TypeType #

Methods

from ∷ Stream method status framing contentType a → Rep (Stream method status framing contentType a) x #

toRep (Stream method status framing contentType a) x → Stream method status framing contentType a #

Generic (a, b, c, d, e, f, g)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) ∷ TypeType #

Methods

from ∷ (a, b, c, d, e, f, g) → Rep (a, b, c, d, e, f, g) x #

toRep (a, b, c, d, e, f, g) x → (a, b, c, d, e, f, g) #

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) ∷ TypeType #

Methods

from ∷ Tannen f p a b → Rep (Tannen f p a b) x #

toRep (Tannen f p a b) x → Tannen f p a b #

Generic (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Associated Types

type Rep (Biff p f g a b) ∷ TypeType #

Methods

from ∷ Biff p f g a b → Rep (Biff p f g a b) x #

toRep (Biff p f g a b) x → Biff p f g a b #

data Natural #

Type representing arbitrary-precision non-negative integers.

>>> 2^100 :: Natural
1267650600228229401496703205376

Operations whose result would be negative throw (Underflow :: ArithException),

>>> -1 :: Natural
*** Exception: arithmetic underflow

Since: base-4.8.0.0

Instances

Instances details
Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Eq Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

(==)NaturalNaturalBool #

(/=)NaturalNaturalBool #

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

Since: base-4.8.0.0

Instance details

Defined in GHC.Num

Ord Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Natural

Methods

compareNaturalNaturalOrdering #

(<)NaturalNaturalBool #

(<=)NaturalNaturalBool #

(>)NaturalNaturalBool #

(>=)NaturalNaturalBool #

maxNaturalNaturalNatural #

minNaturalNaturalNatural #

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Methods

toRationalNaturalRational #

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

Methods

showsPrecIntNaturalShowS #

showNaturalString #

showList ∷ [Natural] → ShowS #

PrintfArg Natural

Since: base-4.8.0.0

Instance details

Defined in Text.Printf

Bits Natural

Since: base-4.8.0

Instance details

Defined in Data.Bits

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Natural #

parseJSONList ∷ Value → Parser [Natural] #

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONNatural → Value #

toEncodingNatural → Encoding #

toJSONList ∷ [Natural] → Value #

toEncodingList ∷ [Natural] → Encoding #

FromCBOR Natural 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR ∷ Decoder s Natural

labelProxy NaturalText

ToCBOR Natural 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORNatural → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Natural → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Natural] → Size

NoThunks Natural 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → NaturalIO (Maybe ThunkInfo)

wNoThunks ∷ Context → NaturalIO (Maybe ThunkInfo)

showTypeOfProxy NaturalString

Serialise Natural 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeNatural → Encoding

decode ∷ Decoder s Natural

encodeList ∷ [Natural] → Encoding

decodeList ∷ Decoder s [Natural]

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey ∷ ToJSONKeyFunction Natural

toJSONKeyList ∷ ToJSONKeyFunction [Natural]

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey ∷ FromJSONKeyFunction Natural

fromJSONKeyList ∷ FromJSONKeyFunction [Natural]

ToField Natural 
Instance details

Defined in Data.Csv.Conversion

Methods

toFieldNatural → Field

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyNatural → Doc ann

prettyList ∷ [Natural] → Doc ann

Corecursive Natural 
Instance details

Defined in Data.Functor.Foldable

Methods

embed ∷ Base Natural NaturalNatural

ana ∷ (a → Base Natural a) → a → Natural

apo ∷ (a → Base Natural (Either Natural a)) → a → Natural

postpro ∷ Recursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (a → Base Natural a) → a → Natural

gpostpro ∷ (Recursive Natural, Monad m) ⇒ (∀ b. m (Base Natural b) → Base Natural (m b)) → (∀ c. Base Natural c → Base Natural c) → (a → Base Natural (m a)) → a → Natural

Recursive Natural 
Instance details

Defined in Data.Functor.Foldable

Methods

projectNatural → Base Natural Natural

cata ∷ (Base Natural a → a) → Natural → a

para ∷ (Base Natural (Natural, a) → a) → Natural → a

gpara ∷ (Corecursive Natural, Comonad w) ⇒ (∀ b. Base Natural (w b) → w (Base Natural b)) → (Base Natural (EnvT Natural w a) → a) → Natural → a

prepro ∷ Corecursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (Base Natural a → a) → Natural → a

gprepro ∷ (Corecursive Natural, Comonad w) ⇒ (∀ b. Base Natural (w b) → w (Base Natural b)) → (∀ c. Base Natural c → Base Natural c) → (Base Natural (w a) → a) → Natural → a

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntNaturalInt

hashNaturalInt

FromHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural

Methods

(-)NaturalNatural → Difference Natural

FromField Natural 
Instance details

Defined in Data.Csv.Conversion

Methods

parseField ∷ Field → Parser Natural

UniformRange Natural 
Instance details

Defined in System.Random.Internal

Methods

uniformRM ∷ StatefulGen g m ⇒ (Natural, Natural) → g → m Natural

Pretty Natural 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

prettyNatural → Doc b

prettyList ∷ [Natural] → Doc b

FromFormKey Natural 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Natural 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyNaturalText

ToParamSchema Natural 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy Natural → ParamSchema t

ToSchema Natural 
Instance details

Defined in Data.Swagger.Internal.Schema

Methods

declareNamedSchemaProxy Natural → Declare (Definitions Schema) NamedSchema

FromText Natural 
Instance details

Defined in Data.Text.Class

Methods

fromTextTextEither TextDecodingError Natural

ToText Natural 
Instance details

Defined in Data.Text.Class

Methods

toTextNaturalText

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftNaturalQ Exp #

liftTypedNaturalQ (TExp Natural) #

PrettyDefaultBy config Natural ⇒ PrettyBy config Natural 
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Natural → Doc ann

prettyListBy ∷ config → [Natural] → Doc ann

DefaultPrettyBy config Natural 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Natural → Doc ann

defaultPrettyListBy ∷ config → [Natural] → Doc ann

Buildable (Range Natural) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

build ∷ Range NaturalBuilder

type Base Natural 
Instance details

Defined in Data.Functor.Foldable

type Base Natural = Maybe
type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Natural = Maybe Natural
type IntBaseType Natural 
Instance details

Defined in Data.IntCast

type IntBaseType Natural = 'BigWordTag

type Type = Type #

The kind of types with lifted values. For example Int :: Type.

data Constraint #

The kind of constraints, like Show a

data CallStack #

CallStacks are a lightweight method of obtaining a partial call-stack at any point in the program.

A function can request its call-site with the HasCallStack constraint. For example, we can define

putStrLnWithCallStack :: HasCallStack => String -> IO ()

as a variant of putStrLn that will get its call-site and print it, along with the string given as argument. We can access the call-stack inside putStrLnWithCallStack with callStack.

putStrLnWithCallStack :: HasCallStack => String -> IO ()
putStrLnWithCallStack msg = do
  putStrLn msg
  putStrLn (prettyCallStack callStack)

Thus, if we call putStrLnWithCallStack we will get a formatted call-stack alongside our string.

>>> putStrLnWithCallStack "hello"
hello
CallStack (from HasCallStack):
  putStrLnWithCallStack, called at <interactive>:2:1 in interactive:Ghci1

GHC solves HasCallStack constraints in three steps:

  1. If there is a CallStack in scope -- i.e. the enclosing function has a HasCallStack constraint -- GHC will append the new call-site to the existing CallStack.
  2. If there is no CallStack in scope -- e.g. in the GHCi session above -- and the enclosing definition does not have an explicit type signature, GHC will infer a HasCallStack constraint for the enclosing definition (subject to the monomorphism restriction).
  3. If there is no CallStack in scope and the enclosing definition has an explicit type signature, GHC will solve the HasCallStack constraint for the singleton CallStack containing just the current call-site.

CallStacks do not interact with the RTS and do not require compilation with -prof. On the other hand, as they are built up explicitly via the HasCallStack constraints, they will generally not contain as much information as the simulated call-stacks maintained by the RTS.

A CallStack is a [(String, SrcLoc)]. The String is the name of function that was called, the SrcLoc is the call-site. The list is ordered with the most recently called function at the head.

NOTE: The intrepid user may notice that HasCallStack is just an alias for an implicit parameter ?callStack :: CallStack. This is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.8.1.0

Instances

Instances details
IsList CallStack

Be aware that 'fromList . toList = id' only for unfrozen CallStacks, since toList removes frozenness information.

Since: base-4.9.0.0

Instance details

Defined in GHC.Exts

Associated Types

type Item CallStack #

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

Methods

showsPrecIntCallStackShowS #

showCallStackString #

showList ∷ [CallStack] → ShowS #

NoThunks CallStack 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → CallStackIO (Maybe ThunkInfo)

wNoThunks ∷ Context → CallStackIO (Maybe ThunkInfo)

showTypeOfProxy CallStackString

type Item CallStack 
Instance details

Defined in GHC.Exts

type Code CallStack 
Instance details

Defined in Generics.SOP.Instances

type Code CallStack = '['[] ∷ [Type], '[[Char], SrcLoc, CallStack], '[CallStack]]
type DatatypeInfoOf CallStack 
Instance details

Defined in Generics.SOP.Instances

type DatatypeInfoOf CallStack = 'ADT "GHC.Stack.Types" "CallStack" '['Constructor "EmptyCallStack", 'Constructor "PushCallStack", 'Constructor "FreezeCallStack"] '['[] ∷ [StrictnessInfo], '['StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy, 'StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy, 'StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy], '['StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy]]

class Contravariant (f ∷ TypeType) where #

The class of contravariant functors.

Whereas in Haskell, one can think of a Functor as containing or producing values, a contravariant functor is a functor that can be thought of as consuming values.

As an example, consider the type of predicate functions a -> Bool. One such predicate might be negative x = x < 0, which classifies integers as to whether they are negative. However, given this predicate, we can re-use it in other situations, providing we have a way to map values to integers. For instance, we can use the negative predicate on a person's bank balance to work out if they are currently overdrawn:

newtype Predicate a = Predicate { getPredicate :: a -> Bool }

instance Contravariant Predicate where
  contramap f (Predicate p) = Predicate (p . f)
                                         |   `- First, map the input...
                                         `----- then apply the predicate.

overdrawn :: Predicate Person
overdrawn = contramap personBankBalance negative

Any instance should be subject to the following laws:

Identity
contramap id = id
Composition
contramap (g . f) = contramap f . contramap g

Note, that the second law follows from the free theorem of the type of contramap and the first law, so you need only check that the former condition holds.

Minimal complete definition

contramap

Methods

contramap ∷ (a → b) → f b → f a #

(>$) ∷ b → f b → f a infixl 4 #

Replace all locations in the output with the same value. The default definition is contramap . const, but this may be overridden with a more efficient version.

Instances

Instances details
Contravariant Predicate

A Predicate is a Contravariant Functor, because contramap can apply its function argument to the input of the predicate.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Predicate b → Predicate a #

(>$) ∷ b → Predicate b → Predicate a #

Contravariant Comparison

A Comparison is a Contravariant Functor, because contramap can apply its function argument to each input of the comparison function.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Comparison b → Comparison a #

(>$) ∷ b → Comparison b → Comparison a #

Contravariant Equivalence

Equivalence relations are Contravariant, because you can apply the contramapped function to each input to the equivalence relation.

Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Equivalence b → Equivalence a #

(>$) ∷ b → Equivalence b → Equivalence a #

Contravariant ToJSONKeyFunction 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

contramap ∷ (a → b) → ToJSONKeyFunction b → ToJSONKeyFunction a #

(>$) ∷ b → ToJSONKeyFunction b → ToJSONKeyFunction a #

Contravariant (V1TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → V1 b → V1 a #

(>$) ∷ b → V1 b → V1 a #

Contravariant (U1TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → U1 b → U1 a #

(>$) ∷ b → U1 b → U1 a #

Contravariant (Op a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a0 → b) → Op a b → Op a a0 #

(>$) ∷ b → Op a b → Op a a0 #

Contravariant (ProxyTypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Proxy b → Proxy a #

(>$) ∷ b → Proxy b → Proxy a #

Contravariant m ⇒ Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap ∷ (a → b) → MaybeT m b → MaybeT m a #

(>$) ∷ b → MaybeT m b → MaybeT m a #

Contravariant m ⇒ Contravariant (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

contramap ∷ (a → b) → ListT m b → ListT m a #

(>$) ∷ b → ListT m b → ListT m a #

Contravariant (Tracer m) 
Instance details

Defined in Control.Tracer

Methods

contramap ∷ (a → b) → Tracer m b → Tracer m a #

(>$) ∷ b → Tracer m b → Tracer m a #

Contravariant f ⇒ Contravariant (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap ∷ (a → b) → Indexing f b → Indexing f a #

(>$) ∷ b → Indexing f b → Indexing f a #

Contravariant f ⇒ Contravariant (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap ∷ (a → b) → Indexing64 f b → Indexing64 f a #

(>$) ∷ b → Indexing64 f b → Indexing64 f a #

Contravariant m ⇒ Contravariant (FirstToFinish m) 
Instance details

Defined in Data.Monoid.Synchronisation

Methods

contramap ∷ (a → b) → FirstToFinish m b → FirstToFinish m a #

(>$) ∷ b → FirstToFinish m b → FirstToFinish m a #

Contravariant f ⇒ Contravariant (Rec1 f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Rec1 f b → Rec1 f a #

(>$) ∷ b → Rec1 f b → Rec1 f a #

Contravariant (Const a ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a0 → b) → Const a b → Const a a0 #

(>$) ∷ b → Const a b → Const a a0 #

Contravariant f ⇒ Contravariant (Alt f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Alt f b → Alt f a #

(>$) ∷ b → Alt f b → Alt f a #

Contravariant m ⇒ Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap ∷ (a → b) → ExceptT e m b → ExceptT e m a #

(>$) ∷ b → ExceptT e m b → ExceptT e m a #

Contravariant f ⇒ Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap ∷ (a → b) → IdentityT f b → IdentityT f a #

(>$) ∷ b → IdentityT f b → IdentityT f a #

Contravariant m ⇒ Contravariant (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

contramap ∷ (a → b) → ErrorT e m b → ErrorT e m a #

(>$) ∷ b → ErrorT e m b → ErrorT e m a #

Contravariant m ⇒ Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap ∷ (a → b) → ReaderT r m b → ReaderT r m a #

(>$) ∷ b → ReaderT r m b → ReaderT r m a #

Contravariant m ⇒ Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

contramap ∷ (a → b) → StateT s m b → StateT s m a #

(>$) ∷ b → StateT s m b → StateT s m a #

Contravariant m ⇒ Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap ∷ (a → b) → StateT s m b → StateT s m a #

(>$) ∷ b → StateT s m b → StateT s m a #

Contravariant m ⇒ Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

contramap ∷ (a → b) → WriterT w m b → WriterT w m a #

(>$) ∷ b → WriterT w m b → WriterT w m a #

Contravariant m ⇒ Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

contramap ∷ (a → b) → WriterT w m b → WriterT w m a #

(>$) ∷ b → WriterT w m b → WriterT w m a #

Contravariant (K1 i c ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → K1 i c b → K1 i c a #

(>$) ∷ b → K1 i c b → K1 i c a #

(Contravariant f, Contravariant g) ⇒ Contravariant (f :+: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → (f :+: g) b → (f :+: g) a #

(>$) ∷ b → (f :+: g) b → (f :+: g) a #

(Contravariant f, Contravariant g) ⇒ Contravariant (f :*: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → (f :*: g) b → (f :*: g) a #

(>$) ∷ b → (f :*: g) b → (f :*: g) a #

(Contravariant f, Contravariant g) ⇒ Contravariant (Product f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Product f g b → Product f g a #

(>$) ∷ b → Product f g b → Product f g a #

(Contravariant f, Contravariant g) ⇒ Contravariant (Sum f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Sum f g b → Sum f g a #

(>$) ∷ b → Sum f g b → Sum f g a #

Contravariant f ⇒ Contravariant (M1 i c f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → M1 i c f b → M1 i c f a #

(>$) ∷ b → M1 i c f b → M1 i c f a #

(Functor f, Contravariant g) ⇒ Contravariant (f :.: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → (f :.: g) b → (f :.: g) a #

(>$) ∷ b → (f :.: g) b → (f :.: g) a #

(Functor f, Contravariant g) ⇒ Contravariant (Compose f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Compose f g b → Compose f g a #

(>$) ∷ b → Compose f g b → Compose f g a #

Contravariant m ⇒ Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

contramap ∷ (a → b) → RWST r w s m b → RWST r w s m a #

(>$) ∷ b → RWST r w s m b → RWST r w s m a #

Contravariant m ⇒ Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

contramap ∷ (a → b) → RWST r w s m b → RWST r w s m a #

(>$) ∷ b → RWST r w s m b → RWST r w s m a #

absurdVoid → a #

Since Void values logically don't exist, this witnesses the logical reasoning tool of "ex falso quodlibet".

>>> let x :: Either Void Int; x = Right 5
>>> :{
case x of
    Right r -> r
    Left l  -> absurd l
:}
5

Since: base-4.8.0.0

data Void #

Uninhabited data type

Since: base-4.8.0.0

Instances

Instances details
Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==)VoidVoidBool #

(/=)VoidVoidBool #

Data Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Void → c Void #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c Void #

toConstrVoidConstr #

dataTypeOfVoidDataType #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c Void) #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c Void) #

gmapT ∷ (∀ b. Data b ⇒ b → b) → VoidVoid #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Void → r #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Void → r #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Void → [u] #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Void → u #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void #

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compareVoidVoidOrdering #

(<)VoidVoidBool #

(<=)VoidVoidBool #

(>)VoidVoidBool #

(>=)VoidVoidBool #

maxVoidVoidVoid #

minVoidVoidVoid #

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Show Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

showsPrecIntVoidShowS #

showVoidString #

showList ∷ [Void] → ShowS #

Ix Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

range ∷ (Void, Void) → [Void] #

index ∷ (Void, Void) → VoidInt #

unsafeIndex ∷ (Void, Void) → VoidInt #

inRange ∷ (Void, Void) → VoidBool #

rangeSize ∷ (Void, Void) → Int #

unsafeRangeSize ∷ (Void, Void) → Int #

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 #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>)VoidVoidVoid #

sconcatNonEmpty VoidVoid #

stimesIntegral b ⇒ b → VoidVoid #

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Void #

parseJSONList ∷ Value → Parser [Void] #

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONVoid → Value #

toEncodingVoid → Encoding #

toJSONList ∷ [Void] → Value #

toEncodingList ∷ [Void] → Encoding #

FromCBOR Void 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR ∷ Decoder s Void

labelProxy VoidText

ToCBOR Void 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORVoid → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Void → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Void] → Size

NoThunks Void 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → VoidIO (Maybe ThunkInfo)

wNoThunks ∷ Context → VoidIO (Maybe ThunkInfo)

showTypeOfProxy VoidString

Serialise Void 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeVoid → Encoding

decode ∷ Decoder s Void

encodeList ∷ [Void] → Encoding

decodeList ∷ Decoder s [Void]

ToJSONKey Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey ∷ ToJSONKeyFunction Void

toJSONKeyList ∷ ToJSONKeyFunction [Void]

FromJSONKey Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey ∷ FromJSONKeyFunction Void

fromJSONKeyList ∷ FromJSONKeyFunction [Void]

Pretty Void 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyVoid → Doc ann

prettyList ∷ [Void] → Doc ann

FromData Void 
Instance details

Defined in PlutusTx.IsData.Class

Methods

fromBuiltinData ∷ BuiltinData → Maybe Void

ToData Void 
Instance details

Defined in PlutusTx.IsData.Class

Methods

toBuiltinDataVoid → BuiltinData

UnsafeFromData Void 
Instance details

Defined in PlutusTx.IsData.Class

Methods

unsafeFromBuiltinData ∷ BuiltinData → Void

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntVoidInt

hashVoidInt

ShowErrorComponent Void 
Instance details

Defined in Text.Megaparsec.Error

Buildable Void 
Instance details

Defined in Formatting.Buildable

Methods

buildVoidBuilder

FromHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

Finite Void 
Instance details

Defined in System.Random.GFinite

Methods

cardinalityProxy# Void → Cardinality

toFiniteIntegerVoid

fromFiniteVoidInteger

FromFormKey Void 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Void 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyVoidText

Lift Void

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftVoidQ Exp #

liftTypedVoidQ (TExp Void) #

PrettyDefaultBy config Void ⇒ PrettyBy config Void 
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Void → Doc ann

prettyListBy ∷ config → [Void] → Doc ann

DefaultPrettyBy config Void 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Void → Doc ann

defaultPrettyListBy ∷ config → [Void] → Doc ann

FoldableWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → V1 a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → V1 a → m

ifoldr ∷ (Void → a → b → b) → b → V1 a → b

ifoldl ∷ (Void → b → a → b) → b → V1 a → b

ifoldr' ∷ (Void → a → b → b) → b → V1 a → b

ifoldl' ∷ (Void → b → a → b) → b → V1 a → b

FoldableWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → U1 a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → U1 a → m

ifoldr ∷ (Void → a → b → b) → b → U1 a → b

ifoldl ∷ (Void → b → a → b) → b → U1 a → b

ifoldr' ∷ (Void → a → b → b) → b → U1 a → b

ifoldl' ∷ (Void → b → a → b) → b → U1 a → b

FoldableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Proxy a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → Proxy a → m

ifoldr ∷ (Void → a → b → b) → b → Proxy a → b

ifoldl ∷ (Void → b → a → b) → b → Proxy a → b

ifoldr' ∷ (Void → a → b → b) → b → Proxy a → b

ifoldl' ∷ (Void → b → a → b) → b → Proxy a → b

FunctorWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → V1 a → V1 b

FunctorWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → U1 a → U1 b

FunctorWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Proxy a → Proxy b

TraversableWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → V1 a → f (V1 b)

TraversableWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → U1 a → f (U1 b)

TraversableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Proxy a → f (Proxy b)

FilterableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (Void → a → Maybe b) → Proxy a → Proxy b

ifilter ∷ (Void → a → Bool) → Proxy a → Proxy a

WitherableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (Void → a → f (Maybe b)) → Proxy a → f (Proxy b) #

iwitherMMonad m ⇒ (Void → a → m (Maybe b)) → Proxy a → m (Proxy b)

ifilterAApplicative f ⇒ (Void → a → f Bool) → Proxy a → f (Proxy a)

FoldableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Const e a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → Const e a → m

ifoldr ∷ (Void → a → b → b) → b → Const e a → b

ifoldl ∷ (Void → b → a → b) → b → Const e a → b

ifoldr' ∷ (Void → a → b → b) → b → Const e a → b

ifoldl' ∷ (Void → b → a → b) → b → Const e a → b

FoldableWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Constant e a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → Constant e a → m

ifoldr ∷ (Void → a → b → b) → b → Constant e a → b

ifoldl ∷ (Void → b → a → b) → b → Constant e a → b

ifoldr' ∷ (Void → a → b → b) → b → Constant e a → b

ifoldl' ∷ (Void → b → a → b) → b → Constant e a → b

FunctorWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Const e a → Const e b

FunctorWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Constant e a → Constant e b

TraversableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Const e a → f (Const e b)

TraversableWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Constant e a → f (Constant e b)

FoldableWithIndex Void (K1 i c ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → K1 i c a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → K1 i c a → m

ifoldr ∷ (Void → a → b → b) → b → K1 i c a → b

ifoldl ∷ (Void → b → a → b) → b → K1 i c a → b

ifoldr' ∷ (Void → a → b → b) → b → K1 i c a → b

ifoldl' ∷ (Void → b → a → b) → b → K1 i c a → b

FunctorWithIndex Void (K1 i c ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → K1 i c a → K1 i c b

TraversableWithIndex Void (K1 i c ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → K1 i c a → f (K1 i c b)

type Rep Void 
Instance details

Defined in Data.Void

type Rep Void = D1 ('MetaData "Void" "Data.Void" "base" 'False) (V1TypeType)
type Code Void 
Instance details

Defined in Generics.SOP.Instances

type Code Void = '[] ∷ [[Type]]
type DatatypeInfoOf Void 
Instance details

Defined in Generics.SOP.Instances

type DatatypeInfoOf Void = 'ADT "Data.Void" "Void" ('[] ∷ [ConstructorInfo]) ('[] ∷ [[StrictnessInfo]])

secondBifunctor p ⇒ (b → c) → p a b → p a c #

Map covariantly over the second argument.

secondbimap id

Examples

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

bimapBifunctor p ⇒ (a → b) → (c → d) → p a c → p b d #

Map over both arguments at the same time.

bimap f g ≡ first f . second g

Examples

Expand
>>> bimap toUpper (+1) ('j', 3)
('J',4)
>>> bimap toUpper (+1) (Left 'j')
Left 'J'
>>> bimap toUpper (+1) (Right 3)
Right 4

firstBifunctor p ⇒ (a → b) → p a c → p b c #

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

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

printfPrintfType r ⇒ String → r #

Format a variable number of arguments with the C-style formatting string.

>>> printf "%s, %d, %.4f" "hello" 123 pi
hello, 123, 3.1416

The return value is either String or (IO a) (which should be (IO ()), but Haskell's type system makes this hard).

The format string consists of ordinary characters and conversion specifications, which specify how to format one of the arguments to printf in the output string. A format specification is introduced by the % character; this character can be self-escaped into the format string using %%. A format specification ends with a format character that provides the primary information about how to format the value. The rest of the conversion specification is optional. In order, one may have flag characters, a width specifier, a precision specifier, and type-specific modifier characters.

Unlike C printf(3), the formatting of this printf is driven by the argument type; formatting is type specific. The types formatted by printf "out of the box" are:

printf is also extensible to support other types: see below.

A conversion specification begins with the character %, followed by zero or more of the following flags:

-      left adjust (default is right adjust)
+      always use a sign (+ or -) for signed conversions
space  leading space for positive numbers in signed conversions
0      pad with zeros rather than spaces
#      use an \"alternate form\": see below

When both flags are given, - overrides 0 and + overrides space. A negative width specifier in a * conversion is treated as positive but implies the left adjust flag.

The "alternate form" for unsigned radix conversions is as in C printf(3):

%o           prefix with a leading 0 if needed
%x           prefix with a leading 0x if nonzero
%X           prefix with a leading 0X if nonzero
%b           prefix with a leading 0b if nonzero
%[eEfFgG]    ensure that the number contains a decimal point

Any flags are followed optionally by a field width:

num    field width
*      as num, but taken from argument list

The field width is a minimum, not a maximum: it will be expanded as needed to avoid mutilating a value.

Any field width is followed optionally by a precision:

.num   precision
.      same as .0
.*     as num, but taken from argument list

Negative precision is taken as 0. The meaning of the precision depends on the conversion type.

Integral    minimum number of digits to show
RealFloat   number of digits after the decimal point
String      maximum number of characters

The precision for Integral types is accomplished by zero-padding. If both precision and zero-pad are given for an Integral field, the zero-pad is ignored.

Any precision is followed optionally for Integral types by a width modifier; the only use of this modifier being to set the implicit size of the operand for conversion of a negative operand to unsigned:

hh     Int8
h      Int16
l      Int32
ll     Int64
L      Int64

The specification ends with a format character:

c      character               Integral
d      decimal                 Integral
o      octal                   Integral
x      hexadecimal             Integral
X      hexadecimal             Integral
b      binary                  Integral
u      unsigned decimal        Integral
f      floating point          RealFloat
F      floating point          RealFloat
g      general format float    RealFloat
G      general format float    RealFloat
e      exponent format float   RealFloat
E      exponent format float   RealFloat
s      string                  String
v      default format          any type

The "%v" specifier is provided for all built-in types, and should be provided for user-defined type formatters as well. It picks a "best" representation for the given type. For the built-in types the "%v" specifier is converted as follows:

c      Char
u      other unsigned Integral
d      other signed Integral
g      RealFloat
s      String

Mismatch between the argument types and the format string, as well as any other syntactic or semantic errors in the format string, will cause an exception to be thrown at runtime.

Note that the formatting for RealFloat types is currently a bit different from that of C printf(3), conforming instead to showEFloat, showFFloat and showGFloat (and their alternate versions showFFloatAlt and showGFloatAlt). This is hard to fix: the fixed versions would format in a backward-incompatible way. In any case the Haskell behavior is generally more sensible than the C behavior. A brief summary of some key differences:

  • Haskell printf never uses the default "6-digit" precision used by C printf.
  • Haskell printf treats the "precision" specifier as indicating the number of digits after the decimal point.
  • Haskell printf prints the exponent of e-format numbers without a gratuitous plus sign, and with the minimum possible number of digits.
  • Haskell printf will place a zero after a decimal point when possible.

class PrintfArg a where #

Typeclass of printf-formattable values. The formatArg method takes a value and a field format descriptor and either fails due to a bad descriptor or produces a ShowS as the result. The default parseFormat expects no modifiers: this is the normal case. Minimal instance: formatArg.

Minimal complete definition

formatArg

Methods

formatArg ∷ a → FieldFormatter #

Since: base-4.7.0.0

parseFormat ∷ a → ModifierParser #

Since: base-4.7.0.0

Instances

Instances details
PrintfArg Char

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Double

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Float

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int8

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int16

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int32

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Int64

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Integer

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Natural

Since: base-4.8.0.0

Instance details

Defined in Text.Printf

PrintfArg Word

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word8

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word16

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word32

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg Word64

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

formatArg ∷ ShortText → FieldFormatter #

parseFormat ∷ ShortText → ModifierParser #

PrintfArg GYLogNamespace #
>>> printf "%s" ("My" <> "Namespace" :: GYLogNamespace)
My.Namespace
Instance details

Defined in GeniusYield.Types.Logging

PrintfArg GYPubKeyHash #
>>> Printf.printf "%s\n" $ pubKeyHashFromApi "e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d
Instance details

Defined in GeniusYield.Types.PubKeyHash

PrintfArg GYPaymentSigningKey #
>>> Printf.printf "%s\n" ("5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290" :: GYPaymentSigningKey)
5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290
Instance details

Defined in GeniusYield.Types.Key

PrintfArg GYPaymentVerificationKey #
>>> Printf.printf "%s\n" ("0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605" :: GYPaymentVerificationKey)
0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605
Instance details

Defined in GeniusYield.Types.Key

PrintfArg GYRational #
>>> printf "%6.4f\n" $ fromRational @GYRational 0.123
0.1230
Instance details

Defined in GeniusYield.Types.Rational

PrintfArg GYValidatorHash #
>>> printf "%s" ("cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0" :: GYValidatorHash)
cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0
Instance details

Defined in GeniusYield.Types.Script

PrintfArg GYAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYAddress #

This instance is using for logging

>>> Printf.printf "addr = %s" addr
addr = addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYSlot # 
Instance details

Defined in GeniusYield.Types.Slot

PrintfArg GYTime #
>>> printf "%s\n" $ timeFromPlutus 1000
1970-01-01T00:00:01Z
Instance details

Defined in GeniusYield.Types.Time

PrintfArg GYTxId #
>>> Printf.printf "tid = %s" gyTxId
tid = 6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8
Instance details

Defined in GeniusYield.Types.Tx

PrintfArg GYTx # 
Instance details

Defined in GeniusYield.Types.Tx

PrintfArg GYTxOutRefCbor # 
Instance details

Defined in GeniusYield.Types.TxOutRef

PrintfArg GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

PrintfArg GYAssetClass #
>>> Printf.printf "ac = %s" GYLovelace
ac = lovelace
Instance details

Defined in GeniusYield.Types.Value

PrintfArg GYValue #
>>> Printf.printf "value = %s" (valueFromList [])
value =
>>> Printf.printf "value = %s" (valueFromList [(GYLovelace, 1000)])
value = 1000 lovelace
Instance details

Defined in GeniusYield.Types.Value

PrintfArg GYUTxOs # 
Instance details

Defined in GeniusYield.Types.UTxO

IsChar c ⇒ PrintfArg [c]

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

formatArg ∷ [c] → FieldFormatter #

parseFormat ∷ [c] → ModifierParser #

unlessApplicative f ⇒ Bool → f () → f () #

The reverse of when.

foldM ∷ (Foldable t, Monad m) ⇒ (b → a → m b) → b → t a → m b #

The foldM function is analogous to foldl, except that its result is encapsulated in a monad. Note that foldM works from left-to-right over the list arguments. This could be an issue where (>>) and the `folded function' are not commutative.

foldM f a1 [x1, x2, ..., xm]

==

do
  a2 <- f a1 x1
  a3 <- f a2 x2
  ...
  f am xm

If right-to-left evaluation is required, the input list should be reversed.

Note: foldM is the same as foldlM

forM ∷ (Traversable t, Monad m) ⇒ t a → (a → m b) → m (t b) #

forM is mapM with its arguments flipped. For a version that ignores the results see forM_.

newtype Identity a #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances

Instances details
Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=)Identity a → (a → Identity b) → Identity b #

(>>)Identity a → Identity b → Identity b #

return ∷ a → Identity a #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap ∷ (a → b) → Identity a → Identity b #

(<$) ∷ a → Identity b → Identity a #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix ∷ (a → Identity a) → Identity a #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure ∷ a → Identity a #

(<*>)Identity (a → b) → Identity a → Identity b #

liftA2 ∷ (a → b → c) → Identity a → Identity b → Identity c #

(*>)Identity a → Identity b → Identity b #

(<*)Identity a → Identity b → Identity a #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

foldMonoid m ⇒ Identity m → m #

foldMapMonoid m ⇒ (a → m) → Identity a → m #

foldMap'Monoid m ⇒ (a → m) → Identity a → m #

foldr ∷ (a → b → b) → b → Identity a → b #

foldr' ∷ (a → b → b) → b → Identity a → b #

foldl ∷ (b → a → b) → b → Identity a → b #

foldl' ∷ (b → a → b) → b → Identity a → b #

foldr1 ∷ (a → a → a) → Identity a → a #

foldl1 ∷ (a → a → a) → Identity a → a #

toListIdentity a → [a] #

nullIdentity a → Bool #

lengthIdentity a → Int #

elemEq a ⇒ a → Identity a → Bool #

maximumOrd a ⇒ Identity a → a #

minimumOrd a ⇒ Identity a → a #

sumNum a ⇒ Identity a → a #

productNum a ⇒ Identity a → a #

Foldable Tree 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

foldMonoid m ⇒ Tree m → m #

foldMapMonoid m ⇒ (a → m) → Tree a → m #

foldMap'Monoid m ⇒ (a → m) → Tree a → m #

foldr ∷ (a → b → b) → b → Tree a → b #

foldr' ∷ (a → b → b) → b → Tree a → b #

foldl ∷ (b → a → b) → b → Tree a → b #

foldl' ∷ (b → a → b) → b → Tree a → b #

foldr1 ∷ (a → a → a) → Tree a → a #

foldl1 ∷ (a → a → a) → Tree a → a #

toList ∷ Tree a → [a] #

null ∷ Tree a → Bool #

length ∷ Tree a → Int #

elemEq a ⇒ a → Tree a → Bool #

maximumOrd a ⇒ Tree a → a #

minimumOrd a ⇒ Tree a → a #

sumNum a ⇒ Tree a → a #

productNum a ⇒ Tree a → a #

Foldable Node 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

foldMonoid m ⇒ Node m → m #

foldMapMonoid m ⇒ (a → m) → Node a → m #

foldMap'Monoid m ⇒ (a → m) → Node a → m #

foldr ∷ (a → b → b) → b → Node a → b #

foldr' ∷ (a → b → b) → b → Node a → b #

foldl ∷ (b → a → b) → b → Node a → b #

foldl' ∷ (b → a → b) → b → Node a → b #

foldr1 ∷ (a → a → a) → Node a → a #

foldl1 ∷ (a → a → a) → Node a → a #

toList ∷ Node a → [a] #

null ∷ Node a → Bool #

length ∷ Node a → Int #

elemEq a ⇒ a → Node a → Bool #

maximumOrd a ⇒ Node a → a #

minimumOrd a ⇒ Node a → a #

sumNum a ⇒ Node a → a #

productNum a ⇒ Node a → a #

Traversable Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Traversable

Methods

traverseApplicative f ⇒ (a → f b) → Identity a → f (Identity b) #

sequenceAApplicative f ⇒ Identity (f a) → f (Identity a) #

mapMMonad m ⇒ (a → m b) → Identity a → m (Identity b) #

sequenceMonad m ⇒ Identity (m a) → m (Identity a) #

Traversable Tree 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

traverseApplicative f ⇒ (a → f b) → Tree a → f (Tree b) #

sequenceAApplicative f ⇒ Tree (f a) → f (Tree a) #

mapMMonad m ⇒ (a → m b) → Tree a → m (Tree b) #

sequenceMonad m ⇒ Tree (m a) → m (Tree a) #

Traversable Node 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

traverseApplicative f ⇒ (a → f b) → Node a → f (Node b) #

sequenceAApplicative f ⇒ Node (f a) → f (Node a) #

mapMMonad m ⇒ (a → m b) → Node a → m (Node b) #

sequenceMonad m ⇒ Node (m a) → m (Node a) #

Eq1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq ∷ (a → b → Bool) → Identity a → Identity b → Bool #

Ord1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare ∷ (a → b → Ordering) → Identity a → Identity b → Ordering #

Read1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec ∷ (IntReadS a) → ReadS [a] → IntReadS (Identity a) #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Identity a] #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Identity a) #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Identity a] #

Show1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntIdentity a → ShowS #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Identity a] → ShowS #

HKDFunctor Identity 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

hkdMapProxy Identity → (a → b) → HKD Identity a → HKD Identity b

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntIdentity a → Int

FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Identity a)

liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Identity a]

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Identity a → Value

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Identity a] → Value

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Identity a → Encoding

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Identity a] → Encoding

Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity

Methods

tabulate ∷ (Rep Identity → a) → Identity a

indexIdentity a → Rep Identity → a

FoldableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (() → a → m) → Identity a → m

ifoldMap'Monoid m ⇒ (() → a → m) → Identity a → m

ifoldr ∷ (() → a → b → b) → b → Identity a → b

ifoldl ∷ (() → b → a → b) → b → Identity a → b

ifoldr' ∷ (() → a → b → b) → b → Identity a → b

ifoldl' ∷ (() → b → a → b) → b → Identity a → b

FunctorWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

imap ∷ (() → a → b) → Identity a → Identity b

TraversableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (() → a → f b) → Identity a → f (Identity b)

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a

Methods

liftBaseWith ∷ (RunInBase Identity IdentityIdentity a) → Identity a

restoreM ∷ StM Identity a → Identity a

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve ∷ ReifiedGetter a b → a → Identity b

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve ∷ ReifiedGetter a b → Identity a → b

HasField "_d" (PParams era) UnitInterval 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

getField ∷ PParams era → UnitInterval #

(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (WitnessSet era) (Set (WitVKey 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ WitnessSet era → Set (WitVKey 'Witness c) #

(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (WitnessSet era) (Map (ScriptHash c) script) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ WitnessSet era → Map (ScriptHash c) script #

PrettyDefaultBy config (Identity a) ⇒ PrettyBy config (Identity a) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Identity a → Doc ann

prettyListBy ∷ config → [Identity a] → Doc ann

PrettyBy config a ⇒ DefaultPrettyBy config (Identity a) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Identity a → Doc ann

defaultPrettyListBy ∷ config → [Identity a] → Doc ann

Unbox a ⇒ Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Identity a) → m (Vector (Identity a))

basicUnsafeThaw ∷ PrimMonad m ⇒ Vector (Identity a) → m (Mutable Vector (PrimState m) (Identity a))

basicLength ∷ Vector (Identity a) → Int

basicUnsafeSliceIntInt → Vector (Identity a) → Vector (Identity a)

basicUnsafeIndexMMonad m ⇒ Vector (Identity a) → Int → m (Identity a)

basicUnsafeCopy ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Identity a) → Vector (Identity a) → m ()

elemseq ∷ Vector (Identity a) → Identity a → b → b

Unbox a ⇒ MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength ∷ MVector s (Identity a) → Int

basicUnsafeSliceIntInt → MVector s (Identity a) → MVector s (Identity a)

basicOverlaps ∷ MVector s (Identity a) → MVector s (Identity a) → Bool

basicUnsafeNew ∷ PrimMonad m ⇒ Int → m (MVector (PrimState m) (Identity a))

basicInitialize ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → m ()

basicUnsafeReplicate ∷ PrimMonad m ⇒ IntIdentity a → m (MVector (PrimState m) (Identity a))

basicUnsafeRead ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Int → m (Identity a)

basicUnsafeWrite ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → IntIdentity a → m ()

basicClear ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → m ()

basicSet ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Identity a → m ()

basicUnsafeCopy ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → MVector (PrimState m) (Identity a) → m ()

basicUnsafeMove ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → MVector (PrimState m) (Identity a) → m ()

basicUnsafeGrow ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Int → m (MVector (PrimState m) (Identity a))

Bounded a ⇒ Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

minBoundIdentity a #

maxBoundIdentity a #

Enum a ⇒ Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

succIdentity a → Identity a #

predIdentity a → Identity a #

toEnumIntIdentity a #

fromEnumIdentity a → Int #

enumFromIdentity a → [Identity a] #

enumFromThenIdentity a → Identity a → [Identity a] #

enumFromToIdentity a → Identity a → [Identity a] #

enumFromThenToIdentity a → Identity a → Identity a → [Identity a] #

Eq a ⇒ Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==)Identity a → Identity a → Bool #

(/=)Identity a → Identity a → Bool #

Floating a ⇒ Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

piIdentity a #

expIdentity a → Identity a #

logIdentity a → Identity a #

sqrtIdentity a → Identity a #

(**)Identity a → Identity a → Identity a #

logBaseIdentity a → Identity a → Identity a #

sinIdentity a → Identity a #

cosIdentity a → Identity a #

tanIdentity a → Identity a #

asinIdentity a → Identity a #

acosIdentity a → Identity a #

atanIdentity a → Identity a #

sinhIdentity a → Identity a #

coshIdentity a → Identity a #

tanhIdentity a → Identity a #

asinhIdentity a → Identity a #

acoshIdentity a → Identity a #

atanhIdentity a → Identity a #

log1pIdentity a → Identity a #

expm1Identity a → Identity a #

log1pexpIdentity a → Identity a #

log1mexpIdentity a → Identity a #

Fractional a ⇒ Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(/)Identity a → Identity a → Identity a #

recipIdentity a → Identity a #

fromRationalRationalIdentity a #

Integral a ⇒ Integral (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

quotIdentity a → Identity a → Identity a #

remIdentity a → Identity a → Identity a #

divIdentity a → Identity a → Identity a #

modIdentity a → Identity a → Identity a #

quotRemIdentity a → Identity a → (Identity a, Identity a) #

divModIdentity a → Identity a → (Identity a, Identity a) #

toIntegerIdentity a → Integer #

Num a ⇒ Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(+)Identity a → Identity a → Identity a #

(-)Identity a → Identity a → Identity a #

(*)Identity a → Identity a → Identity a #

negateIdentity a → Identity a #

absIdentity a → Identity a #

signumIdentity a → Identity a #

fromIntegerIntegerIdentity a #

Ord a ⇒ Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compareIdentity a → Identity a → Ordering #

(<)Identity a → Identity a → Bool #

(<=)Identity a → Identity a → Bool #

(>)Identity a → Identity a → Bool #

(>=)Identity a → Identity a → Bool #

maxIdentity a → Identity a → Identity a #

minIdentity a → Identity a → Identity a #

Read a ⇒ Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Real a ⇒ Real (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

toRationalIdentity a → Rational #

RealFloat a ⇒ RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFrac a ⇒ RealFrac (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

properFractionIntegral b ⇒ Identity a → (b, Identity a) #

truncateIntegral b ⇒ Identity a → b #

roundIntegral b ⇒ Identity a → b #

ceilingIntegral b ⇒ Identity a → b #

floorIntegral b ⇒ Identity a → b #

Show a ⇒ Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

showsPrecIntIdentity a → ShowS #

showIdentity a → String #

showList ∷ [Identity a] → ShowS #

Ix a ⇒ Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

range ∷ (Identity a, Identity a) → [Identity a] #

index ∷ (Identity a, Identity a) → Identity a → Int #

unsafeIndex ∷ (Identity a, Identity a) → Identity a → Int #

inRange ∷ (Identity a, Identity a) → Identity a → Bool #

rangeSize ∷ (Identity a, Identity a) → Int #

unsafeRangeSize ∷ (Identity a, Identity a) → Int #

IsString a ⇒ IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringIdentity a #

Generic (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) ∷ TypeType #

Methods

fromIdentity a → Rep (Identity a) x #

toRep (Identity a) x → Identity a #

Semigroup a ⇒ Semigroup (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(<>)Identity a → Identity a → Identity a #

sconcatNonEmpty (Identity a) → Identity a #

stimesIntegral b ⇒ b → Identity a → Identity a #

Monoid a ⇒ Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

memptyIdentity a #

mappendIdentity a → Identity a → Identity a #

mconcat ∷ [Identity a] → Identity a #

Storable a ⇒ Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOfIdentity a → Int #

alignmentIdentity a → Int #

peekElemOffPtr (Identity a) → IntIO (Identity a) #

pokeElemOffPtr (Identity a) → IntIdentity a → IO () #

peekByteOffPtr b → IntIO (Identity a) #

pokeByteOffPtr b → IntIdentity a → IO () #

peekPtr (Identity a) → IO (Identity a) #

pokePtr (Identity a) → Identity a → IO () #

Bits a ⇒ Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(.&.)Identity a → Identity a → Identity a #

(.|.)Identity a → Identity a → Identity a #

xorIdentity a → Identity a → Identity a #

complementIdentity a → Identity a #

shiftIdentity a → IntIdentity a #

rotateIdentity a → IntIdentity a #

zeroBitsIdentity a #

bitIntIdentity a #

setBitIdentity a → IntIdentity a #

clearBitIdentity a → IntIdentity a #

complementBitIdentity a → IntIdentity a #

testBitIdentity a → IntBool #

bitSizeMaybeIdentity a → Maybe Int #

bitSizeIdentity a → Int #

isSignedIdentity a → Bool #

shiftLIdentity a → IntIdentity a #

unsafeShiftLIdentity a → IntIdentity a #

shiftRIdentity a → IntIdentity a #

unsafeShiftRIdentity a → IntIdentity a #

rotateLIdentity a → IntIdentity a #

rotateRIdentity a → IntIdentity a #

popCountIdentity a → Int #

FiniteBits a ⇒ FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

NFData (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

rnf ∷ Pulser c → () #

FromJSON a ⇒ FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Identity a) #

parseJSONList ∷ Value → Parser [Identity a] #

FromJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

parseJSON ∷ Value → Parser (PParams era) #

parseJSONList ∷ Value → Parser [PParams era] #

ToJSON a ⇒ ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONIdentity a → Value #

toEncodingIdentity a → Encoding #

toJSONList ∷ [Identity a] → Value #

toEncodingList ∷ [Identity a] → Encoding #

ToJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

toJSON ∷ PParams era → Value #

toEncoding ∷ PParams era → Encoding #

toJSONList ∷ [PParams era] → Value #

toEncodingList ∷ [PParams era] → Encoding #

(Typeable era, FromCBOR (Annotator (Script era)), ValidateScript era) ⇒ FromCBOR (Annotator (WitnessSetHKD Identity era)) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

fromCBOR ∷ Decoder s (Annotator (WitnessSetHKD Identity era))

labelProxy (Annotator (WitnessSetHKD Identity era)) → Text

Era era ⇒ FromCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

fromCBOR ∷ Decoder s (PParams era)

labelProxy (PParams era) → Text

Era era ⇒ FromCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

fromCBOR ∷ Decoder s (PParams era)

labelProxy (PParams era) → Text

Era era ⇒ FromCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

fromCBOR ∷ Decoder s (PParams era)

labelProxy (PParams era) → Text

Crypto c ⇒ FromCBOR (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

fromCBOR ∷ Decoder s (Pulser c)

labelProxy (Pulser c) → Text

Era era ⇒ ToCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

toCBOR ∷ PParams era → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size

Era era ⇒ ToCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

toCBOR ∷ PParams era → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size

Era era ⇒ ToCBOR (PParams era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

toCBOR ∷ PParams era → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size

Crypto c ⇒ ToCBOR (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

toCBOR ∷ Pulser c → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Pulser c) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Pulser c] → Size

NoThunks (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

noThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

showTypeOfProxy (PParams era) → String

NoThunks (PParams era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

noThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

showTypeOfProxy (PParams era) → String

NoThunks (PParams era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

noThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → PParams era → IO (Maybe ThunkInfo)

showTypeOfProxy (PParams era) → String

Typeable c ⇒ NoThunks (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

noThunks ∷ Context → Pulser c → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → Pulser c → IO (Maybe ThunkInfo)

showTypeOfProxy (Pulser c) → String

Serialise a ⇒ Serialise (Identity a) 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeIdentity a → Encoding

decode ∷ Decoder s (Identity a)

encodeList ∷ [Identity a] → Encoding

decodeList ∷ Decoder s [Identity a]

ToJSONKey a ⇒ ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey ∷ ToJSONKeyFunction (Identity a)

toJSONKeyList ∷ ToJSONKeyFunction [Identity a]

Default (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

def ∷ PParams era

Default (PParams era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

def ∷ PParams era

Default (PParams era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

def ∷ PParams era

FromJSONKey a ⇒ FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey ∷ FromJSONKeyFunction (Identity a)

fromJSONKeyList ∷ FromJSONKeyFunction [Identity a]

ToField a ⇒ ToField (Identity a) 
Instance details

Defined in Data.Csv.Conversion

Methods

toFieldIdentity a → Field

Pretty a ⇒ Pretty (Identity a) 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyIdentity a → Doc ann

prettyList ∷ [Identity a] → Doc ann

Hashable a ⇒ Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntIdentity a → Int

hashIdentity a → Int

Unbox a ⇒ Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Prim a ⇒ Prim (Identity a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf#Identity a → Int#

alignment#Identity a → Int#

indexByteArray#ByteArray#Int#Identity a

readByteArray#MutableByteArray# s → Int#State# s → (# State# s, Identity a #)

writeByteArray#MutableByteArray# s → Int#Identity a → State# s → State# s

setByteArray#MutableByteArray# s → Int#Int#Identity a → State# s → State# s

indexOffAddr#Addr#Int#Identity a

readOffAddr#Addr#Int#State# s → (# State# s, Identity a #)

writeOffAddr#Addr#Int#Identity a → State# s → State# s

setOffAddr#Addr#Int#Int#Identity a → State# s → State# s

FromHttpApiData a ⇒ FromHttpApiData (Identity a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a ⇒ ToHttpApiData (Identity a) 
Instance details

Defined in Web.Internal.HttpApiData

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix ∷ Index (Identity a) → Traversal' (Identity a) (IxValue (Identity a))

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a)

Methods

_Wrapped' ∷ Iso' (Identity a) (Unwrapped (Identity a))

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Identity a) → m) → Identity a → m

ofoldr ∷ (Element (Identity a) → b → b) → b → Identity a → b

ofoldl' ∷ (a0 → Element (Identity a) → a0) → a0 → Identity a → a0

otoListIdentity a → [Element (Identity a)]

oall ∷ (Element (Identity a) → Bool) → Identity a → Bool

oany ∷ (Element (Identity a) → Bool) → Identity a → Bool

onullIdentity a → Bool

olengthIdentity a → Int

olength64Identity a → Int64

ocompareLengthIntegral i ⇒ Identity a → i → Ordering

otraverse_Applicative f ⇒ (Element (Identity a) → f b) → Identity a → f ()

ofor_Applicative f ⇒ Identity a → (Element (Identity a) → f b) → f ()

omapM_Applicative m ⇒ (Element (Identity a) → m ()) → Identity a → m ()

oforM_Applicative m ⇒ Identity a → (Element (Identity a) → m ()) → m ()

ofoldlMMonad m ⇒ (a0 → Element (Identity a) → m a0) → a0 → Identity a → m a0

ofoldMap1ExSemigroup m ⇒ (Element (Identity a) → m) → Identity a → m

ofoldr1Ex ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a)

ofoldl1Ex' ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a)

headExIdentity a → Element (Identity a)

lastExIdentity a → Element (Identity a)

unsafeHeadIdentity a → Element (Identity a)

unsafeLastIdentity a → Element (Identity a)

maximumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a)

minimumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a)

oelem ∷ Element (Identity a) → Identity a → Bool

onotElem ∷ Element (Identity a) → Identity a → Bool

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Identity a) → f (Element (Identity a))) → Identity a → f (Identity a)

omapMApplicative m ⇒ (Element (Identity a) → m (Element (Identity a))) → Identity a → m (Identity a)

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Identity a) → Element (Identity a)) → Identity a → Identity a

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint ∷ Element (Identity a) → Identity a

FromField a ⇒ FromField (Identity a) 
Instance details

Defined in Data.Csv.Conversion

Methods

parseField ∷ Field → Parser (Identity a)

FromFormKey a ⇒ FromFormKey (Identity a) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

parseFormKeyTextEither Text (Identity a)

ToFormKey a ⇒ ToFormKey (Identity a) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyIdentity a → Text

FromField a ⇒ FromField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField ∷ FieldParser (Identity a)

ToField a ⇒ ToField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldIdentity a → Action

ToParamSchema a ⇒ ToParamSchema (Identity a) 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Identity a) → ParamSchema t

ToSchema a ⇒ ToSchema (Identity a) 
Instance details

Defined in Data.Swagger.Internal.Schema

Methods

declareNamedSchemaProxy (Identity a) → Declare (Definitions Schema) NamedSchema

Ixed (Identity a) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Identity a)

Methods

ix ∷ Index (Identity a) → Optic' (IxKind (Identity a)) NoIx (Identity a) (IxValue (Identity a))

Generic1 Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity ∷ k → Type #

Methods

from1 ∷ ∀ (a ∷ k). Identity a → Rep1 Identity a #

to1 ∷ ∀ (a ∷ k). Rep1 Identity a → Identity a #

t ~ Identity b ⇒ Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 ∷ Lens (Identity a) (Identity b) a b

Eq (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

(==) ∷ PParams' Identity era → PParams' Identity era → Bool #

(/=) ∷ PParams' Identity era → PParams' Identity era → Bool #

Eq (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

(==) ∷ PParams' Identity era → PParams' Identity era → Bool #

(/=) ∷ PParams' Identity era → PParams' Identity era → Bool #

Eq (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

(==) ∷ PParams' Identity era → PParams' Identity era → Bool #

(/=) ∷ PParams' Identity era → PParams' Identity era → Bool #

(Era era, TransWitnessSet Eq era) ⇒ Eq (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

(==) ∷ WitnessSetHKD Identity era → WitnessSetHKD Identity era → Bool #

(/=) ∷ WitnessSetHKD Identity era → WitnessSetHKD Identity era → Bool #

Show (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

showsPrecInt → PParams' Identity era → ShowS #

show ∷ PParams' Identity era → String #

showList ∷ [PParams' Identity era] → ShowS #

Show (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

showsPrecInt → PParams' Identity era → ShowS #

show ∷ PParams' Identity era → String #

showList ∷ [PParams' Identity era] → ShowS #

Show (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

showsPrecInt → PParams' Identity era → ShowS #

show ∷ PParams' Identity era → String #

showList ∷ [PParams' Identity era] → ShowS #

(Era era, TransWitnessSet Show era) ⇒ Show (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

showsPrecInt → WitnessSetHKD Identity era → ShowS #

show ∷ WitnessSetHKD Identity era → String #

showList ∷ [WitnessSetHKD Identity era] → ShowS #

Era era ⇒ Generic (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Associated Types

type Rep (WitnessSetHKD Identity era) ∷ TypeType #

Methods

from ∷ WitnessSetHKD Identity era → Rep (WitnessSetHKD Identity era) x #

toRep (WitnessSetHKD Identity era) x → WitnessSetHKD Identity era #

(Era era, AnnotatedData (Script era)) ⇒ Semigroup (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

(<>) ∷ WitnessSetHKD Identity era → WitnessSetHKD Identity era → WitnessSetHKD Identity era #

sconcatNonEmpty (WitnessSetHKD Identity era) → WitnessSetHKD Identity era #

stimesIntegral b ⇒ b → WitnessSetHKD Identity era → WitnessSetHKD Identity era #

(Era era, AnnotatedData (Script era)) ⇒ Monoid (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

mempty ∷ WitnessSetHKD Identity era #

mappend ∷ WitnessSetHKD Identity era → WitnessSetHKD Identity era → WitnessSetHKD Identity era #

mconcat ∷ [WitnessSetHKD Identity era] → WitnessSetHKD Identity era #

NFData (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

rnf ∷ PParams' Identity era → () #

NFData (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

rnf ∷ PParams' Identity era → () #

NFData (PParams' Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

rnf ∷ PParams' Identity era → () #

(Era era, NFData (Script era), NFData (WitVKey 'Witness (Crypto era)), NFData (BootstrapWitness (Crypto era))) ⇒ NFData (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

rnf ∷ WitnessSetHKD Identity era → () #

Era era ⇒ ToCBOR (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

toCBOR ∷ WitnessSetHKD Identity era → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (WitnessSetHKD Identity era) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [WitnessSetHKD Identity era] → Size

(Era era, TransWitnessSet NoThunks era) ⇒ NoThunks (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

noThunks ∷ Context → WitnessSetHKD Identity era → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → WitnessSetHKD Identity era → IO (Maybe ThunkInfo)

showTypeOfProxy (WitnessSetHKD Identity era) → String

SafeToHash (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

originalBytes ∷ WitnessSetHKD Identity era → ByteString

makeHashWithExplicitProxys ∷ HasAlgorithm c ⇒ Proxy c → Proxy index → WitnessSetHKD Identity era → SafeHash c index

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type Unwrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Identity a) = a
type Index (Identity a) 
Instance details

Defined in Optics.At.Core

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Optics.At.Core

type IxValue (Identity a) = a
type IxKind (Identity a) 
Instance details

Defined in Optics.At.Core

type IxKind (Identity a) = An_Iso
type Code (Identity a) 
Instance details

Defined in Generics.SOP.Instances

type Code (Identity a) = '['[a]]
type DatatypeInfoOf (Identity a) 
Instance details

Defined in Generics.SOP.Instances

type DatatypeInfoOf (Identity a) = 'Newtype "Data.Functor.Identity" "Identity" ('Record "Identity" '['FieldInfo "runIdentity"])
type Rep1 Identity 
Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type TranslationError (AllegraEra c) WitnessSet 
Instance details

Defined in Cardano.Ledger.Allegra.Translation

type TranslationError (AllegraEra c) WitnessSet = DecoderError
type TranslationError (MaryEra c) WitnessSet 
Instance details

Defined in Cardano.Ledger.Mary.Translation

type TranslationError (MaryEra c) WitnessSet = DecoderError
type Rep (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

type Rep (WitnessSetHKD Identity era) = D1 ('MetaData "WitnessSetHKD" "Cardano.Ledger.Shelley.Tx" "cardano-ledger-shelley-0.1.0.0-12f951fe75a25f7bc40871d31bb8c545d9acfab7381f00a7ecc45519383df4da" 'False) (C1 ('MetaCons "WitnessSet'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "addrWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (WitVKey 'Witness (Crypto era))))) :*: S1 ('MetaSel ('Just "scriptWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Map (ScriptHash (Crypto era)) (Script era))))) :*: (S1 ('MetaSel ('Just "bootWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (BootstrapWitness (Crypto era))))) :*: S1 ('MetaSel ('Just "txWitsBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))

throwIOException e ⇒ e → IO a #

A variant of throw that can only be used within the IO monad.

Although throwIO has a type that is an instance of the type of throw, the two functions are subtly different:

throw e   `seq` x  ===> throw e
throwIO e `seq` x  ===> x

The first example will cause the exception e to be raised, whereas the second one won't. In fact, throwIO will only cause an exception to be raised when it is used within the IO monad. The throwIO variant should be used in preference to throw to raise an exception within the IO monad because it guarantees ordering with respect to other IO operations, whereas throw does not.

catch #

Arguments

Exception e 
IO a

The computation to run

→ (e → IO a)

Handler to invoke if an exception is raised

IO a 

This is the simplest of the exception-catching functions. It takes a single argument, runs it, and if an exception is raised the "handler" is executed, with the value of the exception passed as an argument. Otherwise, the result is returned as normal. For example:

  catch (readFile f)
        (\e -> do let err = show (e :: IOException)
                  hPutStr stderr ("Warning: Couldn't open " ++ f ++ ": " ++ err)
                  return "")

Note that we have to give a type signature to e, or the program will not typecheck as the type is ambiguous. While it is possible to catch exceptions of any type, see the section "Catching all exceptions" (in Control.Exception) for an explanation of the problems with doing so.

For catching exceptions in pure (non-IO) expressions, see the function evaluate.

Note that due to Haskell's unspecified evaluation order, an expression may throw one of several possible exceptions: consider the expression (error "urk") + (1 `div` 0). Does the expression throw ErrorCall "urk", or DivideByZero?

The answer is "it might throw either"; the choice is non-deterministic. If you are catching any type of exception then you might catch either. If you are calling catch with type IO Int -> (ArithException -> IO Int) -> IO Int then the handler may get run with DivideByZero as an argument, or an ErrorCall "urk" exception may be propogated further up. If you call it again, you might get a the opposite behaviour. This is ok, because catch is an IO computation.

class (Typeable e, Show e) ⇒ Exception e #

Any type that you wish to throw or catch as an exception must be an instance of the Exception class. The simplest case is a new exception type directly below the root:

data MyException = ThisException | ThatException
    deriving Show

instance Exception MyException

The default method definitions in the Exception class do what we need in this case. You can now throw and catch ThisException and ThatException as exceptions:

*Main> throw ThisException `catch` \e -> putStrLn ("Caught " ++ show (e :: MyException))
Caught ThisException

In more complicated examples, you may wish to define a whole hierarchy of exceptions:

---------------------------------------------------------------------
-- Make the root exception type for all the exceptions in a compiler

data SomeCompilerException = forall e . Exception e => SomeCompilerException e

instance Show SomeCompilerException where
    show (SomeCompilerException e) = show e

instance Exception SomeCompilerException

compilerExceptionToException :: Exception e => e -> SomeException
compilerExceptionToException = toException . SomeCompilerException

compilerExceptionFromException :: Exception e => SomeException -> Maybe e
compilerExceptionFromException x = do
    SomeCompilerException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make a subhierarchy for exceptions in the frontend of the compiler

data SomeFrontendException = forall e . Exception e => SomeFrontendException e

instance Show SomeFrontendException where
    show (SomeFrontendException e) = show e

instance Exception SomeFrontendException where
    toException = compilerExceptionToException
    fromException = compilerExceptionFromException

frontendExceptionToException :: Exception e => e -> SomeException
frontendExceptionToException = toException . SomeFrontendException

frontendExceptionFromException :: Exception e => SomeException -> Maybe e
frontendExceptionFromException x = do
    SomeFrontendException a <- fromException x
    cast a

---------------------------------------------------------------------
-- Make an exception type for a particular frontend compiler exception

data MismatchedParentheses = MismatchedParentheses
    deriving Show

instance Exception MismatchedParentheses where
    toException   = frontendExceptionToException
    fromException = frontendExceptionFromException

We can now catch a MismatchedParentheses exception as MismatchedParentheses, SomeFrontendException or SomeCompilerException, but not other types, e.g. IOException:

*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: MismatchedParentheses))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeFrontendException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeCompilerException))
Caught MismatchedParentheses
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: IOException))
*** Exception: MismatchedParentheses

Instances

Instances details
Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Exception PatternMatchFail

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecSelError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecConError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception RecUpdError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception NoMethodError

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception TypeError

Since: base-4.9.0.0

Instance details

Defined in Control.Exception.Base

Exception NonTermination

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception NestedAtomically

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception BlockedIndefinitelyOnMVar

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception BlockedIndefinitelyOnSTM

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception Deadlock

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception AllocationLimitExceeded

Since: base-4.8.0.0

Instance details

Defined in GHC.IO.Exception

Exception CompactionFailed

Since: base-4.10.0.0

Instance details

Defined in GHC.IO.Exception

Exception AssertionFailed

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception SomeAsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception AsyncException

Since: base-4.7.0.0

Instance details

Defined in GHC.IO.Exception

Exception ArrayException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception FixIOException

Since: base-4.11.0.0

Instance details

Defined in GHC.IO.Exception

Exception ExitCode

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception IOException

Since: base-4.1.0.0

Instance details

Defined in GHC.IO.Exception

Exception ArithException

Since: base-4.0.0.0

Instance details

Defined in GHC.Exception.Type

Exception SomeException

Since: base-3.0

Instance details

Defined in GHC.Exception.Type

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception UnexpectedAlonzoLedgerErrors 
Instance details

Defined in Ouroboros.Consensus.Shelley.Eras

Methods

toException ∷ UnexpectedAlonzoLedgerErrors → SomeException #

fromExceptionSomeExceptionMaybe UnexpectedAlonzoLedgerErrors #

displayException ∷ UnexpectedAlonzoLedgerErrors → String #

Exception PastHorizonException 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Methods

toException ∷ PastHorizonException → SomeException #

fromExceptionSomeExceptionMaybe PastHorizonException #

displayException ∷ PastHorizonException → String #

Exception DeserialiseFailure 
Instance details

Defined in Codec.CBOR.Read

Methods

toException ∷ DeserialiseFailure → SomeException #

fromExceptionSomeExceptionMaybe DeserialiseFailure #

displayException ∷ DeserialiseFailure → String #

Exception ShelleyReapplyException 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Methods

toException ∷ ShelleyReapplyException → SomeException #

fromExceptionSomeExceptionMaybe ShelleyReapplyException #

displayException ∷ ShelleyReapplyException → String #

Exception HardForkEncoderException 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Serialisation.Common

Methods

toException ∷ HardForkEncoderException → SomeException #

fromExceptionSomeExceptionMaybe HardForkEncoderException #

displayException ∷ HardForkEncoderException → String #

Exception DecoderError 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

toException ∷ DecoderError → SomeException #

fromExceptionSomeExceptionMaybe DecoderError #

displayException ∷ DecoderError → String #

Exception FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Methods

toException ∷ FreeVariableError → SomeException #

fromExceptionSomeExceptionMaybe FreeVariableError #

displayException ∷ FreeVariableError → String #

Exception FsError 
Instance details

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

Methods

toException ∷ FsError → SomeException #

fromExceptionSomeExceptionMaybe FsError #

displayException ∷ FsError → String #

Exception AesonException 
Instance details

Defined in Data.Aeson

Methods

toException ∷ AesonException → SomeException #

fromExceptionSomeExceptionMaybe AesonException #

displayException ∷ AesonException → String #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException ∷ HttpException → SomeException #

fromExceptionSomeExceptionMaybe HttpException #

displayException ∷ HttpException → String #

Exception DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

toException ∷ DigestAuthException → SomeException #

fromExceptionSomeExceptionMaybe DigestAuthException #

displayException ∷ DigestAuthException → String #

Exception InvalidBaseUrlException 
Instance details

Defined in Servant.Client.Core.BaseUrl

Methods

toException ∷ InvalidBaseUrlException → SomeException #

fromExceptionSomeExceptionMaybe InvalidBaseUrlException #

displayException ∷ InvalidBaseUrlException → String #

Exception ClientError 
Instance details

Defined in Servant.Client.Core.ClientError

Methods

toException ∷ ClientError → SomeException #

fromExceptionSomeExceptionMaybe ClientError #

displayException ∷ ClientError → String #

Exception EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

toException ∷ EncapsulatedPopperException → SomeException #

fromExceptionSomeExceptionMaybe EncapsulatedPopperException #

displayException ∷ EncapsulatedPopperException → String #

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException ∷ HttpExceptionContentWrapper → SomeException #

fromExceptionSomeExceptionMaybe HttpExceptionContentWrapper #

displayException ∷ HttpExceptionContentWrapper → String #

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException ∷ ASCII7_Invalid → SomeException #

fromExceptionSomeExceptionMaybe ASCII7_Invalid #

displayException ∷ ASCII7_Invalid → String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException ∷ ISO_8859_1_Invalid → SomeException #

fromExceptionSomeExceptionMaybe ISO_8859_1_Invalid #

displayException ∷ ISO_8859_1_Invalid → String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException ∷ UTF16_Invalid → SomeException #

fromExceptionSomeExceptionMaybe UTF16_Invalid #

displayException ∷ UTF16_Invalid → String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException ∷ UTF32_Invalid → SomeException #

fromExceptionSomeExceptionMaybe UTF32_Invalid #

displayException ∷ UTF32_Invalid → String #

Exception BimapException 
Instance details

Defined in Data.Bimap

Methods

toException ∷ BimapException → SomeException #

fromExceptionSomeExceptionMaybe BimapException #

displayException ∷ BimapException → String #

Exception CostModelApplyError 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Methods

toException ∷ CostModelApplyError → SomeException #

fromExceptionSomeExceptionMaybe CostModelApplyError #

displayException ∷ CostModelApplyError → String #

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

toException ∷ CryptoError → SomeException #

fromExceptionSomeExceptionMaybe CryptoError #

displayException ∷ CryptoError → String #

Exception EpochErr 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toException ∷ EpochErr → SomeException #

fromExceptionSomeExceptionMaybe EpochErr #

displayException ∷ EpochErr → String #

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Methods

toException ∷ AsyncCancelled → SomeException #

fromExceptionSomeExceptionMaybe AsyncCancelled #

displayException ∷ AsyncCancelled → String #

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Monad.Class.MonadAsync

Methods

toException ∷ ExceptionInLinkedThread → SomeException #

fromExceptionSomeExceptionMaybe ExceptionInLinkedThread #

displayException ∷ ExceptionInLinkedThread → String #

Exception BlockedIndefinitely 
Instance details

Defined in Control.Monad.Class.MonadSTM

Methods

toException ∷ BlockedIndefinitely → SomeException #

fromExceptionSomeExceptionMaybe BlockedIndefinitely #

displayException ∷ BlockedIndefinitely → String #

Exception InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

toException ∷ InvalidPosException → SomeException #

fromExceptionSomeExceptionMaybe InvalidPosException #

displayException ∷ InvalidPosException → String #

Exception MuxError 
Instance details

Defined in Network.Mux.Trace

Methods

toException ∷ MuxError → SomeException #

fromExceptionSomeExceptionMaybe MuxError #

displayException ∷ MuxError → String #

Exception MuxRuntimeError 
Instance details

Defined in Network.Mux.Types

Methods

toException ∷ MuxRuntimeError → SomeException #

fromExceptionSomeExceptionMaybe MuxRuntimeError #

displayException ∷ MuxRuntimeError → String #

Exception ChainSyncClientException 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Methods

toException ∷ ChainSyncClientException → SomeException #

fromExceptionSomeExceptionMaybe ChainSyncClientException #

displayException ∷ ChainSyncClientException → String #

Exception ChunkAssertionFailure 
Instance details

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

Methods

toException ∷ ChunkAssertionFailure → SomeException #

fromExceptionSomeExceptionMaybe ChunkAssertionFailure #

displayException ∷ ChunkAssertionFailure → String #

Exception RegistryClosedException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Methods

toException ∷ RegistryClosedException → SomeException #

fromExceptionSomeExceptionMaybe RegistryClosedException #

displayException ∷ RegistryClosedException → String #

Exception ResourceRegistryThreadException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Methods

toException ∷ ResourceRegistryThreadException → SomeException #

fromExceptionSomeExceptionMaybe ResourceRegistryThreadException #

displayException ∷ ResourceRegistryThreadException → String #

Exception TempRegistryException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Methods

toException ∷ TempRegistryException → SomeException #

fromExceptionSomeExceptionMaybe TempRegistryException #

displayException ∷ TempRegistryException → String #

Exception KeepAliveProtocolFailure 
Instance details

Defined in Ouroboros.Network.Protocol.KeepAlive.Type

Methods

toException ∷ KeepAliveProtocolFailure → SomeException #

fromExceptionSomeExceptionMaybe KeepAliveProtocolFailure #

displayException ∷ KeepAliveProtocolFailure → String #

Exception TxSubmissionProtocolError 
Instance details

Defined in Ouroboros.Network.TxSubmission.Inbound

Methods

toException ∷ TxSubmissionProtocolError → SomeException #

fromExceptionSomeExceptionMaybe TxSubmissionProtocolError #

displayException ∷ TxSubmissionProtocolError → String #

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException ∷ InvalidAccess → SomeException #

fromExceptionSomeExceptionMaybe InvalidAccess #

displayException ∷ InvalidAccess → String #

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException ∷ ResourceCleanupException → SomeException #

fromExceptionSomeExceptionMaybe ResourceCleanupException #

displayException ∷ ResourceCleanupException → String #

Exception AssertionException 
Instance details

Defined in Control.State.Transition.Extended

Methods

toException ∷ AssertionException → SomeException #

fromExceptionSomeExceptionMaybe AssertionException #

displayException ∷ AssertionException → String #

Exception ResultError 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

toException ∷ ResultError → SomeException #

fromExceptionSomeExceptionMaybe ResultError #

displayException ∷ ResultError → String #

Exception FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException ∷ FormatError → SomeException #

fromExceptionSomeExceptionMaybe FormatError #

displayException ∷ FormatError → String #

Exception QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException ∷ QueryError → SomeException #

fromExceptionSomeExceptionMaybe QueryError #

displayException ∷ QueryError → String #

Exception SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException ∷ SqlError → SomeException #

fromExceptionSomeExceptionMaybe SqlError #

displayException ∷ SqlError → String #

Exception ResourceError 
Instance details

Defined in Test.Tasty.Core

Methods

toException ∷ ResourceError → SomeException #

fromExceptionSomeExceptionMaybe ResourceError #

displayException ∷ ResourceError → String #

Exception ErrorAsException 
Instance details

Defined in Cardano.Api.Error

Methods

toException ∷ ErrorAsException → SomeException #

fromExceptionSomeExceptionMaybe ErrorAsException #

displayException ∷ ErrorAsException → String #

Exception ManyErrors 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

toException ∷ ManyErrors → SomeException #

fromExceptionSomeExceptionMaybe ManyErrors #

displayException ∷ ManyErrors → String #

Exception SeedBytesExhausted 
Instance details

Defined in Cardano.Crypto.Seed

Methods

toException ∷ SeedBytesExhausted → SomeException #

fromExceptionSomeExceptionMaybe SeedBytesExhausted #

displayException ∷ SeedBytesExhausted → String #

Exception GYTxMonadException # 
Instance details

Defined in GeniusYield.TxBuilder.Errors

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Methods

toException ∷ ExceptionInLinkedThread → SomeException #

fromExceptionSomeExceptionMaybe ExceptionInLinkedThread #

displayException ∷ ExceptionInLinkedThread → String #

Exception CardanoQueryException # 
Instance details

Defined in GeniusYield.CardanoApi.Query

Exception SubmitTxException # 
Instance details

Defined in GeniusYield.Providers.SubmitApi

Exception BuildTxException # 
Instance details

Defined in GeniusYield.Transaction

Exception HUnitFailure 
Instance details

Defined in Test.Tasty.HUnit.Orig

Methods

toException ∷ HUnitFailure → SomeException #

fromExceptionSomeExceptionMaybe HUnitFailure #

displayException ∷ HUnitFailure → String #

(Typeable blk, Show (SomeSecond BlockQuery blk)) ⇒ Exception (QueryEncoderException blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Query

Methods

toException ∷ QueryEncoderException blk → SomeException #

fromExceptionSomeExceptionMaybe (QueryEncoderException blk) #

displayException ∷ QueryEncoderException blk → String #

(Typeable blk, StandardHash blk) ⇒ Exception (ChainDbError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Methods

toException ∷ ChainDbError blk → SomeException #

fromExceptionSomeExceptionMaybe (ChainDbError blk) #

displayException ∷ ChainDbError blk → String #

(Typeable blk, StandardHash blk) ⇒ Exception (ChainDbFailure blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Methods

toException ∷ ChainDbFailure blk → SomeException #

fromExceptionSomeExceptionMaybe (ChainDbFailure blk) #

displayException ∷ ChainDbFailure blk → String #

(StandardHash blk, Typeable blk) ⇒ Exception (ImmutableDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Methods

toException ∷ ImmutableDBError blk → SomeException #

fromExceptionSomeExceptionMaybe (ImmutableDBError blk) #

displayException ∷ ImmutableDBError blk → String #

(StandardHash blk, Typeable blk) ⇒ Exception (VolatileDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.API

Methods

toException ∷ VolatileDBError blk → SomeException #

fromExceptionSomeExceptionMaybe (VolatileDBError blk) #

displayException ∷ VolatileDBError blk → String #

(Typeable vNumber, Show vNumber) ⇒ Exception (HandshakeProtocolError vNumber) 
Instance details

Defined in Ouroboros.Network.Protocol.Handshake.Type

Methods

toException ∷ HandshakeProtocolError vNumber → SomeException #

fromExceptionSomeExceptionMaybe (HandshakeProtocolError vNumber) #

displayException ∷ HandshakeProtocolError vNumber → String #

(Typeable vNumber, Show vNumber) ⇒ Exception (RefuseReason vNumber) 
Instance details

Defined in Ouroboros.Network.Protocol.Handshake.Type

Methods

toException ∷ RefuseReason vNumber → SomeException #

fromExceptionSomeExceptionMaybe (RefuseReason vNumber) #

displayException ∷ RefuseReason vNumber → String #

(Typeable era, Typeable proto) ⇒ Exception (ShelleyEncoderException era proto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Node.Serialisation

Methods

toException ∷ ShelleyEncoderException era proto → SomeException #

fromExceptionSomeExceptionMaybe (ShelleyEncoderException era proto) #

displayException ∷ ShelleyEncoderException era proto → String #

(Show s, Show (Token s), Show e, ShowErrorComponent e, VisualStream s, Typeable s, Typeable e) ⇒ Exception (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

toException ∷ ParseError s e → SomeException #

fromExceptionSomeExceptionMaybe (ParseError s e) #

displayException ∷ ParseError s e → String #

(Show s, Show (Token s), Show e, ShowErrorComponent e, VisualStream s, TraversableStream s, Typeable s, Typeable e) ⇒ Exception (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

toException ∷ ParseErrorBundle s e → SomeException #

fromExceptionSomeExceptionMaybe (ParseErrorBundle s e) #

displayException ∷ ParseErrorBundle s e → String #

(PrettyPlc cause, PrettyPlc err, Typeable cause, Typeable err) ⇒ Exception (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Methods

toException ∷ ErrorWithCause err cause → SomeException #

fromExceptionSomeExceptionMaybe (ErrorWithCause err cause) #

displayException ∷ ErrorWithCause err cause → String #

(PrettyUni uni ann, Typeable uni, Typeable fun, Typeable ann, Pretty fun) ⇒ Exception (Error uni fun ann) 
Instance details

Defined in PlutusIR.Error

Methods

toException ∷ Error uni fun ann → SomeException #

fromExceptionSomeExceptionMaybe (Error uni fun ann) #

displayException ∷ Error uni fun ann → String #

newtype Const a (b ∷ k) #

The Const functor.

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a ∷ k → Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) ∷ k → Type #

Methods

from1 ∷ ∀ (a0 ∷ k0). Const a a0 → Rep1 (Const a) a0 #

to1 ∷ ∀ (a0 ∷ k0). Rep1 (Const a) a0 → Const a a0 #

ConstraintsB (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

Associated Types

type AllB c (Const a)

Methods

baddDicts ∷ ∀ (c ∷ k0 → Constraint) (f ∷ k0 → Type). AllB c (Const a) ⇒ Const a f → Const a (Product (Dict c) f)

FunctorB (Const x ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap ∷ (∀ (a ∷ k0). f a → g a) → Const x f → Const x g

Monoid a ⇒ ApplicativeB (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ApplicativeB

Methods

bpure ∷ (∀ (a0 ∷ k0). f a0) → Const a f

bprod ∷ ∀ (f ∷ k0 → Type) (g ∷ k0 → Type). Const a f → Const a g → Const a (Product f g)

TraversableB (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverseApplicative e ⇒ (∀ (a0 ∷ k0). f a0 → e (g a0)) → Const a f → e (Const a g)

FoldableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Const e a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → Const e a → m

ifoldr ∷ (Void → a → b → b) → b → Const e a → b

ifoldl ∷ (Void → b → a → b) → b → Const e a → b

ifoldr' ∷ (Void → a → b → b) → b → Const e a → b

ifoldl' ∷ (Void → b → a → b) → b → Const e a → b

FunctorWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Const e a → Const e b

TraversableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Const e a → f (Const e b)

PrettyDefaultBy config (Const a b) ⇒ PrettyBy config (Const a b) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Const a b → Doc ann

prettyListBy ∷ config → [Const a b] → Doc ann

PrettyBy config a ⇒ DefaultPrettyBy config (Const a b) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Const a b → Doc ann

defaultPrettyListBy ∷ config → [Const a b] → Doc ann

Unbox a ⇒ Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → m (Vector (Const a b))

basicUnsafeThaw ∷ PrimMonad m ⇒ Vector (Const a b) → m (Mutable Vector (PrimState m) (Const a b))

basicLength ∷ Vector (Const a b) → Int

basicUnsafeSliceIntInt → Vector (Const a b) → Vector (Const a b)

basicUnsafeIndexMMonad m ⇒ Vector (Const a b) → Int → m (Const a b)

basicUnsafeCopy ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → Vector (Const a b) → m ()

elemseq ∷ Vector (Const a b) → Const a b → b0 → b0

Unbox a ⇒ MVector MVector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength ∷ MVector s (Const a b) → Int

basicUnsafeSliceIntInt → MVector s (Const a b) → MVector s (Const a b)

basicOverlaps ∷ MVector s (Const a b) → MVector s (Const a b) → Bool

basicUnsafeNew ∷ PrimMonad m ⇒ Int → m (MVector (PrimState m) (Const a b))

basicInitialize ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → m ()

basicUnsafeReplicate ∷ PrimMonad m ⇒ IntConst a b → m (MVector (PrimState m) (Const a b))

basicUnsafeRead ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (Const a b)

basicUnsafeWrite ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → IntConst a b → m ()

basicClear ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → m ()

basicSet ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Const a b → m ()

basicUnsafeCopy ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m ()

basicUnsafeMove ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m ()

basicUnsafeGrow ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (MVector (PrimState m) (Const a b))

Bifunctor (ConstTypeTypeType)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap ∷ (a → b) → (c → d) → Const a c → Const b d #

first ∷ (a → b) → Const a c → Const b c #

second ∷ (b → c) → Const a b → Const a c #

Eq2 (ConstTypeTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 ∷ (a → b → Bool) → (c → d → Bool) → Const a c → Const b d → Bool #

Ord2 (ConstTypeTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 ∷ (a → b → Ordering) → (c → d → Ordering) → Const a c → Const b d → Ordering #

Read2 (ConstTypeTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 ∷ (IntReadS a) → ReadS [a] → (IntReadS b) → ReadS [b] → IntReadS (Const a b) #

liftReadList2 ∷ (IntReadS a) → ReadS [a] → (IntReadS b) → ReadS [b] → ReadS [Const a b] #

liftReadPrec2ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec (Const a b) #

liftReadListPrec2ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec [Const a b] #

Show2 (ConstTypeTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → IntConst a b → ShowS #

liftShowList2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → [Const a b] → ShowS #

FromJSON2 (ConstTypeTypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 ∷ (Value → Parser a) → (Value → Parser [a]) → (Value → Parser b) → (Value → Parser [b]) → Value → Parser (Const a b)

liftParseJSONList2 ∷ (Value → Parser a) → (Value → Parser [a]) → (Value → Parser b) → (Value → Parser [b]) → Value → Parser [Const a b]

ToJSON2 (ConstTypeTypeType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → Const a b → Value

liftToJSONList2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → [Const a b] → Value

liftToEncoding2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → Const a b → Encoding

liftToEncodingList2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → [Const a b] → Encoding

Biapplicative (ConstTypeTypeType) 
Instance details

Defined in Data.Biapplicative

Methods

bipure ∷ a → b → Const a b

(<<*>>)Const (a → b) (c → d) → Const a c → Const b d

biliftA2 ∷ (a → b → c) → (d → e → f) → Const a d → Const b e → Const c f

(*>>)Const a b → Const c d → Const c d

(<<*)Const a b → Const c d → Const a b

Hashable2 (ConstTypeTypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 ∷ (Int → a → Int) → (Int → b → Int) → IntConst a b → Int

Functor (Const m ∷ TypeType)

Since: base-2.1

Instance details

Defined in Data.Functor.Const

Methods

fmap ∷ (a → b) → Const m a → Const m b #

(<$) ∷ a → Const m b → Const m a #

Monoid m ⇒ Applicative (Const m ∷ TypeType)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure ∷ a → Const m a #

(<*>)Const m (a → b) → Const m a → Const m b #

liftA2 ∷ (a → b → c) → Const m a → Const m b → Const m c #

(*>)Const m a → Const m b → Const m b #

(<*)Const m a → Const m b → Const m a #

Foldable (Const m ∷ TypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

foldMonoid m0 ⇒ Const m m0 → m0 #

foldMapMonoid m0 ⇒ (a → m0) → Const m a → m0 #

foldMap'Monoid m0 ⇒ (a → m0) → Const m a → m0 #

foldr ∷ (a → b → b) → b → Const m a → b #

foldr' ∷ (a → b → b) → b → Const m a → b #

foldl ∷ (b → a → b) → b → Const m a → b #

foldl' ∷ (b → a → b) → b → Const m a → b #

foldr1 ∷ (a → a → a) → Const m a → a #

foldl1 ∷ (a → a → a) → Const m a → a #

toListConst m a → [a] #

nullConst m a → Bool #

lengthConst m a → Int #

elemEq a ⇒ a → Const m a → Bool #

maximumOrd a ⇒ Const m a → a #

minimumOrd a ⇒ Const m a → a #

sumNum a ⇒ Const m a → a #

productNum a ⇒ Const m a → a #

Traversable (Const m ∷ TypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverseApplicative f ⇒ (a → f b) → Const m a → f (Const m b) #

sequenceAApplicative f ⇒ Const m (f a) → f (Const m a) #

mapMMonad m0 ⇒ (a → m0 b) → Const m a → m0 (Const m b) #

sequenceMonad m0 ⇒ Const m (m0 a) → m0 (Const m a) #

Contravariant (Const a ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a0 → b) → Const a b → Const a a0 #

(>$) ∷ b → Const a b → Const a a0 #

Eq a ⇒ Eq1 (Const a ∷ TypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq ∷ (a0 → b → Bool) → Const a a0 → Const a b → Bool #

Ord a ⇒ Ord1 (Const a ∷ TypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare ∷ (a0 → b → Ordering) → Const a a0 → Const a b → Ordering #

Read a ⇒ Read1 (Const a ∷ TypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec ∷ (IntReadS a0) → ReadS [a0] → IntReadS (Const a a0) #

liftReadList ∷ (IntReadS a0) → ReadS [a0] → ReadS [Const a a0] #

liftReadPrecReadPrec a0 → ReadPrec [a0] → ReadPrec (Const a a0) #

liftReadListPrecReadPrec a0 → ReadPrec [a0] → ReadPrec [Const a a0] #

Show a ⇒ Show1 (Const a ∷ TypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec ∷ (Int → a0 → ShowS) → ([a0] → ShowS) → IntConst a a0 → ShowS #

liftShowList ∷ (Int → a0 → ShowS) → ([a0] → ShowS) → [Const a a0] → ShowS #

Hashable a ⇒ Hashable1 (Const a ∷ TypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a0 → Int) → IntConst a a0 → Int

FromJSON a ⇒ FromJSON1 (Const a ∷ TypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (Value → Parser a0) → (Value → Parser [a0]) → Value → Parser (Const a a0)

liftParseJSONList ∷ (Value → Parser a0) → (Value → Parser [a0]) → Value → Parser [Const a a0]

ToJSON a ⇒ ToJSON1 (Const a ∷ TypeType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a0 → Value) → ([a0] → Value) → Const a a0 → Value

liftToJSONList ∷ (a0 → Value) → ([a0] → Value) → [Const a a0] → Value

liftToEncoding ∷ (a0 → Encoding) → ([a0] → Encoding) → Const a a0 → Encoding

liftToEncodingList ∷ (a0 → Encoding) → ([a0] → Encoding) → [Const a a0] → Encoding

Filterable (Const r ∷ TypeType) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Const r a → Const r b #

catMaybesConst r (Maybe a) → Const r a #

filter ∷ (a → Bool) → Const r a → Const r a

Witherable (Const r ∷ TypeType) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Const r a → f (Const r b) #

witherMMonad m ⇒ (a → m (Maybe b)) → Const r a → m (Const r b)

filterAApplicative f ⇒ (a → f Bool) → Const r a → f (Const r a)

witherMapApplicative m ⇒ (Const r b → r0) → (a → m (Maybe b)) → Const r a → m r0

Bounded a ⇒ Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBoundConst a b #

maxBoundConst a b #

Enum a ⇒ Enum (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

succConst a b → Const a b #

predConst a b → Const a b #

toEnumIntConst a b #

fromEnumConst a b → Int #

enumFromConst a b → [Const a b] #

enumFromThenConst a b → Const a b → [Const a b] #

enumFromToConst a b → Const a b → [Const a b] #

enumFromThenToConst a b → Const a b → Const a b → [Const a b] #

Eq a ⇒ Eq (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(==)Const a b → Const a b → Bool #

(/=)Const a b → Const a b → Bool #

Floating a ⇒ Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

piConst a b #

expConst a b → Const a b #

logConst a b → Const a b #

sqrtConst a b → Const a b #

(**)Const a b → Const a b → Const a b #

logBaseConst a b → Const a b → Const a b #

sinConst a b → Const a b #

cosConst a b → Const a b #

tanConst a b → Const a b #

asinConst a b → Const a b #

acosConst a b → Const a b #

atanConst a b → Const a b #

sinhConst a b → Const a b #

coshConst a b → Const a b #

tanhConst a b → Const a b #

asinhConst a b → Const a b #

acoshConst a b → Const a b #

atanhConst a b → Const a b #

log1pConst a b → Const a b #

expm1Const a b → Const a b #

log1pexpConst a b → Const a b #

log1mexpConst a b → Const a b #

Fractional a ⇒ Fractional (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(/)Const a b → Const a b → Const a b #

recipConst a b → Const a b #

fromRationalRationalConst a b #

Integral a ⇒ Integral (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

quotConst a b → Const a b → Const a b #

remConst a b → Const a b → Const a b #

divConst a b → Const a b → Const a b #

modConst a b → Const a b → Const a b #

quotRemConst a b → Const a b → (Const a b, Const a b) #

divModConst a b → Const a b → (Const a b, Const a b) #

toIntegerConst a b → Integer #

Num a ⇒ Num (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(+)Const a b → Const a b → Const a b #

(-)Const a b → Const a b → Const a b #

(*)Const a b → Const a b → Const a b #

negateConst a b → Const a b #

absConst a b → Const a b #

signumConst a b → Const a b #

fromIntegerIntegerConst a b #

Ord a ⇒ Ord (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

compareConst a b → Const a b → Ordering #

(<)Const a b → Const a b → Bool #

(<=)Const a b → Const a b → Bool #

(>)Const a b → Const a b → Bool #

(>=)Const a b → Const a b → Bool #

maxConst a b → Const a b → Const a b #

minConst a b → Const a b → Const a b #

Read a ⇒ Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

readsPrecIntReadS (Const a b) #

readListReadS [Const a b] #

readPrecReadPrec (Const a b) #

readListPrecReadPrec [Const a b] #

Real a ⇒ Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRationalConst a b → Rational #

RealFloat a ⇒ RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadixConst a b → Integer #

floatDigitsConst a b → Int #

floatRangeConst a b → (Int, Int) #

decodeFloatConst a b → (Integer, Int) #

encodeFloatIntegerIntConst a b #

exponentConst a b → Int #

significandConst a b → Const a b #

scaleFloatIntConst a b → Const a b #

isNaNConst a b → Bool #

isInfiniteConst a b → Bool #

isDenormalizedConst a b → Bool #

isNegativeZeroConst a b → Bool #

isIEEEConst a b → Bool #

atan2Const a b → Const a b → Const a b #

RealFrac a ⇒ RealFrac (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

properFractionIntegral b0 ⇒ Const a b → (b0, Const a b) #

truncateIntegral b0 ⇒ Const a b → b0 #

roundIntegral b0 ⇒ Const a b → b0 #

ceilingIntegral b0 ⇒ Const a b → b0 #

floorIntegral b0 ⇒ Const a b → b0 #

Show a ⇒ Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Const

Methods

showsPrecIntConst a b → ShowS #

showConst a b → String #

showList ∷ [Const a b] → ShowS #

Ix a ⇒ Ix (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

range ∷ (Const a b, Const a b) → [Const a b] #

index ∷ (Const a b, Const a b) → Const a b → Int #

unsafeIndex ∷ (Const a b, Const a b) → Const a b → Int #

inRange ∷ (Const a b, Const a b) → Const a b → Bool #

rangeSize ∷ (Const a b, Const a b) → Int #

unsafeRangeSize ∷ (Const a b, Const a b) → Int #

IsString a ⇒ IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringConst a b #

Generic (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) ∷ TypeType #

Methods

fromConst a b → Rep (Const a b) x #

toRep (Const a b) x → Const a b #

Semigroup a ⇒ Semigroup (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(<>)Const a b → Const a b → Const a b #

sconcatNonEmpty (Const a b) → Const a b #

stimesIntegral b0 ⇒ b0 → Const a b → Const a b #

Monoid a ⇒ Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

memptyConst a b #

mappendConst a b → Const a b → Const a b #

mconcat ∷ [Const a b] → Const a b #

Storable a ⇒ Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOfConst a b → Int #

alignmentConst a b → Int #

peekElemOffPtr (Const a b) → IntIO (Const a b) #

pokeElemOffPtr (Const a b) → IntConst a b → IO () #

peekByteOffPtr b0 → IntIO (Const a b) #

pokeByteOffPtr b0 → IntConst a b → IO () #

peekPtr (Const a b) → IO (Const a b) #

pokePtr (Const a b) → Const a b → IO () #

Bits a ⇒ Bits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

(.&.)Const a b → Const a b → Const a b #

(.|.)Const a b → Const a b → Const a b #

xorConst a b → Const a b → Const a b #

complementConst a b → Const a b #

shiftConst a b → IntConst a b #

rotateConst a b → IntConst a b #

zeroBitsConst a b #

bitIntConst a b #

setBitConst a b → IntConst a b #

clearBitConst a b → IntConst a b #

complementBitConst a b → IntConst a b #

testBitConst a b → IntBool #

bitSizeMaybeConst a b → Maybe Int #

bitSizeConst a b → Int #

isSignedConst a b → Bool #

shiftLConst a b → IntConst a b #

unsafeShiftLConst a b → IntConst a b #

shiftRConst a b → IntConst a b #

unsafeShiftRConst a b → IntConst a b #

rotateLConst a b → IntConst a b #

rotateRConst a b → IntConst a b #

popCountConst a b → Int #

FiniteBits a ⇒ FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

finiteBitSizeConst a b → Int #

countLeadingZerosConst a b → Int #

countTrailingZerosConst a b → Int #

FromJSON a ⇒ FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Const a b) #

parseJSONList ∷ Value → Parser [Const a b] #

ToJSON a ⇒ ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONConst a b → Value #

toEncodingConst a b → Encoding #

toJSONList ∷ [Const a b] → Value #

toEncodingList ∷ [Const a b] → Encoding #

Serialise a ⇒ Serialise (Const a b) 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeConst a b → Encoding

decode ∷ Decoder s (Const a b)

encodeList ∷ [Const a b] → Encoding

decodeList ∷ Decoder s [Const a b]

(ToJSON a, ToJSONKey a) ⇒ ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey ∷ ToJSONKeyFunction (Const a b)

toJSONKeyList ∷ ToJSONKeyFunction [Const a b]

(FromJSON a, FromJSONKey a) ⇒ FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey ∷ FromJSONKeyFunction (Const a b)

fromJSONKeyList ∷ FromJSONKeyFunction [Const a b]

ToField a ⇒ ToField (Const a b) 
Instance details

Defined in Data.Csv.Conversion

Methods

toFieldConst a b → Field

Pretty a ⇒ Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyConst a b → Doc ann

prettyList ∷ [Const a b] → Doc ann

Hashable a ⇒ Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntConst a b → Int

hashConst a b → Int

Unbox a ⇒ Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Prim a ⇒ Prim (Const a b) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf#Const a b → Int#

alignment#Const a b → Int#

indexByteArray#ByteArray#Int#Const a b

readByteArray#MutableByteArray# s → Int#State# s → (# State# s, Const a b #)

writeByteArray#MutableByteArray# s → Int#Const a b → State# s → State# s

setByteArray#MutableByteArray# s → Int#Int#Const a b → State# s → State# s

indexOffAddr#Addr#Int#Const a b

readOffAddr#Addr#Int#State# s → (# State# s, Const a b #)

writeOffAddr#Addr#Int#Const a b → State# s → State# s

setOffAddr#Addr#Int#Int#Const a b → State# s → State# s

FromHttpApiData a ⇒ FromHttpApiData (Const a b) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a ⇒ ToHttpApiData (Const a b) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

toUrlPieceConst a b → Text

toEncodedUrlPieceConst a b → Builder

toHeaderConst a b → ByteString

toQueryParamConst a b → Text

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x)

Methods

_Wrapped' ∷ Iso' (Const a x) (Unwrapped (Const a x))

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m0 ⇒ (Element (Const m a) → m0) → Const m a → m0

ofoldr ∷ (Element (Const m a) → b → b) → b → Const m a → b

ofoldl' ∷ (a0 → Element (Const m a) → a0) → a0 → Const m a → a0

otoListConst m a → [Element (Const m a)]

oall ∷ (Element (Const m a) → Bool) → Const m a → Bool

oany ∷ (Element (Const m a) → Bool) → Const m a → Bool

onullConst m a → Bool

olengthConst m a → Int

olength64Const m a → Int64

ocompareLengthIntegral i ⇒ Const m a → i → Ordering

otraverse_Applicative f ⇒ (Element (Const m a) → f b) → Const m a → f ()

ofor_Applicative f ⇒ Const m a → (Element (Const m a) → f b) → f ()

omapM_Applicative m0 ⇒ (Element (Const m a) → m0 ()) → Const m a → m0 ()

oforM_Applicative m0 ⇒ Const m a → (Element (Const m a) → m0 ()) → m0 ()

ofoldlMMonad m0 ⇒ (a0 → Element (Const m a) → m0 a0) → a0 → Const m a → m0 a0

ofoldMap1ExSemigroup m0 ⇒ (Element (Const m a) → m0) → Const m a → m0

ofoldr1Ex ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a)

ofoldl1Ex' ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a)

headExConst m a → Element (Const m a)

lastExConst m a → Element (Const m a)

unsafeHeadConst m a → Element (Const m a)

unsafeLastConst m a → Element (Const m a)

maximumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a)

minimumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a)

oelem ∷ Element (Const m a) → Const m a → Bool

onotElem ∷ Element (Const m a) → Const m a → Bool

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Const m a) → f (Element (Const m a))) → Const m a → f (Const m a)

omapMApplicative m0 ⇒ (Element (Const m a) → m0 (Element (Const m a))) → Const m a → m0 (Const m a)

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Const m a) → Element (Const m a)) → Const m a → Const m a

Monoid m ⇒ MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint ∷ Element (Const m a) → Const m a

FromField a ⇒ FromField (Const a b) 
Instance details

Defined in Data.Csv.Conversion

Methods

parseField ∷ Field → Parser (Const a b)

FromFormKey a ⇒ FromFormKey (Const a b) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

parseFormKeyTextEither Text (Const a b)

ToFormKey a ⇒ ToFormKey (Const a b) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyConst a b → Text

FromField a ⇒ FromField (Const a b) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField ∷ FieldParser (Const a b)

ToField a ⇒ ToField (Const a b) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldConst a b → Action

t ~ Const a' x' ⇒ Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

type AllB (c ∷ k → Constraint) (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

type AllB (c ∷ k → Constraint) (Const a ∷ (k → Type) → Type) = ()
type Rep1 (Const a ∷ k → Type) 
Instance details

Defined in Data.Functor.Const

type Rep1 (Const a ∷ k → Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype MVector s (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Const a b) = MV_Const (MVector s a)
type Rep (Const a b) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a
type Code (Const a b) 
Instance details

Defined in Generics.SOP.Instances

type Code (Const a b) = '['[a]]
type DatatypeInfoOf (Const a b) 
Instance details

Defined in Generics.SOP.Instances

type DatatypeInfoOf (Const a b) = 'Newtype "Data.Functor.Const" "Const" ('Record "Const" '['FieldInfo "getConst"])

findFoldable t ⇒ (a → Bool) → t a → Maybe a #

The find function takes a predicate and a structure and returns the leftmost element of the structure matching the predicate, or Nothing if there is no such element.

minimumByFoldable t ⇒ (a → a → Ordering) → t a → a #

The least element of a non-empty structure with respect to the given comparison function.

maximumByFoldable t ⇒ (a → a → Ordering) → t a → a #

The largest element of a non-empty structure with respect to the given comparison function.

forM_ ∷ (Foldable t, Monad m) ⇒ t a → (a → m b) → m () #

forM_ is mapM_ with its arguments flipped. For a version that doesn't ignore the results see forM.

As of base 4.8.0.0, forM_ is just for_, specialized to Monad.

sortBy ∷ (a → a → Ordering) → [a] → [a] #

The sortBy function is the non-overloaded version of sort.

>>> sortBy (\(a,_) (b,_) -> compare a b) [(2, "world"), (4, "!"), (1, "Hello")]
[(1,"Hello"),(2,"world"),(4,"!")]

fromRight ∷ b → Either a b → b #

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

Examples

Expand

Basic usage:

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

Since: base-4.10.0.0

data Proxy (t ∷ k) #

Proxy is a type that holds no data, but has a phantom parameter of arbitrary type (or even kind). Its use is to provide type information, even though there is no value available of that type (or it may be too costly to create one).

Historically, Proxy :: Proxy a is a safer alternative to the undefined :: a idiom.

>>> Proxy :: Proxy (Void, Int -> Int)
Proxy

Proxy can even hold types of higher kinds,

>>> Proxy :: Proxy Either
Proxy
>>> Proxy :: Proxy Functor
Proxy
>>> Proxy :: Proxy complicatedStructure
Proxy

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy ∷ k → Type)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy ∷ k → Type #

Methods

from1 ∷ ∀ (a ∷ k0). Proxy a → Rep1 Proxy a #

to1 ∷ ∀ (a ∷ k0). Rep1 Proxy a → Proxy a #

ConstraintsB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

Associated Types

type AllB c Proxy

Methods

baddDicts ∷ ∀ (c ∷ k0 → Constraint) (f ∷ k0 → Type). AllB c ProxyProxy f → Proxy (Product (Dict c) f)

FunctorB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap ∷ (∀ (a ∷ k0). f a → g a) → Proxy f → Proxy g

ApplicativeB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ApplicativeB

Methods

bpure ∷ (∀ (a ∷ k0). f a) → Proxy f

bprod ∷ ∀ (f ∷ k0 → Type) (g ∷ k0 → Type). Proxy f → Proxy g → Proxy (Product f g)

TraversableB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.TraversableB

Methods

btraverseApplicative e ⇒ (∀ (a ∷ k0). f a → e (g a)) → Proxy f → e (Proxy g)

DistributiveB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.DistributiveB

Methods

bdistribute ∷ ∀ f (g ∷ k0 → Type). Functor f ⇒ f (Proxy g) → Proxy (Compose f g)

FoldableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Proxy a → m

ifoldMap'Monoid m ⇒ (Void → a → m) → Proxy a → m

ifoldr ∷ (Void → a → b → b) → b → Proxy a → b

ifoldl ∷ (Void → b → a → b) → b → Proxy a → b

ifoldr' ∷ (Void → a → b → b) → b → Proxy a → b

ifoldl' ∷ (Void → b → a → b) → b → Proxy a → b

FunctorWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Proxy a → Proxy b

TraversableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Proxy a → f (Proxy b)

FilterableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (Void → a → Maybe b) → Proxy a → Proxy b

ifilter ∷ (Void → a → Bool) → Proxy a → Proxy a

WitherableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (Void → a → f (Maybe b)) → Proxy a → f (Proxy b) #

iwitherMMonad m ⇒ (Void → a → m (Maybe b)) → Proxy a → m (Proxy b)

ifilterAApplicative f ⇒ (Void → a → f Bool) → Proxy a → f (Proxy a)

Monad (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=)Proxy a → (a → Proxy b) → Proxy b #

(>>)Proxy a → Proxy b → Proxy b #

return ∷ a → Proxy a #

Functor (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap ∷ (a → b) → Proxy a → Proxy b #

(<$) ∷ a → Proxy b → Proxy a #

Applicative (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure ∷ a → Proxy a #

(<*>)Proxy (a → b) → Proxy a → Proxy b #

liftA2 ∷ (a → b → c) → Proxy a → Proxy b → Proxy c #

(*>)Proxy a → Proxy b → Proxy b #

(<*)Proxy a → Proxy b → Proxy a #

Foldable (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

foldMonoid m ⇒ Proxy m → m #

foldMapMonoid m ⇒ (a → m) → Proxy a → m #

foldMap'Monoid m ⇒ (a → m) → Proxy a → m #

foldr ∷ (a → b → b) → b → Proxy a → b #

foldr' ∷ (a → b → b) → b → Proxy a → b #

foldl ∷ (b → a → b) → b → Proxy a → b #

foldl' ∷ (b → a → b) → b → Proxy a → b #

foldr1 ∷ (a → a → a) → Proxy a → a #

foldl1 ∷ (a → a → a) → Proxy a → a #

toListProxy a → [a] #

nullProxy a → Bool #

lengthProxy a → Int #

elemEq a ⇒ a → Proxy a → Bool #

maximumOrd a ⇒ Proxy a → a #

minimumOrd a ⇒ Proxy a → a #

sumNum a ⇒ Proxy a → a #

productNum a ⇒ Proxy a → a #

Traversable (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Traversable

Methods

traverseApplicative f ⇒ (a → f b) → Proxy a → f (Proxy b) #

sequenceAApplicative f ⇒ Proxy (f a) → f (Proxy a) #

mapMMonad m ⇒ (a → m b) → Proxy a → m (Proxy b) #

sequenceMonad m ⇒ Proxy (m a) → m (Proxy a) #

Contravariant (ProxyTypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a → b) → Proxy b → Proxy a #

(>$) ∷ b → Proxy b → Proxy a #

Eq1 (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq ∷ (a → b → Bool) → Proxy a → Proxy b → Bool #

Ord1 (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare ∷ (a → b → Ordering) → Proxy a → Proxy b → Ordering #

Read1 (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec ∷ (IntReadS a) → ReadS [a] → IntReadS (Proxy a) #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Proxy a] #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Proxy a) #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Proxy a] #

Show1 (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntProxy a → ShowS #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Proxy a] → ShowS #

Alternative (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

emptyProxy a #

(<|>)Proxy a → Proxy a → Proxy a #

someProxy a → Proxy [a] #

manyProxy a → Proxy [a] #

MonadPlus (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzeroProxy a #

mplusProxy a → Proxy a → Proxy a #

Hashable1 (ProxyTypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntProxy a → Int

FromJSON1 (ProxyTypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Proxy a)

liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Proxy a]

ToJSON1 (ProxyTypeType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Proxy a → Value

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Proxy a] → Value

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Proxy a → Encoding

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Proxy a] → Encoding

Filterable (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Proxy a → Proxy b #

catMaybesProxy (Maybe a) → Proxy a #

filter ∷ (a → Bool) → Proxy a → Proxy a

Witherable (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Proxy a → f (Proxy b) #

witherMMonad m ⇒ (a → m (Maybe b)) → Proxy a → m (Proxy b)

filterAApplicative f ⇒ (a → f Bool) → Proxy a → f (Proxy a)

witherMapApplicative m ⇒ (Proxy b → r) → (a → m (Maybe b)) → Proxy a → m r

Representable (ProxyTypeType) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy

Methods

tabulate ∷ (Rep Proxy → a) → Proxy a

indexProxy a → Rep Proxy → a

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

minBoundProxy t #

maxBoundProxy t #

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succProxy s → Proxy s #

predProxy s → Proxy s #

toEnumIntProxy s #

fromEnumProxy s → Int #

enumFromProxy s → [Proxy s] #

enumFromThenProxy s → Proxy s → [Proxy s] #

enumFromToProxy s → Proxy s → [Proxy s] #

enumFromThenToProxy s → Proxy s → Proxy s → [Proxy s] #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==)Proxy s → Proxy s → Bool #

(/=)Proxy s → Proxy s → Bool #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compareProxy s → Proxy s → Ordering #

(<)Proxy s → Proxy s → Bool #

(<=)Proxy s → Proxy s → Bool #

(>)Proxy s → Proxy s → Bool #

(>=)Proxy s → Proxy s → Bool #

maxProxy s → Proxy s → Proxy s #

minProxy s → Proxy s → Proxy s #

Read (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Show (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

showsPrecIntProxy s → ShowS #

showProxy s → String #

showList ∷ [Proxy s] → ShowS #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range ∷ (Proxy s, Proxy s) → [Proxy s] #

index ∷ (Proxy s, Proxy s) → Proxy s → Int #

unsafeIndex ∷ (Proxy s, Proxy s) → Proxy s → Int #

inRange ∷ (Proxy s, Proxy s) → Proxy s → Bool #

rangeSize ∷ (Proxy s, Proxy s) → Int #

unsafeRangeSize ∷ (Proxy s, Proxy s) → Int #

Generic (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) ∷ TypeType #

Methods

fromProxy t → Rep (Proxy t) x #

toRep (Proxy t) x → Proxy t #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>)Proxy s → Proxy s → Proxy s #

sconcatNonEmpty (Proxy s) → Proxy s #

stimesIntegral b ⇒ b → Proxy s → Proxy s #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

memptyProxy s #

mappendProxy s → Proxy s → Proxy s #

mconcat ∷ [Proxy s] → Proxy s #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Proxy a) #

parseJSONList ∷ Value → Parser [Proxy a] #

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONProxy a → Value #

toEncodingProxy a → Encoding #

toJSONList ∷ [Proxy a] → Value #

toEncodingList ∷ [Proxy a] → Encoding #

Serialise (Proxy a) 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeProxy a → Encoding

decode ∷ Decoder s (Proxy a)

encodeList ∷ [Proxy a] → Encoding

decodeList ∷ Decoder s [Proxy a]

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntProxy a → Int

hashProxy a → Int

MonoFoldable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Proxy a) → m) → Proxy a → m

ofoldr ∷ (Element (Proxy a) → b → b) → b → Proxy a → b

ofoldl' ∷ (a0 → Element (Proxy a) → a0) → a0 → Proxy a → a0

otoListProxy a → [Element (Proxy a)]

oall ∷ (Element (Proxy a) → Bool) → Proxy a → Bool

oany ∷ (Element (Proxy a) → Bool) → Proxy a → Bool

onullProxy a → Bool

olengthProxy a → Int

olength64Proxy a → Int64

ocompareLengthIntegral i ⇒ Proxy a → i → Ordering

otraverse_Applicative f ⇒ (Element (Proxy a) → f b) → Proxy a → f ()

ofor_Applicative f ⇒ Proxy a → (Element (Proxy a) → f b) → f ()

omapM_Applicative m ⇒ (Element (Proxy a) → m ()) → Proxy a → m ()

oforM_Applicative m ⇒ Proxy a → (Element (Proxy a) → m ()) → m ()

ofoldlMMonad m ⇒ (a0 → Element (Proxy a) → m a0) → a0 → Proxy a → m a0

ofoldMap1ExSemigroup m ⇒ (Element (Proxy a) → m) → Proxy a → m

ofoldr1Ex ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a)

ofoldl1Ex' ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a)

headExProxy a → Element (Proxy a)

lastExProxy a → Element (Proxy a)

unsafeHeadProxy a → Element (Proxy a)

unsafeLastProxy a → Element (Proxy a)

maximumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a)

minimumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a)

oelem ∷ Element (Proxy a) → Proxy a → Bool

onotElem ∷ Element (Proxy a) → Proxy a → Bool

MonoTraversable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Proxy a) → f (Element (Proxy a))) → Proxy a → f (Proxy a)

omapMApplicative m ⇒ (Element (Proxy a) → m (Element (Proxy a))) → Proxy a → m (Proxy a)

MonoFunctor (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Proxy a) → Element (Proxy a)) → Proxy a → Proxy a

MonoPointed (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint ∷ Element (Proxy a) → Proxy a

type AllB (c ∷ k → Constraint) (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

type AllB (c ∷ k → Constraint) (Proxy ∷ (k → Type) → Type) = ()
type Rep1 (Proxy ∷ k → Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Proxy ∷ k → Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 ∷ k → Type))
type Rep (ProxyTypeType) 
Instance details

Defined in Data.Functor.Rep

type Rep (ProxyTypeType) = Void
type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1TypeType))
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a
type Code (Proxy t) 
Instance details

Defined in Generics.SOP.Instances

type Code (Proxy t) = '['[] ∷ [Type]]
type DatatypeInfoOf (Proxy t) 
Instance details

Defined in Generics.SOP.Instances

type DatatypeInfoOf (Proxy t) = 'ADT "Data.Proxy" "Proxy" '['Constructor "Proxy"] '['[] ∷ [StrictnessInfo]]

data (a ∷ k) :~: (b ∷ k) where infix 4 #

Propositional equality. If a :~: b is inhabited by some terminating value, then the type a is the same as the type b. To use this equality in practice, pattern-match on the a :~: b to get out the Refl constructor; in the body of the pattern-match, the compiler knows that a ~ b.

Since: base-4.7.0.0

Constructors

Refl ∷ ∀ k (a ∷ k). a :~: a 

Instances

Instances details
TestEquality ((:~:) a ∷ k → Type)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

testEquality ∷ ∀ (a0 ∷ k0) (b ∷ k0). (a :~: a0) → (a :~: b) → Maybe (a0 :~: b) #

GShow ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

gshowsPrec ∷ ∀ (a0 ∷ k0). Int → (a :~: a0) → ShowS

GEq ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

geq ∷ ∀ (a0 ∷ k0) (b ∷ k0). (a :~: a0) → (a :~: b) → Maybe (a0 :~: b)

GCompare ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

gcompare ∷ ∀ (a0 ∷ k0) (b ∷ k0). (a :~: a0) → (a :~: b) → GOrdering a0 b

GRead ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

greadsPrecInt → GReadS ((:~:) a)

a ~ b ⇒ Bounded (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound ∷ a :~: b #

maxBound ∷ a :~: b #

a ~ b ⇒ Enum (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

succ ∷ (a :~: b) → a :~: b #

pred ∷ (a :~: b) → a :~: b #

toEnumInt → a :~: b #

fromEnum ∷ (a :~: b) → Int #

enumFrom ∷ (a :~: b) → [a :~: b] #

enumFromThen ∷ (a :~: b) → (a :~: b) → [a :~: b] #

enumFromTo ∷ (a :~: b) → (a :~: b) → [a :~: b] #

enumFromThenTo ∷ (a :~: b) → (a :~: b) → (a :~: b) → [a :~: b] #

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) ∷ (a :~: b) → (a :~: b) → Bool #

(/=) ∷ (a :~: b) → (a :~: b) → Bool #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare ∷ (a :~: b) → (a :~: b) → Ordering #

(<) ∷ (a :~: b) → (a :~: b) → Bool #

(<=) ∷ (a :~: b) → (a :~: b) → Bool #

(>) ∷ (a :~: b) → (a :~: b) → Bool #

(>=) ∷ (a :~: b) → (a :~: b) → Bool #

max ∷ (a :~: b) → (a :~: b) → a :~: b #

min ∷ (a :~: b) → (a :~: b) → a :~: b #

a ~ b ⇒ Read (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

readsPrecIntReadS (a :~: b) #

readListReadS [a :~: b] #

readPrecReadPrec (a :~: b) #

readListPrecReadPrec [a :~: b] #

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrecInt → (a :~: b) → ShowS #

show ∷ (a :~: b) → String #

showList ∷ [a :~: b] → ShowS #

isAlphaNumCharBool #

Selects alphabetic or numeric Unicode characters.

Note that numeric digits outside the ASCII range, as well as numeric characters which aren't digits, are selected by this function but not by isDigit. Such characters may be part of identifiers but are not used by the printer and reader to represent numbers.

isHexDigitCharBool #

Selects ASCII hexadecimal digits, i.e. '0'..'9', 'a'..'f', 'A'..'F'.

fromMaybe ∷ a → Maybe a → a #

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

Examples

Expand

Basic usage:

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

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

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

isJustMaybe a → Bool #

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

Examples

Expand

Basic usage:

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

Only the outer constructor is taken into consideration:

>>> isJust (Just Nothing)
True

on ∷ (b → b → c) → (a → b) → a → a → c infixl 0 #

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

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

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

Algebraic properties:

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

voidFunctor f ⇒ f a → f () #

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

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

do as
   pure ()

with an inferred Functor constraint.

Examples

Expand

Replace the contents of a Maybe Int with unit:

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

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

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

Replace every element of a list with unit:

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

Replace the second element of a pair with unit:

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

Discard the result of an IO action:

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

apMonad m ⇒ m (a → b) → m a → m b #

In many situations, the liftM operations can be replaced by uses of ap, which promotes function application.

return f `ap` x1 `ap` ... `ap` xn

is equivalent to

liftMn f x1 x2 ... xn

whenApplicative f ⇒ Bool → f () → f () #

Conditional execution of Applicative expressions. For example,

when debug (putStrLn "Debugging")

will output the string Debugging if the Boolean value debug is True, and otherwise do nothing.

type HasCallStack = ?callStack ∷ CallStack #

Request a CallStack.

NOTE: The implicit parameter ?callStack :: CallStack is an implementation detail and should not be considered part of the CallStack API, we may decide to change the implementation in the future.

Since: base-4.9.0.0

data Map k a #

A Map from keys k to values a.

The Semigroup operation for Map is union, which prefers values from the left operand. If m1 maps a key k to a value a1, and m2 maps the same key to a different value a2, then their union m1 <> m2 maps k to a1.

Instances

Instances details
Bifoldable Map

Since: containers-0.6.3.1

Instance details

Defined in Data.Map.Internal

Methods

bifoldMonoid m ⇒ Map m m → m #

bifoldMapMonoid m ⇒ (a → m) → (b → m) → Map a b → m #

bifoldr ∷ (a → c → c) → (b → c → c) → c → Map a b → c #

bifoldl ∷ (c → a → c) → (c → b → c) → c → Map a b → c #

Eq2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq2 ∷ (a → b → Bool) → (c → d → Bool) → Map a c → Map b d → Bool #

Ord2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare2 ∷ (a → b → Ordering) → (c → d → Ordering) → Map a c → Map b d → Ordering #

Show2 Map

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → IntMap a b → ShowS #

liftShowList2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → [Map a b] → ShowS #

BiPolyMap Map 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint Map key

Methods

mapKeysWith ∷ (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) ⇒ (v → v → v) → (k1 → k2) → Map k1 v → Map k2 v

Hashable2 Map 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 ∷ (Int → a → Int) → (Int → b → Int) → IntMap a b → Int

(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (Tx era) (Map (ScriptHash c) script) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ Tx era → Map (ScriptHash c) script #

(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (WitnessSet era) (Map (ScriptHash c) script) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ WitnessSet era → Map (ScriptHash c) script #

(c ~ Crypto era, script ~ Script era) ⇒ HasField "scriptWits" (ValidatedTx era) (Map (ScriptHash c) script) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

getField ∷ ValidatedTx era → Map (ScriptHash c) script #

(Script era ~ script, Crypto era ~ crypto) ⇒ HasField "scriptWits" (TxWitness era) (Map (ScriptHash crypto) script) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Methods

getField ∷ TxWitness era → Map (ScriptHash crypto) script #

c ~ Crypto era ⇒ HasField "txdatahash" (ValidatedTx era) (Map (DataHash c) (Data era)) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

getField ∷ ValidatedTx era → Map (DataHash c) (Data era) #

(Script era ~ script, Crypto era ~ crypto) ⇒ HasField "txscripts" (TxWitness era) (Map (ScriptHash crypto) script) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Methods

getField ∷ TxWitness era → Map (ScriptHash crypto) script #

FoldableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (k → a → m) → Map k a → m

ifoldMap'Monoid m ⇒ (k → a → m) → Map k a → m

ifoldr ∷ (k → a → b → b) → b → Map k a → b

ifoldl ∷ (k → b → a → b) → b → Map k a → b

ifoldr' ∷ (k → a → b → b) → b → Map k a → b

ifoldl' ∷ (k → b → a → b) → b → Map k a → b

FunctorWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

imap ∷ (k → a → b) → Map k a → Map k b

TraversableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (k → a → f b) → Map k a → f (Map k b)

FilterableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (k → a → Maybe b) → Map k a → Map k b

ifilter ∷ (k → a → Bool) → Map k a → Map k a

WitherableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (k → a → f (Maybe b)) → Map k a → f (Map k b) #

iwitherMMonad m ⇒ (k → a → m (Maybe b)) → Map k a → m (Map k b)

ifilterAApplicative f ⇒ (k → a → f Bool) → Map k a → f (Map k a)

Ord k ⇒ Indexable k (Map k v) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

indexOf ∷ k → Map k v → StrictMaybe Word64

fromIndexWord64Map k v → StrictMaybe k

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap ∷ (a → b) → Map k a → Map k b #

(<$) ∷ a → Map k b → Map k a #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

foldMonoid m ⇒ Map k m → m #

foldMapMonoid m ⇒ (a → m) → Map k a → m #

foldMap'Monoid m ⇒ (a → m) → Map k a → m #

foldr ∷ (a → b → b) → b → Map k a → b #

foldr' ∷ (a → b → b) → b → Map k a → b #

foldl ∷ (b → a → b) → b → Map k a → b #

foldl' ∷ (b → a → b) → b → Map k a → b #

foldr1 ∷ (a → a → a) → Map k a → a #

foldl1 ∷ (a → a → a) → Map k a → a #

toListMap k a → [a] #

nullMap k a → Bool #

lengthMap k a → Int #

elemEq a ⇒ a → Map k a → Bool #

maximumOrd a ⇒ Map k a → a #

minimumOrd a ⇒ Map k a → a #

sumNum a ⇒ Map k a → a #

productNum a ⇒ Map k a → a #

Traversable (Map k)

Traverses in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

traverseApplicative f ⇒ (a → f b) → Map k a → f (Map k b) #

sequenceAApplicative f ⇒ Map k (f a) → f (Map k a) #

mapMMonad m ⇒ (a → m b) → Map k a → m (Map k b) #

sequenceMonad m ⇒ Map k (m a) → m (Map k a) #

Eq k ⇒ Eq1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftEq ∷ (a → b → Bool) → Map k a → Map k b → Bool #

Ord k ⇒ Ord1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftCompare ∷ (a → b → Ordering) → Map k a → Map k b → Ordering #

(Ord k, Read k) ⇒ Read1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftReadsPrec ∷ (IntReadS a) → ReadS [a] → IntReadS (Map k a) #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Map k a] #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Map k a) #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Map k a] #

Show k ⇒ Show1 (Map k)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntMap k a → ShowS #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Map k a] → ShowS #

Hashable k ⇒ Hashable1 (Map k) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntMap k a → Int

(FromJSONKey k, Ord k) ⇒ FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Map k a)

liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Map k a]

ToJSONKey k ⇒ ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Map k a → Value

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Map k a] → Value

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Map k a → Encoding

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Map k a] → Encoding

Filterable (Map k) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Map k a → Map k b #

catMaybesMap k (Maybe a) → Map k a #

filter ∷ (a → Bool) → Map k a → Map k a

Witherable (Map k) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Map k a → f (Map k b) #

witherMMonad m ⇒ (a → m (Maybe b)) → Map k a → m (Map k b)

filterAApplicative f ⇒ (a → f Bool) → Map k a → f (Map k a)

witherMapApplicative m ⇒ (Map k b → r) → (a → m (Maybe b)) → Map k a → m r

Ord key ⇒ PolyMap (Map key) 
Instance details

Defined in Data.Containers

Methods

differenceMapMap key value1 → Map key value2 → Map key value1

intersectionMapMap key value1 → Map key value2 → Map key value1

intersectionWithMap ∷ (value1 → value2 → value3) → Map key value1 → Map key value2 → Map key value3

Embed (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Methods

toBase ∷ PoolDistr crypto → Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)

fromBaseMap (KeyHash 'StakePool crypto) (IndividualPoolStake crypto) → PoolDistr crypto

Embed (StakeCreds era) (Map (Credential 'Staking era) SlotNo) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toBase ∷ StakeCreds era → Map (Credential 'Staking era) SlotNo

fromBaseMap (Credential 'Staking era) SlotNo → StakeCreds era

HasExp (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Methods

toExp ∷ PoolDistr crypto → Exp (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto))

HasExp (StakeCreds era) (Map (Credential 'Staking era) SlotNo) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toExp ∷ StakeCreds era → Exp (Map (Credential 'Staking era) SlotNo)

Ord k ⇒ IsList (Map k v)

Since: containers-0.5.6.2

Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) #

Methods

fromList ∷ [Item (Map k v)] → Map k v #

fromListNInt → [Item (Map k v)] → Map k v #

toListMap k v → [Item (Map k v)] #

(Eq k, Eq a) ⇒ Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==)Map k a → Map k a → Bool #

(/=)Map k a → Map k a → Bool #

(Data k, Data a, Ord k) ⇒ Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Map k a → c (Map k a) #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Map k a) #

toConstrMap k a → Constr #

dataTypeOfMap k a → DataType #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Map k a)) #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Map k a)) #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Map k a → Map k a #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Map k a → [u] #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Map k a → u #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) #

(Ord k, Ord v) ⇒ Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compareMap k v → Map k v → Ordering #

(<)Map k v → Map k v → Bool #

(<=)Map k v → Map k v → Bool #

(>)Map k v → Map k v → Bool #

(>=)Map k v → Map k v → Bool #

maxMap k v → Map k v → Map k v #

minMap k v → Map k v → Map k v #

(Ord k, Read k, Read e) ⇒ Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrecIntReadS (Map k e) #

readListReadS [Map k e] #

readPrecReadPrec (Map k e) #

readListPrecReadPrec [Map k e] #

(Show k, Show a) ⇒ Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrecIntMap k a → ShowS #

showMap k a → String #

showList ∷ [Map k a] → ShowS #

Ord k ⇒ Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>)Map k v → Map k v → Map k v #

sconcatNonEmpty (Map k v) → Map k v #

stimesIntegral b ⇒ b → Map k v → Map k v #

Ord k ⇒ Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

memptyMap k v #

mappendMap k v → Map k v → Map k v #

mconcat ∷ [Map k v] → Map k v #

(NFData k, NFData a) ⇒ NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnfMap k a → () #

(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Map k v) #

parseJSONList ∷ Value → Parser [Map k v] #

(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMap k v → Value #

toEncodingMap k v → Encoding #

toJSONList ∷ [Map k v] → Value #

toEncodingList ∷ [Map k v] → Encoding #

(Ord k, FromCBOR k, FromCBOR v) ⇒ FromCBOR (Map k v) 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR ∷ Decoder s (Map k v)

labelProxy (Map k v) → Text

(Ord k, ToCBOR k, ToCBOR v) ⇒ ToCBOR (Map k v) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORMap k v → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Map k v) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Map k v] → Size

(NoThunks k, NoThunks v) ⇒ NoThunks (Map k v) 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → Map k v → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → Map k v → IO (Maybe ThunkInfo)

showTypeOfProxy (Map k v) → String

(Ord k, Serialise k, Serialise v) ⇒ Serialise (Map k v) 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeMap k v → Encoding

decode ∷ Decoder s (Map k v)

encodeList ∷ [Map k v] → Encoding

decodeList ∷ Decoder s [Map k v]

(Ord k, FromCBOR k, FromCBOR v) ⇒ FromSharedCBOR (Map k v) 
Instance details

Defined in Data.Sharing

Associated Types

type Share (Map k v)

Methods

getShareMap k v → Share (Map k v)

fromSharedCBOR ∷ Share (Map k v) → Decoder s (Map k v)

fromSharedPlusCBORStateT (Share (Map k v)) (Decoder s) (Map k v)

(Hashable k, Hashable v) ⇒ Hashable (Map k v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntMap k v → Int

hashMap k v → Int

(Structured k, Structured v) ⇒ Structured (Map k v) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structureProxy (Map k v) → Structure

structureHash' ∷ Tagged (Map k v) MD5

Ord k ⇒ At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

at ∷ Index (Map k a) → Lens' (Map k a) (Maybe (IxValue (Map k a)))

Ord k ⇒ Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ix ∷ Index (Map k a) → Traversal' (Map k a) (IxValue (Map k a))

Ord k ⇒ Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a)

Methods

_Wrapped' ∷ Iso' (Map k a) (Unwrapped (Map k a))

Ord k ⇒ HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v)

Methods

keysSetMap k v → KeySet (Map k v)

Ord key ⇒ IsMap (Map key value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (Map key value)

Methods

lookup ∷ ContainerKey (Map key value) → Map key value → Maybe (MapValue (Map key value))

insertMap ∷ ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value

deleteMap ∷ ContainerKey (Map key value) → Map key value → Map key value

singletonMap ∷ ContainerKey (Map key value) → MapValue (Map key value) → Map key value

mapFromList ∷ [(ContainerKey (Map key value), MapValue (Map key value))] → Map key value

mapToListMap key value → [(ContainerKey (Map key value), MapValue (Map key value))]

findWithDefault ∷ MapValue (Map key value) → ContainerKey (Map key value) → Map key value → MapValue (Map key value)

insertWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value

insertWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value

insertLookupWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → (Maybe (MapValue (Map key value)), Map key value)

adjustMap ∷ (MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value

adjustWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value

updateMap ∷ (MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value

updateWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value

updateLookupWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → (Maybe (MapValue (Map key value)), Map key value)

alterMap ∷ (Maybe (MapValue (Map key value)) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value

unionWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value → Map key value

unionWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value → Map key value

unionsWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → [Map key value] → Map key value

mapWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value

omapKeysWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → (ContainerKey (Map key value) → ContainerKey (Map key value)) → Map key value → Map key value

filterMap ∷ (MapValue (Map key value) → Bool) → Map key value → Map key value

Ord k ⇒ SetContainer (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Map k v)

Methods

member ∷ ContainerKey (Map k v) → Map k v → Bool

notMember ∷ ContainerKey (Map k v) → Map k v → Bool

unionMap k v → Map k v → Map k v

unions ∷ (MonoFoldable mono, Element mono ~ Map k v) ⇒ mono → Map k v

differenceMap k v → Map k v → Map k v

intersectionMap k v → Map k v → Map k v

keysMap k v → [ContainerKey (Map k v)]

MonoFoldable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Map k v) → m) → Map k v → m

ofoldr ∷ (Element (Map k v) → b → b) → b → Map k v → b

ofoldl' ∷ (a → Element (Map k v) → a) → a → Map k v → a

otoListMap k v → [Element (Map k v)]

oall ∷ (Element (Map k v) → Bool) → Map k v → Bool

oany ∷ (Element (Map k v) → Bool) → Map k v → Bool

onullMap k v → Bool

olengthMap k v → Int

olength64Map k v → Int64

ocompareLengthIntegral i ⇒ Map k v → i → Ordering

otraverse_Applicative f ⇒ (Element (Map k v) → f b) → Map k v → f ()

ofor_Applicative f ⇒ Map k v → (Element (Map k v) → f b) → f ()

omapM_Applicative m ⇒ (Element (Map k v) → m ()) → Map k v → m ()

oforM_Applicative m ⇒ Map k v → (Element (Map k v) → m ()) → m ()

ofoldlMMonad m ⇒ (a → Element (Map k v) → m a) → a → Map k v → m a

ofoldMap1ExSemigroup m ⇒ (Element (Map k v) → m) → Map k v → m

ofoldr1Ex ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v)

ofoldl1Ex' ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v)

headExMap k v → Element (Map k v)

lastExMap k v → Element (Map k v)

unsafeHeadMap k v → Element (Map k v)

unsafeLastMap k v → Element (Map k v)

maximumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v)

minimumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v)

oelem ∷ Element (Map k v) → Map k v → Bool

onotElem ∷ Element (Map k v) → Map k v → Bool

MonoTraversable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Map k v) → f (Element (Map k v))) → Map k v → f (Map k v)

omapMApplicative m ⇒ (Element (Map k v) → m (Element (Map k v))) → Map k v → m (Map k v)

MonoFunctor (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Map k v) → Element (Map k v)) → Map k v → Map k v

Ord k ⇒ GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

(Ord k, FromFormKey k, FromHttpApiData v) ⇒ FromForm (Map k [v]) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

fromForm ∷ Form → Either Text (Map k [v])

(ToFormKey k, ToHttpApiData v) ⇒ ToForm (Map k [v]) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormMap k [v] → Form

(FromField a, FromField b, Ord a) ⇒ FromNamedRecord (Map a b) 
Instance details

Defined in Data.Csv.Conversion

Methods

parseNamedRecord ∷ NamedRecord → Parser (Map a b)

(ToField a, ToField b, Ord a) ⇒ ToNamedRecord (Map a b) 
Instance details

Defined in Data.Csv.Conversion

Methods

toNamedRecordMap a b → NamedRecord

(ToJSONKey k, ToSchema k, ToSchema v) ⇒ ToSchema (Map k v) 
Instance details

Defined in Data.Swagger.Internal.Schema

Methods

declareNamedSchemaProxy (Map k v) → Declare (Definitions Schema) NamedSchema

Ord k ⇒ At (Map k a) 
Instance details

Defined in Optics.At.Core

Methods

at ∷ Index (Map k a) → Lens' (Map k a) (Maybe (IxValue (Map k a)))

Ord k ⇒ Ixed (Map k a) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Map k a)

Methods

ix ∷ Index (Map k a) → Optic' (IxKind (Map k a)) NoIx (Map k a) (IxValue (Map k a))

(t ~ Map k' a', Ord k) ⇒ Rewrapped (Map k a) t 
Instance details

Defined in Control.Lens.Wrapped

Ord k ⇒ Rewrapped (Map k a) (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

Ord k ⇒ Rewrapped (MonoidalMap k a) (Map k a) 
Instance details

Defined in Data.Map.Monoidal

Newtype (MonoidalMap k a) (Map k a) 
Instance details

Defined in Data.Map.Monoidal

Methods

packMap k a → MonoidalMap k a

unpack ∷ MonoidalMap k a → Map k a

type BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key
type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Share (Map k v) 
Instance details

Defined in Data.Sharing

type Share (Map k v) = (Interns k, Interns v)
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type Index (Map k a) 
Instance details

Defined in Control.Lens.At

type Index (Map k a) = k
type IxValue (Map k a) 
Instance details

Defined in Control.Lens.At

type IxValue (Map k a) = a
type Unwrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Map k a) = [(k, a)]
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type Index (Map k a) 
Instance details

Defined in Optics.At.Core

type Index (Map k a) = k
type IxValue (Map k a) 
Instance details

Defined in Optics.At.Core

type IxValue (Map k a) = a
type IxKind (Map k a) 
Instance details

Defined in Optics.At.Core

type IxKind (Map k a) = An_AffineTraversal

data Set a #

A set of values a.

Instances

Instances details
Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

foldMonoid m ⇒ Set m → m #

foldMapMonoid m ⇒ (a → m) → Set a → m #

foldMap'Monoid m ⇒ (a → m) → Set a → m #

foldr ∷ (a → b → b) → b → Set a → b #

foldr' ∷ (a → b → b) → b → Set a → b #

foldl ∷ (b → a → b) → b → Set a → b #

foldl' ∷ (b → a → b) → b → Set a → b #

foldr1 ∷ (a → a → a) → Set a → a #

foldl1 ∷ (a → a → a) → Set a → a #

toListSet a → [a] #

nullSet a → Bool #

lengthSet a → Int #

elemEq a ⇒ a → Set a → Bool #

maximumOrd a ⇒ Set a → a #

minimumOrd a ⇒ Set a → a #

sumNum a ⇒ Set a → a #

productNum a ⇒ Set a → a #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq ∷ (a → b → Bool) → Set a → Set b → Bool #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare ∷ (a → b → Ordering) → Set a → Set b → Ordering #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntSet a → ShowS #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Set a] → ShowS #

Hashable1 Set 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntSet a → Int

ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Set a → Value

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Set a] → Value

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Set a → Encoding

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Set a] → Encoding

(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (Tx era) (Set (WitVKey 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ Tx era → Set (WitVKey 'Witness c) #

(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (WitnessSet era) (Set (WitVKey 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ WitnessSet era → Set (WitVKey 'Witness c) #

c ~ Crypto era ⇒ HasField "addrWits" (ValidatedTx era) (Set (WitVKey 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

getField ∷ ValidatedTx era → Set (WitVKey 'Witness c) #

Crypto era ~ crypto ⇒ HasField "addrWits" (TxWitness era) (Set (WitVKey 'Witness crypto)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWitness

Methods

getField ∷ TxWitness era → Set (WitVKey 'Witness crypto) #

(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "bootWits" (Tx era) (Set (BootstrapWitness c)) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Methods

getField ∷ Tx era → Set (BootstrapWitness c) #

c ~ Crypto era ⇒ HasField "bootWits" (ValidatedTx era) (Set (BootstrapWitness c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

getField ∷ ValidatedTx era → Set (BootstrapWitness c) #

Crypto era ~ c ⇒ HasField "collateral" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

Crypto era ~ c ⇒ HasField "collateral" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

Crypto era ~ crypto ⇒ HasField "inputs" (TxBody era) (Set (TxIn crypto)) 
Instance details

Defined in Cardano.Ledger.ShelleyMA.TxBody

Methods

getField ∷ TxBody era → Set (TxIn crypto) #

Crypto era ~ crypto ⇒ HasField "inputs" (TxBody era) (Set (TxIn crypto)) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

getField ∷ TxBody era → Set (TxIn crypto) #

Crypto era ~ c ⇒ HasField "inputs" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

Crypto era ~ c ⇒ HasField "inputs" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

MAClass ma c ⇒ HasField "minted" (TxBody (ShelleyMAEra ma c)) (Set (ScriptHash c)) 
Instance details

Defined in Cardano.Ledger.ShelleyMA

Methods

getField ∷ TxBody (ShelleyMAEra ma c) → Set (ScriptHash c) #

c ~ Crypto era ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

getField ∷ TxBody era → Set (ScriptHash c) #

Crypto era ~ c ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Methods

getField ∷ TxBody era → Set (ScriptHash c) #

Crypto era ~ c ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Methods

getField ∷ TxBody era → Set (ScriptHash c) #

Crypto era ~ crypto ⇒ HasField "referenceInputs" (TxBody era) (Set (TxIn crypto)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Methods

getField ∷ TxBody era → Set (TxIn crypto) #

Crypto era ~ c ⇒ HasField "referenceInputs" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

Crypto era ~ c ⇒ HasField "reqSignerHashes" (TxBody era) (Set (KeyHash 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Methods

getField ∷ TxBody era → Set (KeyHash 'Witness c) #

Crypto era ~ c ⇒ HasField "reqSignerHashes" (TxBody era) (Set (KeyHash 'Witness c)) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Methods

getField ∷ TxBody era → Set (KeyHash 'Witness c) #

c ~ Crypto era ⇒ HasField "txinputs_fee" (TxBody era) (Set (TxIn c)) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

getField ∷ TxBody era → Set (TxIn c) #

Ord k ⇒ Indexable k (Set k) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

indexOf ∷ k → Set k → StrictMaybe Word64

fromIndexWord64Set k → StrictMaybe k

Ord a ⇒ IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) #

Methods

fromList ∷ [Item (Set a)] → Set a #

fromListNInt → [Item (Set a)] → Set a #

toListSet a → [Item (Set a)] #

Eq a ⇒ Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==)Set a → Set a → Bool #

(/=)Set a → Set a → Bool #

(Data a, Ord a) ⇒ Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Set a → c (Set a) #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Set a) #

toConstrSet a → Constr #

dataTypeOfSet a → DataType #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Set a)) #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Set a)) #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Set a → Set a #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Set a → [u] #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Set a → u #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) #

Ord a ⇒ Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compareSet a → Set a → Ordering #

(<)Set a → Set a → Bool #

(<=)Set a → Set a → Bool #

(>)Set a → Set a → Bool #

(>=)Set a → Set a → Bool #

maxSet a → Set a → Set a #

minSet a → Set a → Set a #

(Read a, Ord a) ⇒ Read (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

readsPrecIntReadS (Set a) #

readListReadS [Set a] #

readPrecReadPrec (Set a) #

readListPrecReadPrec [Set a] #

Show a ⇒ Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrecIntSet a → ShowS #

showSet a → String #

showList ∷ [Set a] → ShowS #

Ord a ⇒ Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>)Set a → Set a → Set a #

sconcatNonEmpty (Set a) → Set a #

stimesIntegral b ⇒ b → Set a → Set a #

Ord a ⇒ Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

memptySet a #

mappendSet a → Set a → Set a #

mconcat ∷ [Set a] → Set a #

NFData a ⇒ NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnfSet a → () #

(Ord a, FromJSON a) ⇒ FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Set a) #

parseJSONList ∷ Value → Parser [Set a] #

ToJSON a ⇒ ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONSet a → Value #

toEncodingSet a → Encoding #

toJSONList ∷ [Set a] → Value #

toEncodingList ∷ [Set a] → Encoding #

(Ord a, FromCBOR a) ⇒ FromCBOR (Set a) 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR ∷ Decoder s (Set a)

labelProxy (Set a) → Text

(Ord a, ToCBOR a) ⇒ ToCBOR (Set a) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORSet a → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Set a) → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Set a] → Size

NoThunks a ⇒ NoThunks (Set a) 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → Set a → IO (Maybe ThunkInfo)

wNoThunks ∷ Context → Set a → IO (Maybe ThunkInfo)

showTypeOfProxy (Set a) → String

(Ord a, Serialise a) ⇒ Serialise (Set a) 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeSet a → Encoding

decode ∷ Decoder s (Set a)

encodeList ∷ [Set a] → Encoding

decodeList ∷ Decoder s [Set a]

Hashable v ⇒ Hashable (Set v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntSet v → Int

hashSet v → Int

Structured k ⇒ Structured (Set k) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structureProxy (Set k) → Structure

structureHash' ∷ Tagged (Set k) MD5

Ord k ⇒ At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

at ∷ Index (Set k) → Lens' (Set k) (Maybe (IxValue (Set k)))

Ord a ⇒ Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

contains ∷ Index (Set a) → Lens' (Set a) Bool

Ord k ⇒ Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ix ∷ Index (Set k) → Traversal' (Set k) (IxValue (Set k))

Ord a ⇒ Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a)

Methods

_Wrapped' ∷ Iso' (Set a) (Unwrapped (Set a))

Ord element ⇒ IsSet (Set element) 
Instance details

Defined in Data.Containers

Methods

insertSet ∷ Element (Set element) → Set element → Set element

deleteSet ∷ Element (Set element) → Set element → Set element

singletonSet ∷ Element (Set element) → Set element

setFromList ∷ [Element (Set element)] → Set element

setToListSet element → [Element (Set element)]

filterSet ∷ (Element (Set element) → Bool) → Set element → Set element

Ord element ⇒ SetContainer (Set element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Set element)

Methods

member ∷ ContainerKey (Set element) → Set element → Bool

notMember ∷ ContainerKey (Set element) → Set element → Bool

unionSet element → Set element → Set element

unions ∷ (MonoFoldable mono, Element mono ~ Set element) ⇒ mono → Set element

differenceSet element → Set element → Set element

intersectionSet element → Set element → Set element

keysSet element → [ContainerKey (Set element)]

Ord e ⇒ MonoFoldable (Set e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Set e) → m) → Set e → m

ofoldr ∷ (Element (Set e) → b → b) → b → Set e → b

ofoldl' ∷ (a → Element (Set e) → a) → a → Set e → a

otoListSet e → [Element (Set e)]

oall ∷ (Element (Set e) → Bool) → Set e → Bool

oany ∷ (Element (Set e) → Bool) → Set e → Bool

onullSet e → Bool

olengthSet e → Int

olength64Set e → Int64

ocompareLengthIntegral i ⇒ Set e → i → Ordering

otraverse_Applicative f ⇒ (Element (Set e) → f b) → Set e → f ()

ofor_Applicative f ⇒ Set e → (Element (Set e) → f b) → f ()

omapM_Applicative m ⇒ (Element (Set e) → m ()) → Set e → m ()

oforM_Applicative m ⇒ Set e → (Element (Set e) → m ()) → m ()

ofoldlMMonad m ⇒ (a → Element (Set e) → m a) → a → Set e → m a

ofoldMap1ExSemigroup m ⇒ (Element (Set e) → m) → Set e → m

ofoldr1Ex ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e)

ofoldl1Ex' ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e)

headExSet e → Element (Set e)

lastExSet e → Element (Set e)

unsafeHeadSet e → Element (Set e)

unsafeLastSet e → Element (Set e)

maximumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e)

minimumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e)

oelem ∷ Element (Set e) → Set e → Bool

onotElem ∷ Element (Set e) → Set e → Bool

Ord v ⇒ GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint ∷ Element (Set a) → Set a

ToParamSchema a ⇒ ToParamSchema (Set a) 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Set a) → ParamSchema t

ToSchema a ⇒ ToSchema (Set a) 
Instance details

Defined in Data.Swagger.Internal.Schema

Methods

declareNamedSchemaProxy (Set a) → Declare (Definitions Schema) NamedSchema

Ord k ⇒ At (Set k) 
Instance details

Defined in Optics.At.Core

Methods

at ∷ Index (Set k) → Lens' (Set k) (Maybe (IxValue (Set k)))

Ord k ⇒ Ixed (Set k) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Set k)

Methods

ix ∷ Index (Set k) → Optic' (IxKind (Set k)) NoIx (Set k) (IxValue (Set k))

Ord a ⇒ Contains (Set a) 
Instance details

Defined in Optics.At.Core

Methods

contains ∷ Index (Set a) → Lens' (Set a) Bool

(t ~ Set a', Ord a) ⇒ Rewrapped (Set a) t 
Instance details

Defined in Control.Lens.Wrapped

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type Index (Set a) 
Instance details

Defined in Control.Lens.At

type Index (Set a) = a
type IxValue (Set k) 
Instance details

Defined in Control.Lens.At

type IxValue (Set k) = ()
type Unwrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Set a) = [a]
type Index (Set a) 
Instance details

Defined in Optics.At.Core

type Index (Set a) = a
type IxValue (Set k) 
Instance details

Defined in Optics.At.Core

type IxValue (Set k) = ()
type IxKind (Set k) 
Instance details

Defined in Optics.At.Core

type IxKind (Set k) = An_AffineTraversal

encodeUtf8TextByteString #

Encode text using UTF-8 encoding.

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Text #

parseJSONList ∷ Value → Parser [Text] #

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONText → Value #

toEncodingText → Encoding #

toJSONList ∷ [Text] → Value #

toEncodingList ∷ [Text] → Encoding #

FromCBOR Text 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBOR ∷ Decoder s Text

labelProxy TextText

ToCBOR Text 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORText → Encoding

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Text → Size

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Text] → Size

NoThunks Text 
Instance details

Defined in NoThunks.Class

Methods

noThunks ∷ Context → TextIO (Maybe ThunkInfo)

wNoThunks ∷ Context → TextIO (Maybe ThunkInfo)

showTypeOfProxy TextString

Serialise Text 
Instance details

Defined in Codec.Serialise.Class

Methods

encodeText → Encoding

decode ∷ Decoder s Text

encodeList ∷ [Text] → Encoding

decodeList ∷ Decoder s [Text]

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey ∷ ToJSONKeyFunction Text

toJSONKeyList ∷ ToJSONKeyFunction [Text]

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey ∷ FromJSONKeyFunction Text

fromJSONKeyList ∷ FromJSONKeyFunction [Text]

ToField Text 
Instance details

Defined in Data.Csv.Conversion

Methods

toFieldText → Field

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyText → Doc ann

prettyList ∷ [Text] → Doc ann

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text

type Tokens Text

Methods

tokenToChunkProxy Text → Token Text → Tokens Text

tokensToChunkProxy Text → [Token Text] → Tokens Text

chunkToTokensProxy Text → Tokens Text → [Token Text]

chunkLengthProxy Text → Tokens TextInt

chunkEmptyProxy Text → Tokens TextBool

take1_TextMaybe (Token Text, Text)

takeN_IntTextMaybe (Tokens Text, Text)

takeWhile_ ∷ (Token TextBool) → Text → (Tokens Text, Text)

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntTextInt

hashTextInt

Buildable Text 
Instance details

Defined in Formatting.Buildable

Methods

buildTextBuilder

Structured Text 
Instance details

Defined in Distribution.Utils.Structured

Methods

structureProxy Text → Structure

structureHash' ∷ Tagged Text MD5

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text

Methods

nullChunkTextBool

pappendChunk ∷ State TextText → State Text

atBufferEndText → State Text → Pos

bufferElemAtText → Pos → State TextMaybe (ChunkElem Text, Int)

chunkElemToCharText → ChunkElem TextChar

FromHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

Ixed Text 
Instance details

Defined in Control.Lens.At

Methods

ix ∷ Index Text → Traversal' Text (IxValue Text)

VisualStream Text 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokensProxy TextNonEmpty (Token Text) → String

tokensLengthProxy TextNonEmpty (Token Text) → Int

TraversableStream Text 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffsetInt → PosState Text → (Maybe String, PosState Text)

reachOffsetNoLineInt → PosState Text → PosState Text

MonoZip Text 
Instance details

Defined in Data.Containers

Methods

ozipWith ∷ (Element Text → Element Text → Element Text) → TextTextText

ozipTextText → [(Element Text, Element Text)]

ounzip ∷ [(Element Text, Element Text)] → (Text, Text)

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element Text → m) → Text → m

ofoldr ∷ (Element Text → b → b) → b → Text → b

ofoldl' ∷ (a → Element Text → a) → a → Text → a

otoListText → [Element Text]

oall ∷ (Element TextBool) → TextBool

oany ∷ (Element TextBool) → TextBool

onullTextBool

olengthTextInt

olength64TextInt64

ocompareLengthIntegral i ⇒ Text → i → Ordering

otraverse_Applicative f ⇒ (Element Text → f b) → Text → f ()

ofor_Applicative f ⇒ Text → (Element Text → f b) → f ()

omapM_Applicative m ⇒ (Element Text → m ()) → Text → m ()

oforM_Applicative m ⇒ Text → (Element Text → m ()) → m ()

ofoldlMMonad m ⇒ (a → Element Text → m a) → a → Text → m a

ofoldMap1ExSemigroup m ⇒ (Element Text → m) → Text → m

ofoldr1Ex ∷ (Element Text → Element Text → Element Text) → Text → Element Text

ofoldl1Ex' ∷ (Element Text → Element Text → Element Text) → Text → Element Text

headExText → Element Text

lastExText → Element Text

unsafeHeadText → Element Text

unsafeLastText → Element Text

maximumByEx ∷ (Element Text → Element TextOrdering) → Text → Element Text

minimumByEx ∷ (Element Text → Element TextOrdering) → Text → Element Text

oelem ∷ Element TextTextBool

onotElem ∷ Element TextTextBool

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element Text → f (Element Text)) → Text → f Text

omapMApplicative m ⇒ (Element Text → m (Element Text)) → Text → m Text

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element Text → Element Text) → TextText

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint ∷ Element TextText

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList ∷ [Element Text] → Text

lengthIndexText → Index Text

break ∷ (Element TextBool) → Text → (Text, Text)

span ∷ (Element TextBool) → Text → (Text, Text)

dropWhile ∷ (Element TextBool) → TextText

takeWhile ∷ (Element TextBool) → TextText

splitAt ∷ Index TextText → (Text, Text)

unsafeSplitAt ∷ Index TextText → (Text, Text)

take ∷ Index TextTextText

unsafeTake ∷ Index TextTextText

drop ∷ Index TextTextText

unsafeDrop ∷ Index TextTextText

dropEnd ∷ Index TextTextText

partition ∷ (Element TextBool) → Text → (Text, Text)

unconsTextMaybe (Element Text, Text)

unsnocTextMaybe (Text, Element Text)

filter ∷ (Element TextBool) → TextText

filterMMonad m ⇒ (Element Text → m Bool) → Text → m Text

replicate ∷ Index Text → Element TextText

replicateMMonad m ⇒ Index Text → m (Element Text) → m Text

groupBy ∷ (Element Text → Element TextBool) → Text → [Text]

groupAllOnEq b ⇒ (Element Text → b) → Text → [Text]

subsequencesText → [Text]

permutationsText → [Text]

tailExTextText

tailMayTextMaybe Text

initExTextText

initMayTextMaybe Text

unsafeTailTextText

unsafeInitTextText

indexText → Index TextMaybe (Element Text)

indexExText → Index Text → Element Text

unsafeIndexText → Index Text → Element Text

splitWhen ∷ (Element TextBool) → Text → [Text]

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text

Methods

intersperse ∷ Element TextTextText

reverseTextText

find ∷ (Element TextBool) → TextMaybe (Element Text)

sortBy ∷ (Element Text → Element TextOrdering) → TextText

cons ∷ Element TextTextText

snocText → Element TextText

Textual Text 
Instance details

Defined in Data.Sequences

Methods

wordsText → [Text]

unwords ∷ (Element seq ~ Text, MonoFoldable seq) ⇒ seq → Text

linesText → [Text]

unlines ∷ (Element seq ~ Text, MonoFoldable seq) ⇒ seq → Text

toLowerTextText

toUpperTextText

toCaseFoldTextText

breakWordText → (Text, Text)

breakLineText → (Text, Text)

FromField Text 
Instance details

Defined in Data.Csv.Conversion

Methods

parseField ∷ Field → Parser Text

ExMemoryUsage Text 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

memoryUsageText → ExMemory

Pretty Text 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

prettyText → Doc b

prettyList ∷ [Text] → Doc b

FromFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyTextText

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCaseTextText

foldCaseList ∷ [Text] → [Text]

FromField Text 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField ∷ FieldParser Text

ToField Text 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldText → Action

ToParamSchema Text 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy Text → ParamSchema t

ToSchema Text 
Instance details

Defined in Data.Swagger.Internal.Schema

Methods

declareNamedSchemaProxy Text → Declare (Definitions Schema) NamedSchema

FromText Text 
Instance details

Defined in Data.Text.Class

Methods

fromTextTextEither TextDecodingError Text

ToText Text 
Instance details

Defined in Data.Text.Class

Methods

toTextTextText

FromBuiltin BuiltinString Text 
Instance details

Defined in PlutusTx.Builtins.Class

Methods

fromBuiltin ∷ BuiltinString → Text

PrettyDefaultBy config Text ⇒ PrettyBy config Text 
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Text → Doc ann

prettyListBy ∷ config → [Text] → Doc ann

ToBuiltin Text BuiltinString 
Instance details

Defined in PlutusTx.Builtins.Class

Methods

toBuiltinText → BuiltinString

DefaultPrettyBy config Text 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Text → Doc ann

defaultPrettyListBy ∷ config → [Text] → Doc ann

NonDefaultPrettyBy ConstConfig Text 
Instance details

Defined in PlutusCore.Pretty.PrettyConst

Methods

nonDefaultPrettyBy ∷ ConstConfig → Text → Doc ann

nonDefaultPrettyListBy ∷ ConstConfig → [Text] → Doc ann

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Methods

toChunksText0 → [Text]

fromChunks ∷ [Text] → Text0

toStrictText0Text

fromStrictTextText0

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → StringText

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → ByteStringText

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → ByteStringText

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → Text0Text

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → TextString

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → TextByteString

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → TextByteString

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → TextText0

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv ∷ Leniency → TextText

HasDescription Response Text 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Response Text

HasName License Text 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' License Text

HasName Param Text 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' Param Text

HasName Tag TagName 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' Tag TagName

HasTitle Info Text 
Instance details

Defined in Data.Swagger.Lens

Methods

title ∷ Lens' Info Text

HasVersion Info Text 
Instance details

Defined in Data.Swagger.Lens

Methods

version ∷ Lens' Info Text

HasConstantIn DefaultUni term ⇒ MakeKnownIn DefaultUni term Text 
Instance details

Defined in PlutusCore.Default.Universe

Methods

makeKnownMaybe cause → Text → MakeKnownM cause term

HasConstantIn DefaultUni term ⇒ ReadKnownIn DefaultUni term Text 
Instance details

Defined in PlutusCore.Default.Universe

Methods

readKnownMaybe cause → term → ReadKnownM cause Text

HasDefinitions Swagger (Definitions Schema) 
Instance details

Defined in Data.Swagger.Lens

Methods

definitions ∷ Lens' Swagger (Definitions Schema)

HasDescription ExternalDocs (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' ExternalDocs (Maybe Text)

HasDescription Header (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Header (Maybe Text)

HasDescription Info (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Info (Maybe Text)

HasDescription Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Operation (Maybe Text)

HasDescription Param (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Param (Maybe Text)

HasDescription Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Schema (Maybe Text)

HasDescription SecurityScheme (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' SecurityScheme (Maybe Text)

HasDescription Tag (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

description ∷ Lens' Tag (Maybe Text)

HasDiscriminator Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

discriminator ∷ Lens' Schema (Maybe Text)

HasEmail Contact (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

email ∷ Lens' Contact (Maybe Text)

HasParamSchema s (ParamSchema t) ⇒ HasFormat s (Maybe Format) 
Instance details

Defined in Data.Swagger.Lens

Methods

format ∷ Lens' s (Maybe Format)

HasName Contact (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' Contact (Maybe Text)

HasName NamedSchema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' NamedSchema (Maybe Text)

HasName Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

name ∷ Lens' Xml (Maybe Text)

HasNamespace Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

namespace ∷ Lens' Xml (Maybe Text)

HasOperationId Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

operationId ∷ Lens' Operation (Maybe Text)

HasParameters Swagger (Definitions Param) 
Instance details

Defined in Data.Swagger.Lens

Methods

parameters ∷ Lens' Swagger (Definitions Param)

HasParamSchema s (ParamSchema t) ⇒ HasPattern s (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

pattern ∷ Lens' s (Maybe Text)

HasPrefix Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

prefix ∷ Lens' Xml (Maybe Text)

HasRequired Schema [ParamName] 
Instance details

Defined in Data.Swagger.Lens

Methods

required ∷ Lens' Schema [ParamName]

HasResponses Swagger (Definitions Response) 
Instance details

Defined in Data.Swagger.Lens

Methods

responses ∷ Lens' Swagger (Definitions Response)

HasSummary Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

summary ∷ Lens' Operation (Maybe Text)

HasTags Operation (InsOrdHashSet TagName) 
Instance details

Defined in Data.Swagger.Lens

Methods

tags ∷ Lens' Operation (InsOrdHashSet TagName)

HasTermsOfService Info (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

termsOfService ∷ Lens' Info (Maybe Text)

HasTitle Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

title ∷ Lens' Schema (Maybe Text)

HasHeaders Response (InsOrdHashMap HeaderName Header) 
Instance details

Defined in Data.Swagger.Lens

Methods

headers ∷ Lens' Response (InsOrdHashMap HeaderName Header)

HasProperties Schema (InsOrdHashMap Text (Referenced Schema)) 
Instance details

Defined in Data.Swagger.Lens

Methods

properties ∷ Lens' Schema (InsOrdHashMap Text (Referenced Schema))

FromField (CI Text) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField ∷ FieldParser (CI Text)

ToField (CI Text) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField ∷ CI Text → Action

Contains DefaultUni Text 
Instance details

Defined in PlutusCore.Default.Universe

Methods

knownUni ∷ DefaultUni (Esc Text)

KnownBuiltinTypeAst DefaultUni Text ⇒ KnownTypeAst DefaultUni Text 
Instance details

Defined in PlutusCore.Default.Universe

Associated Types

type ToHoles Text ∷ [Hole]

type ToBinds Text ∷ [Some TyNameRep]

Methods

toTypeAst ∷ proxy Text → Type TyName DefaultUni ()

MimeRender PlainText Text 
Instance details

Defined in Servant.API.ContentTypes

Methods

mimeRenderProxy PlainText → TextByteString

MimeUnrender PlainText Text 
Instance details

Defined in Servant.API.ContentTypes

Methods

mimeUnrenderProxy PlainText → ByteStringEither String Text

mimeUnrenderWithTypeProxy PlainText → MediaType → ByteStringEither String Text

HasFormat (ParamSchema t) (Maybe Format) 
Instance details

Defined in Data.Swagger.Lens

Methods

format ∷ Lens' (ParamSchema t) (Maybe Format)

HasPattern (ParamSchema t) (Maybe Pattern) 
Instance details

Defined in Data.Swagger.Lens

Methods

pattern ∷ Lens' (ParamSchema t) (Maybe Pattern)

type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text = Char
type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text = Text
type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text = Char
type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type IxValue Text = Char
type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type Index Text 
Instance details

Defined in Optics.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Optics.At

type IxValue Text = Char
type IxKind Text 
Instance details

Defined in Optics.At

type IxKind Text = An_AffineTraversal
type ToBinds Text 
Instance details

Defined in PlutusCore.Default.Universe

type ToBinds Text = ToBinds (ElaborateBuiltin Text)
type ToHoles Text 
Instance details

Defined in PlutusCore.Default.Universe

type ToHoles Text = ToHoles (ElaborateBuiltin Text)

class FromJSON a where #

Minimal complete definition

Nothing

Methods

parseJSON ∷ Value → Parser a #

parseJSONList ∷ Value → Parser [a] #

Instances

Instances details
FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Bool #

parseJSONList ∷ Value → Parser [Bool] #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Char #

parseJSONList ∷ Value → Parser [Char] #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Double #

parseJSONList ∷ Value → Parser [Double] #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Float #

parseJSONList ∷ Value → Parser [Float] #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Int #

parseJSONList ∷ Value → Parser [Int] #

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Int8 #

parseJSONList ∷ Value → Parser [Int8] #

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Int16 #

parseJSONList ∷ Value → Parser [Int16] #

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Int32 #

parseJSONList ∷ Value → Parser [Int32] #

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Int64 #

parseJSONList ∷ Value → Parser [Int64] #

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Integer #

parseJSONList ∷ Value → Parser [Integer] #

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Natural #

parseJSONList ∷ Value → Parser [Natural] #

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Ordering #

parseJSONList ∷ Value → Parser [Ordering] #

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Word #

parseJSONList ∷ Value → Parser [Word] #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Word8 #

parseJSONList ∷ Value → Parser [Word8] #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Word16 #

parseJSONList ∷ Value → Parser [Word16] #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Word32 #

parseJSONList ∷ Value → Parser [Word32] #

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Word64 #

parseJSONList ∷ Value → Parser [Word64] #

FromJSON () 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser () #

parseJSONList ∷ Value → Parser [()] #

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Void #

parseJSONList ∷ Value → Parser [Void] #

FromJSON Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Version #

parseJSONList ∷ Value → Parser [Version] #

FromJSON CTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser CTime #

parseJSONList ∷ Value → Parser [CTime] #

(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # 
Instance details

Defined in GeniusYield.Imports

Methods

parseJSON ∷ Value → Parser ByteString #

parseJSONList ∷ Value → Parser [ByteString] #

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser IntSet #

parseJSONList ∷ Value → Parser [IntSet] #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Text #

parseJSONList ∷ Value → Parser [Text] #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Text #

parseJSONList ∷ Value → Parser [Text] #

FromJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser ZonedTime #

parseJSONList ∷ Value → Parser [ZonedTime] #

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser LocalTime #

parseJSONList ∷ Value → Parser [LocalTime] #

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser TimeOfDay #

parseJSONList ∷ Value → Parser [TimeOfDay] #

FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser CalendarDiffTime #

parseJSONList ∷ Value → Parser [CalendarDiffTime] #

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser UTCTime #

parseJSONList ∷ Value → Parser [UTCTime] #

FromJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser SystemTime #

parseJSONList ∷ Value → Parser [SystemTime] #

FromJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser NominalDiffTime #

parseJSONList ∷ Value → Parser [NominalDiffTime] #

FromJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser DiffTime #

parseJSONList ∷ Value → Parser [DiffTime] #

FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser DayOfWeek #

parseJSONList ∷ Value → Parser [DayOfWeek] #

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Day #

parseJSONList ∷ Value → Parser [Day] #

FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser CalendarDiffDays #

parseJSONList ∷ Value → Parser [CalendarDiffDays] #

FromJSON StakeAddress 
Instance details

Defined in Cardano.Api.Address

Methods

parseJSON ∷ Value → Parser StakeAddress #

parseJSONList ∷ Value → Parser [StakeAddress] #

FromJSON AnyCardanoEra 
Instance details

Defined in Cardano.Api.Eras

Methods

parseJSON ∷ Value → Parser AnyCardanoEra #

parseJSONList ∷ Value → Parser [AnyCardanoEra] #

FromJSON CostModel 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

parseJSON ∷ Value → Parser CostModel #

parseJSONList ∷ Value → Parser [CostModel] #

FromJSON ExecutionUnitPrices 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

parseJSON ∷ Value → Parser ExecutionUnitPrices #

parseJSONList ∷ Value → Parser [ExecutionUnitPrices] #

FromJSON PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

parseJSON ∷ Value → Parser PraosNonce #

parseJSONList ∷ Value → Parser [PraosNonce] #

FromJSON AnyPlutusScriptVersion 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser AnyPlutusScriptVersion #

parseJSONList ∷ Value → Parser [AnyPlutusScriptVersion] #

FromJSON ExecutionUnits 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser ExecutionUnits #

parseJSONList ∷ Value → Parser [ExecutionUnits] #

FromJSON ScriptHash 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser ScriptHash #

parseJSONList ∷ Value → Parser [ScriptHash] #

FromJSON ScriptInAnyLang 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser ScriptInAnyLang #

parseJSONList ∷ Value → Parser [ScriptInAnyLang] #

FromJSON TextEnvelope 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

parseJSON ∷ Value → Parser TextEnvelope #

parseJSONList ∷ Value → Parser [TextEnvelope] #

FromJSON TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

parseJSON ∷ Value → Parser TextEnvelopeDescr #

parseJSONList ∷ Value → Parser [TextEnvelopeDescr] #

FromJSON TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

parseJSON ∷ Value → Parser TextEnvelopeType #

parseJSONList ∷ Value → Parser [TextEnvelopeType] #

FromJSON StakePoolMetadata 
Instance details

Defined in Cardano.Api.StakePoolMetadata

Methods

parseJSON ∷ Value → Parser StakePoolMetadata #

parseJSONList ∷ Value → Parser [StakePoolMetadata] #

FromJSON TxId 
Instance details

Defined in Cardano.Api.TxIn

Methods

parseJSON ∷ Value → Parser TxId #

parseJSONList ∷ Value → Parser [TxId] #

FromJSON TxIn 
Instance details

Defined in Cardano.Api.TxIn

Methods

parseJSON ∷ Value → Parser TxIn #

parseJSONList ∷ Value → Parser [TxIn] #

FromJSON TxIx 
Instance details

Defined in Cardano.Api.TxIn

Methods

parseJSON ∷ Value → Parser TxIx #

parseJSONList ∷ Value → Parser [TxIx] #

FromJSON AssetName 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value → Parser AssetName #

parseJSONList ∷ Value → Parser [AssetName] #

FromJSON Lovelace 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value → Parser Lovelace #

parseJSONList ∷ Value → Parser [Lovelace] #

FromJSON PolicyId 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value → Parser PolicyId #

parseJSONList ∷ Value → Parser [PolicyId] #

FromJSON Quantity 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value → Parser Quantity #

parseJSONList ∷ Value → Parser [Quantity] #

FromJSON Value 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value0 → Parser Value #

parseJSONList ∷ Value0 → Parser [Value] #

FromJSON ValueNestedRep 
Instance details

Defined in Cardano.Api.Value

Methods

parseJSON ∷ Value → Parser ValueNestedRep #

parseJSONList ∷ Value → Parser [ValueNestedRep] #

FromJSON EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

parseJSON ∷ Value → Parser EpochNo #

parseJSONList ∷ Value → Parser [EpochNo] #

FromJSON SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

parseJSON ∷ Value → Parser SlotNo #

parseJSONList ∷ Value → Parser [SlotNo] #

FromJSON ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser ProtVer #

parseJSONList ∷ Value → Parser [ProtVer] #

FromJSON RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

parseJSON ∷ Value → Parser RequiresNetworkMagic #

parseJSONList ∷ Value → Parser [RequiresNetworkMagic] #

FromJSON ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

parseJSON ∷ Value → Parser ProtocolMagicId #

parseJSONList ∷ Value → Parser [ProtocolMagicId] #

FromJSON CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

Methods

parseJSON ∷ Value → Parser CompactRedeemVerificationKey #

parseJSONList ∷ Value → Parser [CompactRedeemVerificationKey] #

FromJSON VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

Methods

parseJSON ∷ Value → Parser VerificationKey #

parseJSONList ∷ Value → Parser [VerificationKey] #

FromJSON ProtocolMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

parseJSON ∷ Value → Parser ProtocolMagic #

parseJSONList ∷ Value → Parser [ProtocolMagic] #

FromJSON PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser PositiveUnitInterval #

parseJSONList ∷ Value → Parser [PositiveUnitInterval] #

FromJSON Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser Network #

parseJSONList ∷ Value → Parser [Network] #

FromJSON Coin 
Instance details

Defined in Cardano.Ledger.Coin

Methods

parseJSON ∷ Value → Parser Coin #

parseJSONList ∷ Value → Parser [Coin] #

FromJSON Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser Nonce #

parseJSONList ∷ Value → Parser [Nonce] #

FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Value #

parseJSONList ∷ Value → Parser [Value] #

FromJSON Key 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Key #

parseJSONList ∷ Value → Parser [Key] #

FromJSON StakePoolRelay 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

parseJSON ∷ Value → Parser StakePoolRelay #

parseJSONList ∷ Value → Parser [StakePoolRelay] #

FromJSON RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Methods

parseJSON ∷ Value → Parser RewardParams #

parseJSONList ∷ Value → Parser [RewardParams] #

FromJSON RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Methods

parseJSON ∷ Value → Parser RewardInfoPool #

parseJSONList ∷ Value → Parser [RewardInfoPool] #

FromJSON UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser UnitInterval #

parseJSONList ∷ Value → Parser [UnitInterval] #

FromJSON NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser NonNegativeInterval #

parseJSONList ∷ Value → Parser [NonNegativeInterval] #

FromJSON AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

Methods

parseJSON ∷ Value → Parser AlonzoGenesis #

parseJSONList ∷ Value → Parser [AlonzoGenesis] #

FromJSON ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

parseJSON ∷ Value → Parser ExCPU #

parseJSONList ∷ Value → Parser [ExCPU] #

FromJSON ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

parseJSON ∷ Value → Parser ExMemory #

parseJSONList ∷ Value → Parser [ExMemory] #

FromJSON ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

parseJSON ∷ Value → Parser ExBudget #

parseJSONList ∷ Value → Parser [ExBudget] #

FromJSON Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

parseJSON ∷ Value → Parser Desirability #

parseJSONList ∷ Value → Parser [Desirability] #

FromJSON PoolMetadata 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

parseJSON ∷ Value → Parser PoolMetadata #

parseJSONList ∷ Value → Parser [PoolMetadata] #

FromJSON Scientific 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Scientific #

parseJSONList ∷ Value → Parser [Scientific] #

FromJSON ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

parseJSON ∷ Value → Parser ProtocolParameters #

parseJSONList ∷ Value → Parser [ProtocolParameters] #

FromJSON EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

Methods

parseJSON ∷ Value → Parser EpochSize #

parseJSONList ∷ Value → Parser [EpochSize] #

FromJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser DotNetTime #

parseJSONList ∷ Value → Parser [DotNetTime] #

FromJSON Month 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Month #

parseJSONList ∷ Value → Parser [Month] #

FromJSON Quarter 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser Quarter #

parseJSONList ∷ Value → Parser [Quarter] #

FromJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser QuarterOfYear #

parseJSONList ∷ Value → Parser [QuarterOfYear] #

FromJSON ShortText 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser ShortText #

parseJSONList ∷ Value → Parser [ShortText] #

FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser UUID #

parseJSONList ∷ Value → Parser [UUID] #

FromJSON BaseUrl 
Instance details

Defined in Servant.Client.Core.BaseUrl

Methods

parseJSON ∷ Value → Parser BaseUrl #

parseJSONList ∷ Value → Parser [BaseUrl] #

FromJSON ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

parseJSON ∷ Value → Parser ByteString64 #

parseJSONList ∷ Value → Parser [ByteString64] #

FromJSON Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser Url #

parseJSONList ∷ Value → Parser [Url] #

FromJSON CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Methods

parseJSON ∷ Value → Parser CekMachineCosts #

parseJSONList ∷ Value → Parser [CekMachineCosts] #

FromJSON RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

Methods

parseJSON ∷ Value → Parser RedeemVerificationKey #

parseJSONList ∷ Value → Parser [RedeemVerificationKey] #

FromJSON DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser DnsName #

parseJSONList ∷ Value → Parser [DnsName] #

FromJSON Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser Port #

parseJSONList ∷ Value → Parser [Port] #

FromJSON PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser PositiveInterval #

parseJSONList ∷ Value → Parser [PositiveInterval] #

FromJSON PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.Types

Methods

parseJSON ∷ Value → Parser PeerAdvertise #

parseJSONList ∷ Value → Parser [PeerAdvertise] #

FromJSON SatInt 
Instance details

Defined in Data.SatInt

Methods

parseJSON ∷ Value → Parser SatInt #

parseJSONList ∷ Value → Parser [SatInt] #

FromJSON ModelAddedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelAddedSizes #

parseJSONList ∷ Value → Parser [ModelAddedSizes] #

FromJSON ModelConstantOrLinear 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelConstantOrLinear #

parseJSONList ∷ Value → Parser [ModelConstantOrLinear] #

FromJSON ModelConstantOrTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelConstantOrTwoArguments #

parseJSONList ∷ Value → Parser [ModelConstantOrTwoArguments] #

FromJSON ModelFiveArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelFiveArguments #

parseJSONList ∷ Value → Parser [ModelFiveArguments] #

FromJSON ModelFourArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelFourArguments #

parseJSONList ∷ Value → Parser [ModelFourArguments] #

FromJSON ModelLinearSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelLinearSize #

parseJSONList ∷ Value → Parser [ModelLinearSize] #

FromJSON ModelMaxSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelMaxSize #

parseJSONList ∷ Value → Parser [ModelMaxSize] #

FromJSON ModelMinSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelMinSize #

parseJSONList ∷ Value → Parser [ModelMinSize] #

FromJSON ModelMultipliedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelMultipliedSizes #

parseJSONList ∷ Value → Parser [ModelMultipliedSizes] #

FromJSON ModelOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelOneArgument #

parseJSONList ∷ Value → Parser [ModelOneArgument] #

FromJSON ModelSixArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelSixArguments #

parseJSONList ∷ Value → Parser [ModelSixArguments] #

FromJSON ModelSubtractedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelSubtractedSizes #

parseJSONList ∷ Value → Parser [ModelSubtractedSizes] #

FromJSON ModelThreeArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelThreeArguments #

parseJSONList ∷ Value → Parser [ModelThreeArguments] #

FromJSON ModelTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser ModelTwoArguments #

parseJSONList ∷ Value → Parser [ModelTwoArguments] #

FromJSON CovLoc 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CovLoc #

parseJSONList ∷ Value → Parser [CovLoc] #

FromJSON CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CoverageAnnotation #

parseJSONList ∷ Value → Parser [CoverageAnnotation] #

FromJSON CoverageData 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CoverageData #

parseJSONList ∷ Value → Parser [CoverageData] #

FromJSON CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CoverageIndex #

parseJSONList ∷ Value → Parser [CoverageIndex] #

FromJSON CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CoverageMetadata #

parseJSONList ∷ Value → Parser [CoverageMetadata] #

FromJSON CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser CoverageReport #

parseJSONList ∷ Value → Parser [CoverageReport] #

FromJSON Metadata 
Instance details

Defined in PlutusTx.Coverage

Methods

parseJSON ∷ Value → Parser Metadata #

parseJSONList ∷ Value → Parser [Metadata] #

FromJSON StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

Methods

parseJSON ∷ Value → Parser StudentT #

parseJSONList ∷ Value → Parser [StudentT] #

FromJSON Environment 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser Environment #

parseJSONList ∷ Value → Parser [Environment] #

FromJSON LogStr 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser LogStr #

parseJSONList ∷ Value → Parser [LogStr] #

FromJSON Namespace 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser Namespace #

parseJSONList ∷ Value → Parser [Namespace] #

FromJSON Severity 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser Severity #

parseJSONList ∷ Value → Parser [Severity] #

FromJSON ThreadIdText 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser ThreadIdText #

parseJSONList ∷ Value → Parser [ThreadIdText] #

FromJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser Verbosity #

parseJSONList ∷ Value → Parser [Verbosity] #

FromJSON LocJs 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser LocJs #

parseJSONList ∷ Value → Parser [LocJs] #

FromJSON ProcessIDJs 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser ProcessIDJs #

parseJSONList ∷ Value → Parser [ProcessIDJs] #

FromJSON GYEra # 
Instance details

Defined in GeniusYield.Types.Era

Methods

parseJSON ∷ Value → Parser GYEra #

parseJSONList ∷ Value → Parser [GYEra] #

FromJSON GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

Methods

parseJSON ∷ Value → Parser GYDatumHash #

parseJSONList ∷ Value → Parser [GYDatumHash] #

FromJSON GYLogScribeConfig #
>>> Aeson.decode @GYLogScribeConfig "{\"severity\":\"Warning\",\"verbosity\":\"V1\",\"type\":{\"tag\":\"gySource\",\"source\":\"log.txt\"}}"
Just (GYLogScribeConfig {cfgLogType = GYCustomSourceScribe (LogSrc log.txt), cfgLogSeverity = GYWarning, cfgLogVerbosity = GYLogVerbosity V1})
Instance details

Defined in GeniusYield.Types.Logging

Methods

parseJSON ∷ Value → Parser GYLogScribeConfig #

parseJSONList ∷ Value → Parser [GYLogScribeConfig] #

FromJSON GYLogScribeType #
>>> Aeson.eitherDecode @GYLogScribeType "{\"tag\":\"stderr\"}"
Right GYStdErrScribe
>>> Aeson.eitherDecode @GYLogScribeType "{\"tag\":\"gySource\",\"source\":\"log.txt\"}"
Right (GYCustomSourceScribe (LogSrc log.txt))
>>> Aeson.eitherDecode @GYLogScribeType "{\"tag\":\"gySource\",\"source\":\"https://pub:priv@sentry.hostname.tld:8443/sentry/example_project\"}"
Right (GYCustomSourceScribe (LogSrc https://pub:...@sentry.hostname.tld:8443/sentry/example_project))
>>> Aeson.eitherDecode @GYLogScribeType "{\"tag\":\"fancy-scribe\"}"
Left "Error in $: unknown GYLogScribe tag: fancy-scribe"
Instance details

Defined in GeniusYield.Types.Logging

Methods

parseJSON ∷ Value → Parser GYLogScribeType #

parseJSONList ∷ Value → Parser [GYLogScribeType] #

FromJSON LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

parseJSON ∷ Value → Parser LogSrc #

parseJSONList ∷ Value → Parser [LogSrc] #

FromJSON GYLogVerbosity # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

parseJSON ∷ Value → Parser GYLogVerbosity #

parseJSONList ∷ Value → Parser [GYLogVerbosity] #

FromJSON GYLogSeverity #
>>> Aeson.eitherDecode @GYLogSeverity "\"Debug\""
Right GYDebug
>>> Aeson.eitherDecode @GYLogSeverity "\"Info\""
Right GYInfo
>>> Aeson.eitherDecode @GYLogSeverity "\"Warning\""
Right GYWarning
>>> Aeson.eitherDecode @GYLogSeverity "\"Error\""
Right GYError
>>> Aeson.eitherDecode @GYLogSeverity "\"Fatal\""
Left "Error in $: unknown GYLogSeverity: Fatal"
Instance details

Defined in GeniusYield.Types.Logging

Methods

parseJSON ∷ Value → Parser GYLogSeverity #

parseJSONList ∷ Value → Parser [GYLogSeverity] #

FromJSON GYNetworkId #
>>> Aeson.eitherDecode @GYNetworkId <$> ["\"mainnet\"", "\"testnet-preprod\"", "\"testnet-preview\"", "\"testnet\"", "\"privnet\"", "\"no-such-net\""]
[Right GYMainnet,Right GYTestnetPreprod,Right GYTestnetPreview,Right GYTestnetLegacy,Right GYPrivnet,Left "Error in $: Expected mainnet, testnet-preprod, testnet-preview, testnet or privnet"]
Instance details

Defined in GeniusYield.Types.NetworkId

Methods

parseJSON ∷ Value → Parser GYNetworkId #

parseJSONList ∷ Value → Parser [GYNetworkId] #

FromJSON AdditionalProperties 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser AdditionalProperties #

parseJSONList ∷ Value → Parser [AdditionalProperties] #

FromJSON ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ApiKeyLocation #

parseJSONList ∷ Value → Parser [ApiKeyLocation] #

FromJSON ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ApiKeyParams #

parseJSONList ∷ Value → Parser [ApiKeyParams] #

FromJSON Contact 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Contact #

parseJSONList ∷ Value → Parser [Contact] #

FromJSON Example 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Example #

parseJSONList ∷ Value → Parser [Example] #

FromJSON ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ExternalDocs #

parseJSONList ∷ Value → Parser [ExternalDocs] #

FromJSON Header 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Header #

parseJSONList ∷ Value → Parser [Header] #

FromJSON Host 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Host #

parseJSONList ∷ Value → Parser [Host] #

FromJSON Info 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Info #

parseJSONList ∷ Value → Parser [Info] #

FromJSON License 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser License #

parseJSONList ∷ Value → Parser [License] #

FromJSON MimeList 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser MimeList #

parseJSONList ∷ Value → Parser [MimeList] #

FromJSON OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser OAuth2Flow #

parseJSONList ∷ Value → Parser [OAuth2Flow] #

FromJSON OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser OAuth2Params #

parseJSONList ∷ Value → Parser [OAuth2Params] #

FromJSON Operation 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Operation #

parseJSONList ∷ Value → Parser [Operation] #

FromJSON Param 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Param #

parseJSONList ∷ Value → Parser [Param] #

FromJSON ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ParamAnySchema #

parseJSONList ∷ Value → Parser [ParamAnySchema] #

FromJSON ParamLocation 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ParamLocation #

parseJSONList ∷ Value → Parser [ParamLocation] #

FromJSON ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser ParamOtherSchema #

parseJSONList ∷ Value → Parser [ParamOtherSchema] #

FromJSON PathItem 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser PathItem #

parseJSONList ∷ Value → Parser [PathItem] #

FromJSON Reference 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Reference #

parseJSONList ∷ Value → Parser [Reference] #

FromJSON Response 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Response #

parseJSONList ∷ Value → Parser [Response] #

FromJSON Responses 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Responses #

parseJSONList ∷ Value → Parser [Responses] #

FromJSON Schema 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Schema #

parseJSONList ∷ Value → Parser [Schema] #

FromJSON Scheme 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Scheme #

parseJSONList ∷ Value → Parser [Scheme] #

FromJSON SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser SecurityDefinitions #

parseJSONList ∷ Value → Parser [SecurityDefinitions] #

FromJSON SecurityRequirement 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser SecurityRequirement #

parseJSONList ∷ Value → Parser [SecurityRequirement] #

FromJSON SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser SecurityScheme #

parseJSONList ∷ Value → Parser [SecurityScheme] #

FromJSON SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser SecuritySchemeType #

parseJSONList ∷ Value → Parser [SecuritySchemeType] #

FromJSON Swagger 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Swagger #

parseJSONList ∷ Value → Parser [Swagger] #

FromJSON Tag 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Tag #

parseJSONList ∷ Value → Parser [Tag] #

FromJSON URL 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser URL #

parseJSONList ∷ Value → Parser [URL] #

FromJSON Xml 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser Xml #

parseJSONList ∷ Value → Parser [Xml] #

FromJSON GYPubKeyHash #
>>> Aeson.eitherDecode @GYPubKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d\""
Right (GYPubKeyHash "e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d")

Invalid characters:

>>> Aeson.eitherDecode @GYPubKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6azzz\""
Left "Error in $: RawBytesHexErrorBase16DecodeFail \"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6azzz\" \"invalid character at offset: 53\""
Instance details

Defined in GeniusYield.Types.PubKeyHash

Methods

parseJSON ∷ Value → Parser GYPubKeyHash #

parseJSONList ∷ Value → Parser [GYPubKeyHash] #

FromJSON GYPaymentSigningKey #
>>> Aeson.eitherDecode @GYPaymentSigningKey "\"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290\""
Right (GYPaymentSigningKey "5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290")
>>> Aeson.eitherDecode @GYPaymentSigningKey "\"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fceczzz\""
Left "Error in $: invalid character at offset: 65"
Instance details

Defined in GeniusYield.Types.Key

Methods

parseJSON ∷ Value → Parser GYPaymentSigningKey #

parseJSONList ∷ Value → Parser [GYPaymentSigningKey] #

FromJSON GYPaymentVerificationKey #
>>> Aeson.eitherDecode @GYPaymentVerificationKey "\"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605\""
Right (GYPaymentVerificationKey "0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605")
>>> Aeson.eitherDecode @GYPaymentVerificationKey "\"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193zzz\""
Left "Error in $: invalid character at offset: 65"
Instance details

Defined in GeniusYield.Types.Key

Methods

parseJSON ∷ Value → Parser GYPaymentVerificationKey #

parseJSONList ∷ Value → Parser [GYPaymentVerificationKey] #

FromJSON Rational 
Instance details

Defined in PlutusTx.Ratio

Methods

parseJSON ∷ Value → Parser Rational #

parseJSONList ∷ Value → Parser [Rational] #

FromJSON GYRational #
>>> Aeson.decode @GYRational "\"0.123\""
Just (GYRational (123 % 1000))
>>> Aeson.eitherDecode @GYRational "\"Haskell\""
Left "Error in $: could not parse: `Haskell' (input does not start with a digit)"
Instance details

Defined in GeniusYield.Types.Rational

Methods

parseJSON ∷ Value → Parser GYRational #

parseJSONList ∷ Value → Parser [GYRational] #

FromJSON GYMintingPolicyId # 
Instance details

Defined in GeniusYield.Types.Script

Methods

parseJSON ∷ Value → Parser GYMintingPolicyId #

parseJSONList ∷ Value → Parser [GYMintingPolicyId] #

FromJSON GYAddressBech32 #
>>> Aeson.decode @GYAddressBech32 "\"addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5\""
Just (unsafeAddressFromText "addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5")
Instance details

Defined in GeniusYield.Types.Address

Methods

parseJSON ∷ Value → Parser GYAddressBech32 #

parseJSONList ∷ Value → Parser [GYAddressBech32] #

FromJSON GYAddress #

In JSON context addresses are represented in hex.

>>> Aeson.decode @GYAddress "\"00e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d1b930e9f7add78a174a21000e989ff551366dcd127028cb2aa39f616\""
Just (unsafeAddressFromText "addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5")
Instance details

Defined in GeniusYield.Types.Address

Methods

parseJSON ∷ Value → Parser GYAddress #

parseJSONList ∷ Value → Parser [GYAddress] #

FromJSON GYTime #
>>> Aeson.eitherDecode @GYTime "\"1970-01-01T00:00:00Z\""
Right (GYTime 0s)
>>> Aeson.eitherDecode @GYTime "\"1970-01-01T00:00:00\""
Left "Error in $: can't parse '1970-01-01T00:00:00' as GYTime in ISO8601 format"
Instance details

Defined in GeniusYield.Types.Time

Methods

parseJSON ∷ Value → Parser GYTime #

parseJSONList ∷ Value → Parser [GYTime] #

FromJSON GYTx #
>>> txToApi <$> (Aeson.fromJSON @GYTx $ Aeson.toJSON tx)
Success (ShelleyTx ShelleyBasedEraBabbage (ValidatedTx {body = TxBodyConstr TxBodyRaw {_spendInputs = fromList [TxIn (TxId {_unTxId = SafeHash "975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb275"}) (TxIx 1),TxIn (TxId {_unTxId = SafeHash "c887cba672004607a0f60ab28091d5c24860dbefb92b1a8776272d752846574f"}) (TxIx 0)], _collateralInputs = fromList [TxIn (TxId {_unTxId = SafeHash "7a67cd033169e330c9ae9b8d0ef8b71de9eb74bbc8f3f6be90446dab7d1e8bfd"}) (TxIx 0)], _referenceInputs = fromList [], _outputs = StrictSeq {fromStrict = fromList [Sized {sizedValue = (Addr Testnet (KeyHashObj (KeyHash "fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0")) (StakeRefBase (KeyHashObj (KeyHash "c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40"))),Value 448448472 (fromList []),NoDatum,SNothing), sizedSize = 65},Sized {sizedValue = (Addr Testnet (KeyHashObj (KeyHash "fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0")) (StakeRefBase (KeyHashObj (KeyHash "c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40"))),Value 1551690 (fromList [(PolicyID {policyID = ScriptHash "a6bb5fd825455e7c69bdaa9d3a6dda9bcbe9b570bc79bd55fa50889b"},fromList [(6e69636b656c,4567)]),(PolicyID {policyID = ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f"},fromList [(53696c6c69636f6e,600)])]),NoDatum,SNothing), sizedSize = 151}]}, _collateralReturn = SNothing, _totalCollateral = SNothing, _certs = StrictSeq {fromStrict = fromList []}, _wdrls = Wdrl {unWdrl = fromList []}, _txfee = Coin 470844, _vldt = ValidityInterval {invalidBefore = SNothing, invalidHereafter = SNothing}, _update = SNothing, _reqSignerHashes = fromList [], _mint = Value 0 (fromList [(PolicyID {policyID = ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f"},fromList [(53696c6c69636f6e,600)])]), _scriptIntegrityHash = SJust (SafeHash "291b4e4c5f189cb896674e02e354028915b11889687c53d9cf4c1c710ff5e4ae"), _adHash = SNothing, _txnetworkid = SNothing}, wits = TxWitnessRaw {_txwitsVKey = fromList [], _txwitsBoot = fromList [], _txscripts = fromList [(ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f",PlutusScript PlutusV1 ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f")], _txdats = TxDatsRaw (fromList []), _txrdmrs = RedeemersRaw (fromList [(RdmrPtr Mint 0,(DataConstr Constr 0 [],WrapExUnits {unWrapExUnits = ExUnits' {exUnitsMem' = 2045738, exUnitsSteps' = 898247444}}))])}, isValid = IsValid True, auxiliaryData = SNothing}))
Instance details

Defined in GeniusYield.Types.Tx

Methods

parseJSON ∷ Value → Parser GYTx #

parseJSONList ∷ Value → Parser [GYTx] #

FromJSON GYTxOutRefCbor # 
Instance details

Defined in GeniusYield.Types.TxOutRef

Methods

parseJSON ∷ Value → Parser GYTxOutRefCbor #

parseJSONList ∷ Value → Parser [GYTxOutRefCbor] #

FromJSON GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

Methods

parseJSON ∷ Value → Parser GYTxOutRef #

parseJSONList ∷ Value → Parser [GYTxOutRef] #

FromJSON GYTokenName #
>>> Aeson.eitherDecode @GYTokenName "\"476f6c64\""
Right "Gold"
>>> Aeson.eitherDecode @GYTokenName "\"0102030405060708090a0b0c0d0e0f101112131415161718191a1b1c1d1e1f2021\""
Left "Error in $: parseJSON @GYTokenName: token name too long (0102030405060708090a0b0c0d0e0f101112131415161718191a1b1c1d1e1f2021)"
>>> Aeson.eitherDecode @GYTokenName "\"gold\""
Left "Error in $: parseJSON @GYTokenName: not base16 encoded (gold)"
>>> Aeson.eitherDecode @GYTokenName "123"
Left "Error in $: parsing Text failed, expected String, but encountered Number"
Instance details

Defined in GeniusYield.Types.Value

Methods

parseJSON ∷ Value → Parser GYTokenName #

parseJSONList ∷ Value → Parser [GYTokenName] #

FromJSON GYAssetClass #
>>> Aeson.decode @GYAssetClass "\"lovelace\""
Just GYLovelace
>>> Aeson.decode @GYAssetClass "\"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.476f6c64\""
Just (GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "Gold")
>>> Aeson.decode @GYAssetClass "\"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.0014df1043727970746f20556e69636f726e\""
Just (GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "\NUL\DC4\223\DLECrypto Unicorn")
Instance details

Defined in GeniusYield.Types.Value

Methods

parseJSON ∷ Value → Parser GYAssetClass #

parseJSONList ∷ Value → Parser [GYAssetClass] #

FromJSON GYValue #
>>> Aeson.decode @GYValue "{\"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.474f4c44\":101,\"lovelace\":22}"
Just (valueFromList [(GYLovelace,22),(GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "GOLD",101)])
Instance details

Defined in GeniusYield.Types.Value

Methods

parseJSON ∷ Value → Parser GYValue #

parseJSONList ∷ Value → Parser [GYValue] #

FromJSON TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Methods

parseJSON ∷ Value → Parser TokenPolicyId #

parseJSONList ∷ Value → Parser [TokenPolicyId] #

FromJSON TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Methods

parseJSON ∷ Value → Parser TokenName #

parseJSONList ∷ Value → Parser [TokenName] #

FromJSON TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

Methods

parseJSON ∷ Value → Parser TokenQuantity #

parseJSONList ∷ Value → Parser [TokenQuantity] #

FromJSON FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSON ∷ Value → Parser FlatAssetQuantity #

parseJSONList ∷ Value → Parser [FlatAssetQuantity] #

FromJSON NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSON ∷ Value → Parser NestedMapEntry #

parseJSONList ∷ Value → Parser [NestedMapEntry] #

FromJSON NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSON ∷ Value → Parser NestedTokenQuantity #

parseJSONList ∷ Value → Parser [NestedTokenQuantity] #

FromJSON Percentage 
Instance details

Defined in Data.Quantity

Methods

parseJSON ∷ Value → Parser Percentage #

parseJSONList ∷ Value → Parser [Percentage] #

FromJSON Ada 
Instance details

Defined in Plutus.Model.Ada

Methods

parseJSON ∷ Value → Parser Ada #

parseJSONList ∷ Value → Parser [Ada] #

FromJSON Slot 
Instance details

Defined in Plutus.Model.Fork.Ledger.Slot

Methods

parseJSON ∷ Value → Parser Slot #

parseJSONList ∷ Value → Parser [Slot] #

FromJSON MaestroUtxo # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroUtxo #

parseJSONList ∷ Value → Parser [MaestroUtxo] #

FromJSON MaestroDatumOption # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroDatumOption #

parseJSONList ∷ Value → Parser [MaestroDatumOption] #

FromJSON MaestroDatumOptionType # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroDatumOptionType #

parseJSONList ∷ Value → Parser [MaestroDatumOptionType] #

FromJSON MaestroScript # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroScript #

parseJSONList ∷ Value → Parser [MaestroScript] #

FromJSON MaestroScriptType # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroScriptType #

parseJSONList ∷ Value → Parser [MaestroScriptType] #

FromJSON MaestroAsset # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroAsset #

parseJSONList ∷ Value → Parser [MaestroAsset] #

FromJSON MaestroAssetClass # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser MaestroAssetClass #

parseJSONList ∷ Value → Parser [MaestroAssetClass] #

FromJSON ScriptDataDetailed # 
Instance details

Defined in GeniusYield.Providers.Maestro

Methods

parseJSON ∷ Value → Parser ScriptDataDetailed #

parseJSONList ∷ Value → Parser [ScriptDataDetailed] #

FromJSON GYCoreConfig # 
Instance details

Defined in GeniusYield.GYConfig

Methods

parseJSON ∷ Value → Parser GYCoreConfig #

parseJSONList ∷ Value → Parser [GYCoreConfig] #

FromJSON GYCoreProviderInfo # 
Instance details

Defined in GeniusYield.GYConfig

Methods

parseJSON ∷ Value → Parser GYCoreProviderInfo #

parseJSONList ∷ Value → Parser [GYCoreProviderInfo] #

FromJSON a ⇒ FromJSON [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser [a] #

parseJSONList ∷ Value → Parser [[a]] #

FromJSON a ⇒ FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Maybe a) #

parseJSONList ∷ Value → Parser [Maybe a] #

(FromJSON a, Integral a) ⇒ FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Ratio a) #

parseJSONList ∷ Value → Parser [Ratio a] #

FromJSON a ⇒ FromJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Min a) #

parseJSONList ∷ Value → Parser [Min a] #

FromJSON a ⇒ FromJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Max a) #

parseJSONList ∷ Value → Parser [Max a] #

FromJSON a ⇒ FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (First a) #

parseJSONList ∷ Value → Parser [First a] #

FromJSON a ⇒ FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Last a) #

parseJSONList ∷ Value → Parser [Last a] #

FromJSON a ⇒ FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (WrappedMonoid a) #

parseJSONList ∷ Value → Parser [WrappedMonoid a] #

FromJSON a ⇒ FromJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Option a) #

parseJSONList ∷ Value → Parser [Option a] #

FromJSON a ⇒ FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Identity a) #

parseJSONList ∷ Value → Parser [Identity a] #

FromJSON a ⇒ FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (First a) #

parseJSONList ∷ Value → Parser [First a] #

FromJSON a ⇒ FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Last a) #

parseJSONList ∷ Value → Parser [Last a] #

FromJSON a ⇒ FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Dual a) #

parseJSONList ∷ Value → Parser [Dual a] #

FromJSON a ⇒ FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (NonEmpty a) #

parseJSONList ∷ Value → Parser [NonEmpty a] #

FromJSON a ⇒ FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (IntMap a) #

parseJSONList ∷ Value → Parser [IntMap a] #

FromJSON v ⇒ FromJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Tree v) #

parseJSONList ∷ Value → Parser [Tree v] #

FromJSON a ⇒ FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Seq a) #

parseJSONList ∷ Value → Parser [Seq a] #

(Ord a, FromJSON a) ⇒ FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Set a) #

parseJSONList ∷ Value → Parser [Set a] #

IsShelleyBasedEra era ⇒ FromJSON (AddressInEra era) 
Instance details

Defined in Cardano.Api.Address

Methods

parseJSON ∷ Value → Parser (AddressInEra era) #

parseJSONList ∷ Value → Parser [AddressInEra era] #

FromJSON (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

Methods

parseJSON ∷ Value → Parser (Hash BlockHeader) #

parseJSONList ∷ Value → Parser [Hash BlockHeader] #

FromJSON (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

Methods

parseJSON ∷ Value → Parser (Hash ScriptData) #

parseJSONList ∷ Value → Parser [Hash ScriptData] #

FromJSON (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

parseJSON ∷ Value → Parser (Hash StakePoolKey) #

parseJSONList ∷ Value → Parser [Hash StakePoolKey] #

(IsCardanoEra era, IsShelleyBasedEra era, FromJSON (TxOut CtxUTxO era)) ⇒ FromJSON (UTxO era) 
Instance details

Defined in Cardano.Api.Query

Methods

parseJSON ∷ Value → Parser (UTxO era) #

parseJSONList ∷ Value → Parser [UTxO era] #

IsSimpleScriptLanguage lang ⇒ FromJSON (SimpleScript lang) 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser (SimpleScript lang) #

parseJSONList ∷ Value → Parser [SimpleScript lang] #

IsCardanoEra era ⇒ FromJSON (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

parseJSON ∷ Value → Parser (TxOutValue era) #

parseJSONList ∷ Value → Parser [TxOutValue era] #

FromJSON a ⇒ FromJSON (StrictSeq a) 
Instance details

Defined in Data.Sequence.Strict

Methods

parseJSON ∷ Value → Parser (StrictSeq a) #

parseJSONList ∷ Value → Parser [StrictSeq a] #

Crypto crypto ⇒ FromJSON (ShelleyGenesisStaking crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Methods

parseJSON ∷ Value → Parser (ShelleyGenesisStaking crypto) #

parseJSONList ∷ Value → Parser [ShelleyGenesisStaking crypto] #

Crypto crypto ⇒ FromJSON (Addr crypto) 
Instance details

Defined in Cardano.Ledger.Address

Methods

parseJSON ∷ Value → Parser (Addr crypto) #

parseJSONList ∷ Value → Parser [Addr crypto] #

Crypto crypto ⇒ FromJSON (GenDelegPair crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

parseJSON ∷ Value → Parser (GenDelegPair crypto) #

parseJSONList ∷ Value → Parser [GenDelegPair crypto] #

FromJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

parseJSON ∷ Value → Parser (PParams era) #

parseJSONList ∷ Value → Parser [PParams era] #

Era era ⇒ FromJSON (ShelleyGenesis era) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Methods

parseJSON ∷ Value → Parser (ShelleyGenesis era) #

parseJSONList ∷ Value → Parser [ShelleyGenesis era] #

FromJSON a ⇒ FromJSON (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

Methods

parseJSON ∷ Value → Parser (StrictMaybe a) #

parseJSONList ∷ Value → Parser [StrictMaybe a] #

Crypto crypto ⇒ FromJSON (PoolParams crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

parseJSON ∷ Value → Parser (PoolParams crypto) #

parseJSONList ∷ Value → Parser [PoolParams crypto] #

FromJSON a ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Vector a) #

parseJSONList ∷ Value → Parser [Vector a] #

FromJSON1 f ⇒ FromJSON (Fix f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Fix f) #

parseJSONList ∷ Value → Parser [Fix f] #

Crypto crypto ⇒ FromJSON (RewardProvenance crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

parseJSON ∷ Value → Parser (RewardProvenance crypto) #

parseJSONList ∷ Value → Parser [RewardProvenance crypto] #

Crypto crypto ⇒ FromJSON (BlocksMade crypto) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser (BlocksMade crypto) #

parseJSONList ∷ Value → Parser [BlocksMade crypto] #

Crypto crypto ⇒ FromJSON (ScriptHash crypto) 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

parseJSON ∷ Value → Parser (ScriptHash crypto) #

parseJSONList ∷ Value → Parser [ScriptHash crypto] #

FromJSON a ⇒ FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (DList a) #

parseJSONList ∷ Value → Parser [DList a] #

(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (HashSet a) #

parseJSONList ∷ Value → Parser [HashSet a] #

(Vector Vector a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Vector a) #

parseJSONList ∷ Value → Parser [Vector a] #

(Storable a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Vector a) #

parseJSONList ∷ Value → Parser [Vector a] #

(Prim a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Vector a) #

parseJSONList ∷ Value → Parser [Vector a] #

Crypto crypto ⇒ FromJSON (RewardProvenancePool crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

parseJSON ∷ Value → Parser (RewardProvenancePool crypto) #

parseJSONList ∷ Value → Parser [RewardProvenancePool crypto] #

Crypto crypto ⇒ FromJSON (RewardAcnt crypto) 
Instance details

Defined in Cardano.Ledger.Address

Methods

parseJSON ∷ Value → Parser (RewardAcnt crypto) #

parseJSONList ∷ Value → Parser [RewardAcnt crypto] #

FromJSON a ⇒ FromJSON (Solo a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Solo a) #

parseJSONList ∷ Value → Parser [Solo a] #

FromJSON v ⇒ FromJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (KeyMap v) #

parseJSONList ∷ Value → Parser [KeyMap v] #

FromJSON a ⇒ FromJSON (DNonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (DNonEmpty a) #

parseJSONList ∷ Value → Parser [DNonEmpty a] #

FromJSON a ⇒ FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Maybe a) #

parseJSONList ∷ Value → Parser [Maybe a] #

FromJSON a ⇒ FromJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Array a) #

parseJSONList ∷ Value → Parser [Array a] #

(Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (Generically a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Generically a) #

parseJSONList ∷ Value → Parser [Generically a] #

(FromJSON1 f, Functor f) ⇒ FromJSON (Mu f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Mu f) #

parseJSONList ∷ Value → Parser [Mu f] #

(FromJSON1 f, Functor f) ⇒ FromJSON (Nu f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Nu f) #

parseJSONList ∷ Value → Parser [Nu f] #

(Prim a, FromJSON a) ⇒ FromJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (PrimArray a) #

parseJSONList ∷ Value → Parser [PrimArray a] #

FromJSON a ⇒ FromJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (SmallArray a) #

parseJSONList ∷ Value → Parser [SmallArray a] #

IsCardanoEra era ⇒ FromJSON (ReferenceScript era) 
Instance details

Defined in Cardano.Api.Script

Methods

parseJSON ∷ Value → Parser (ReferenceScript era) #

parseJSONList ∷ Value → Parser [ReferenceScript era] #

FromJSON a ⇒ FromJSON (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

Methods

parseJSON ∷ Value → Parser (RedeemSignature a) #

parseJSONList ∷ Value → Parser [RedeemSignature a] #

FromJSON (Signature w) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Methods

parseJSON ∷ Value → Parser (Signature w) #

parseJSONList ∷ Value → Parser [Signature w] #

Crypto crypto ⇒ FromJSON (StakeCreds crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

parseJSON ∷ Value → Parser (StakeCreds crypto) #

parseJSONList ∷ Value → Parser [StakeCreds crypto] #

FromJSON (BuiltinCostModelBase CostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser (BuiltinCostModelBase CostingFun) #

parseJSONList ∷ Value → Parser [BuiltinCostModelBase CostingFun] #

FromJSON model ⇒ FromJSON (CostingFun model) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

parseJSON ∷ Value → Parser (CostingFun model) #

parseJSONList ∷ Value → Parser [CostingFun model] #

FromJSON d ⇒ FromJSON (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

Methods

parseJSON ∷ Value → Parser (LinearTransform d) #

parseJSONList ∷ Value → Parser [LinearTransform d] #

FromJSON a ⇒ FromJSON (Item a) 
Instance details

Defined in Katip.Core

Methods

parseJSON ∷ Value → Parser (Item a) #

parseJSONList ∷ Value → Parser [Item a] #

FromJSON (CollectionFormat ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (CollectionFormat ('SwaggerKindNormal t)) #

parseJSONList ∷ Value → Parser [CollectionFormat ('SwaggerKindNormal t)] #

FromJSON (CollectionFormat ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (CollectionFormat 'SwaggerKindParamOtherSchema) #

parseJSONList ∷ Value → Parser [CollectionFormat 'SwaggerKindParamOtherSchema] #

FromJSON (ParamSchema ('SwaggerKindSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (ParamSchema 'SwaggerKindSchema) #

parseJSONList ∷ Value → Parser [ParamSchema 'SwaggerKindSchema] #

(FromJSON (SwaggerType ('SwaggerKindNormal t)), FromJSON (SwaggerItems ('SwaggerKindNormal t))) ⇒ FromJSON (ParamSchema ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (ParamSchema ('SwaggerKindNormal t)) #

parseJSONList ∷ Value → Parser [ParamSchema ('SwaggerKindNormal t)] #

FromJSON (ParamSchema ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (ParamSchema 'SwaggerKindParamOtherSchema) #

parseJSONList ∷ Value → Parser [ParamSchema 'SwaggerKindParamOtherSchema] #

FromJSON (Referenced Param) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (Referenced Param) #

parseJSONList ∷ Value → Parser [Referenced Param] #

FromJSON (Referenced Response) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (Referenced Response) #

parseJSONList ∷ Value → Parser [Referenced Response] #

FromJSON (Referenced Schema) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (Referenced Schema) #

parseJSONList ∷ Value → Parser [Referenced Schema] #

FromJSON (SwaggerItems ('SwaggerKindSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerItems 'SwaggerKindSchema) #

parseJSONList ∷ Value → Parser [SwaggerItems 'SwaggerKindSchema] #

(FromJSON (CollectionFormat ('SwaggerKindNormal t)), FromJSON (ParamSchema ('SwaggerKindNormal t))) ⇒ FromJSON (SwaggerItems ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerItems ('SwaggerKindNormal t)) #

parseJSONList ∷ Value → Parser [SwaggerItems ('SwaggerKindNormal t)] #

FromJSON (SwaggerItems ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerItems 'SwaggerKindParamOtherSchema) #

parseJSONList ∷ Value → Parser [SwaggerItems 'SwaggerKindParamOtherSchema] #

FromJSON (SwaggerType ('SwaggerKindSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerType 'SwaggerKindSchema) #

parseJSONList ∷ Value → Parser [SwaggerType 'SwaggerKindSchema] #

FromJSON (SwaggerType ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerType ('SwaggerKindNormal t)) #

parseJSONList ∷ Value → Parser [SwaggerType ('SwaggerKindNormal t)] #

FromJSON (SwaggerType ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

Methods

parseJSON ∷ Value → Parser (SwaggerType 'SwaggerKindParamOtherSchema) #

parseJSONList ∷ Value → Parser [SwaggerType 'SwaggerKindParamOtherSchema] #

(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (InsOrdHashSet a) 
Instance details

Defined in Data.HashSet.InsOrd

Methods

parseJSON ∷ Value → Parser (InsOrdHashSet a) #

parseJSONList ∷ Value → Parser [InsOrdHashSet a] #

FromJSON (Flat TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSON ∷ Value → Parser (Flat TokenMap) #

parseJSONList ∷ Value → Parser [Flat TokenMap] #

FromJSON (Nested TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSON ∷ Value → Parser (Nested TokenMap) #

parseJSONList ∷ Value → Parser [Nested TokenMap] #

(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Either a b) #

parseJSONList ∷ Value → Parser [Either a b] #

(FromJSON a, FromJSON b) ⇒ FromJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b) #

parseJSONList ∷ Value → Parser [(a, b)] #

HasResolution a ⇒ FromJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Fixed a) #

parseJSONList ∷ Value → Parser [Fixed a] #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Proxy a) #

parseJSONList ∷ Value → Parser [Proxy a] #

(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Map k v) #

parseJSONList ∷ Value → Parser [Map k v] #

FromJSON (EraInMode AllegraEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode AllegraEra CardanoMode) #

parseJSONList ∷ Value → Parser [EraInMode AllegraEra CardanoMode] #

FromJSON (EraInMode AlonzoEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode AlonzoEra CardanoMode) #

parseJSONList ∷ Value → Parser [EraInMode AlonzoEra CardanoMode] #

FromJSON (EraInMode ByronEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode ByronEra CardanoMode) #

parseJSONList ∷ Value → Parser [EraInMode ByronEra CardanoMode] #

FromJSON (EraInMode ByronEra ByronMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode ByronEra ByronMode) #

parseJSONList ∷ Value → Parser [EraInMode ByronEra ByronMode] #

FromJSON (EraInMode MaryEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode MaryEra CardanoMode) #

parseJSONList ∷ Value → Parser [EraInMode MaryEra CardanoMode] #

FromJSON (EraInMode ShelleyEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode ShelleyEra CardanoMode) #

parseJSONList ∷ Value → Parser [EraInMode ShelleyEra CardanoMode] #

FromJSON (EraInMode ShelleyEra ShelleyMode) 
Instance details

Defined in Cardano.Api.Modes

Methods

parseJSON ∷ Value → Parser (EraInMode ShelleyEra ShelleyMode) #

parseJSONList ∷ Value → Parser [EraInMode ShelleyEra ShelleyMode] #

(IsShelleyBasedEra era, IsCardanoEra era) ⇒ FromJSON (TxOut CtxTx era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

parseJSON ∷ Value → Parser (TxOut CtxTx era) #

parseJSONList ∷ Value → Parser [TxOut CtxTx era] #

(IsShelleyBasedEra era, IsCardanoEra era) ⇒ FromJSON (TxOut CtxUTxO era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

parseJSON ∷ Value → Parser (TxOut CtxUTxO era) #

parseJSONList ∷ Value → Parser [TxOut CtxUTxO era] #

Crypto crypto ⇒ FromJSON (KeyHash disc crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

parseJSON ∷ Value → Parser (KeyHash disc crypto) #

parseJSONList ∷ Value → Parser [KeyHash disc crypto] #

HashAlgorithm h ⇒ FromJSON (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

parseJSON ∷ Value → Parser (Hash h a) #

parseJSONList ∷ Value → Parser [Hash h a] #

FromJSON b ⇒ FromJSON (Annotated b ()) 
Instance details

Defined in Cardano.Binary.Annotated

Methods

parseJSON ∷ Value → Parser (Annotated b ()) #

parseJSONList ∷ Value → Parser [Annotated b ()] #

HashAlgorithm algo ⇒ FromJSON (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

Methods

parseJSON ∷ Value → Parser (AbstractHash algo a) #

parseJSONList ∷ Value → Parser [AbstractHash algo a] #

Crypto crypto ⇒ FromJSON (Credential kr crypto) 
Instance details

Defined in Cardano.Ledger.Credential

Methods

parseJSON ∷ Value → Parser (Credential kr crypto) #

parseJSONList ∷ Value → Parser [Credential kr crypto] #

(FromJSON v, FromJSONKey k, Eq k, Hashable k) ⇒ FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (HashMap k v) #

parseJSONList ∷ Value → Parser [HashMap k v] #

(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Either a b) #

parseJSONList ∷ Value → Parser [Either a b] #

(FromJSON a, FromJSON b) ⇒ FromJSON (Pair a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Pair a b) #

parseJSONList ∷ Value → Parser [Pair a b] #

(FromJSON a, FromJSON b) ⇒ FromJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (These a b) #

parseJSONList ∷ Value → Parser [These a b] #

(FromJSON a, FromJSON b) ⇒ FromJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (These a b) #

parseJSONList ∷ Value → Parser [These a b] #

Bounded (BoundedRatio b Word64) ⇒ FromJSON (BoundedRatio b Word64) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSON ∷ Value → Parser (BoundedRatio b Word64) #

parseJSONList ∷ Value → Parser [BoundedRatio b Word64] #

(FromJSONKey k, Ord k, FromJSON a) ⇒ FromJSON (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

Methods

parseJSON ∷ Value → Parser (MonoidalMap k a) #

parseJSONList ∷ Value → Parser [MonoidalMap k a] #

(Eq k, Hashable k, FromJSONKey k, FromJSON v) ⇒ FromJSON (InsOrdHashMap k v) 
Instance details

Defined in Data.HashMap.Strict.InsOrd

Methods

parseJSON ∷ Value → Parser (InsOrdHashMap k v) #

parseJSONList ∷ Value → Parser [InsOrdHashMap k v] #

(KnownSymbol unit, FromJSON a) ⇒ FromJSON (Quantity unit a) 
Instance details

Defined in Data.Quantity

Methods

parseJSON ∷ Value → Parser (Quantity unit a) #

parseJSONList ∷ Value → Parser [Quantity unit a] #

(FromJSON a, FromJSON b, FromJSON c) ⇒ FromJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c) #

parseJSONList ∷ Value → Parser [(a, b, c)] #

FromJSON a ⇒ FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Const a b) #

parseJSONList ∷ Value → Parser [Const a b] #

FromJSON b ⇒ FromJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Tagged a b) #

parseJSONList ∷ Value → Parser [Tagged a b] #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (These1 f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (These1 f g a) #

parseJSONList ∷ Value → Parser [These1 f g a] #

(AesonOptions t, Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (CustomJSON t a) 
Instance details

Defined in Deriving.Aeson

Methods

parseJSON ∷ Value → Parser (CustomJSON t a) #

parseJSONList ∷ Value → Parser [CustomJSON t a] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d) ⇒ FromJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d) #

parseJSONList ∷ Value → Parser [(a, b, c, d)] #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Product f g a) #

parseJSONList ∷ Value → Parser [Product f g a] #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Sum f g a) #

parseJSONList ∷ Value → Parser [Sum f g a] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e) ⇒ FromJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e)] #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (Compose f g a) #

parseJSONList ∷ Value → Parser [Compose f g a] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f) ⇒ FromJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g) ⇒ FromJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h) ⇒ FromJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i) ⇒ FromJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n, FromJSON o) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class ToJSON a where #

Minimal complete definition

Nothing

Methods

toJSON ∷ a → Value #

toEncoding ∷ a → Encoding #

toJSONList ∷ [a] → Value #

toEncodingList ∷ [a] → Encoding #

Instances

Instances details
ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONBool → Value #

toEncodingBool → Encoding #

toJSONList ∷ [Bool] → Value #

toEncodingList ∷ [Bool] → Encoding #

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONChar → Value #

toEncodingChar → Encoding #

toJSONList ∷ [Char] → Value #

toEncodingList ∷ [Char] → Encoding #

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONDouble → Value #

toEncodingDouble → Encoding #

toJSONList ∷ [Double] → Value #

toEncodingList ∷ [Double] → Encoding #

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONFloat → Value #

toEncodingFloat → Encoding #

toJSONList ∷ [Float] → Value #

toEncodingList ∷ [Float] → Encoding #

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInt → Value #

toEncodingInt → Encoding #

toJSONList ∷ [Int] → Value #

toEncodingList ∷ [Int] → Encoding #

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInt8 → Value #

toEncodingInt8 → Encoding #

toJSONList ∷ [Int8] → Value #

toEncodingList ∷ [Int8] → Encoding #

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInt16 → Value #

toEncodingInt16 → Encoding #

toJSONList ∷ [Int16] → Value #

toEncodingList ∷ [Int16] → Encoding #

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInt32 → Value #

toEncodingInt32 → Encoding #

toJSONList ∷ [Int32] → Value #

toEncodingList ∷ [Int32] → Encoding #

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInt64 → Value #

toEncodingInt64 → Encoding #

toJSONList ∷ [Int64] → Value #

toEncodingList ∷ [Int64] → Encoding #

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONInteger → Value #

toEncodingInteger → Encoding #

toJSONList ∷ [Integer] → Value #

toEncodingList ∷ [Integer] → Encoding #

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONNatural → Value #

toEncodingNatural → Encoding #

toJSONList ∷ [Natural] → Value #

toEncodingList ∷ [Natural] → Encoding #

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONOrdering → Value #

toEncodingOrdering → Encoding #

toJSONList ∷ [Ordering] → Value #

toEncodingList ∷ [Ordering] → Encoding #

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWord → Value #

toEncodingWord → Encoding #

toJSONList ∷ [Word] → Value #

toEncodingList ∷ [Word] → Encoding #

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWord8 → Value #

toEncodingWord8 → Encoding #

toJSONList ∷ [Word8] → Value #

toEncodingList ∷ [Word8] → Encoding #

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWord16 → Value #

toEncodingWord16 → Encoding #

toJSONList ∷ [Word16] → Value #

toEncodingList ∷ [Word16] → Encoding #

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWord32 → Value #

toEncodingWord32 → Encoding #

toJSONList ∷ [Word32] → Value #

toEncodingList ∷ [Word32] → Encoding #

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWord64 → Value #

toEncodingWord64 → Encoding #

toJSONList ∷ [Word64] → Value #

toEncodingList ∷ [Word64] → Encoding #

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ () → Value #

toEncoding ∷ () → Encoding #

toJSONList ∷ [()] → Value #

toEncodingList ∷ [()] → Encoding #

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONVoid → Value #

toEncodingVoid → Encoding #

toJSONList ∷ [Void] → Value #

toEncodingList ∷ [Void] → Encoding #

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONVersion → Value #

toEncodingVersion → Encoding #

toJSONList ∷ [Version] → Value #

toEncodingList ∷ [Version] → Encoding #

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONCTime → Value #

toEncodingCTime → Encoding #

toJSONList ∷ [CTime] → Value #

toEncodingList ∷ [CTime] → Encoding #

(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # 
Instance details

Defined in GeniusYield.Imports

Methods

toJSONByteString → Value #

toEncodingByteString → Encoding #

toJSONList ∷ [ByteString] → Value #

toEncodingList ∷ [ByteString] → Encoding #

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONIntSet → Value #

toEncodingIntSet → Encoding #

toJSONList ∷ [IntSet] → Value #

toEncodingList ∷ [IntSet] → Encoding #

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONText → Value #

toEncodingText → Encoding #

toJSONList ∷ [Text] → Value #

toEncodingList ∷ [Text] → Encoding #

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONText → Value #

toEncodingText → Encoding #

toJSONList ∷ [Text] → Value #

toEncodingList ∷ [Text] → Encoding #

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONZonedTime → Value #

toEncodingZonedTime → Encoding #

toJSONList ∷ [ZonedTime] → Value #

toEncodingList ∷ [ZonedTime] → Encoding #

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONLocalTime → Value #

toEncodingLocalTime → Encoding #

toJSONList ∷ [LocalTime] → Value #

toEncodingList ∷ [LocalTime] → Encoding #

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONTimeOfDay → Value #

toEncodingTimeOfDay → Encoding #

toJSONList ∷ [TimeOfDay] → Value #

toEncodingList ∷ [TimeOfDay] → Encoding #

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONCalendarDiffTime → Value #

toEncodingCalendarDiffTime → Encoding #

toJSONList ∷ [CalendarDiffTime] → Value #

toEncodingList ∷ [CalendarDiffTime] → Encoding #

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONUTCTime → Value #

toEncodingUTCTime → Encoding #

toJSONList ∷ [UTCTime] → Value #

toEncodingList ∷ [UTCTime] → Encoding #

ToJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONSystemTime → Value #

toEncodingSystemTime → Encoding #

toJSONList ∷ [SystemTime] → Value #

toEncodingList ∷ [SystemTime] → Encoding #

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONNominalDiffTime → Value #

toEncodingNominalDiffTime → Encoding #

toJSONList ∷ [NominalDiffTime] → Value #

toEncodingList ∷ [NominalDiffTime] → Encoding #

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONDiffTime → Value #

toEncodingDiffTime → Encoding #

toJSONList ∷ [DiffTime] → Value #

toEncodingList ∷ [DiffTime] → Encoding #

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONDayOfWeek → Value #

toEncodingDayOfWeek → Encoding #

toJSONList ∷ [DayOfWeek] → Value #

toEncodingList ∷ [DayOfWeek] → Encoding #

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONDay → Value #

toEncodingDay → Encoding #

toJSONList ∷ [Day] → Value #

toEncodingList ∷ [Day] → Encoding #

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONCalendarDiffDays → Value #

toEncodingCalendarDiffDays → Encoding #

toJSONList ∷ [CalendarDiffDays] → Value #

toEncodingList ∷ [CalendarDiffDays] → Encoding #

ToJSON StakeAddress 
Instance details

Defined in Cardano.Api.Address

Methods

toJSON ∷ StakeAddress → Value #

toEncoding ∷ StakeAddress → Encoding #

toJSONList ∷ [StakeAddress] → Value #

toEncodingList ∷ [StakeAddress] → Encoding #

ToJSON StakeCredential 
Instance details

Defined in Cardano.Api.Address

Methods

toJSON ∷ StakeCredential → Value #

toEncoding ∷ StakeCredential → Encoding #

toJSONList ∷ [StakeCredential] → Value #

toEncodingList ∷ [StakeCredential] → Encoding #

ToJSON ChainTip 
Instance details

Defined in Cardano.Api.Block

Methods

toJSON ∷ ChainTip → Value #

toEncoding ∷ ChainTip → Encoding #

toJSONList ∷ [ChainTip] → Value #

toEncodingList ∷ [ChainTip] → Encoding #

ToJSON AnyCardanoEra 
Instance details

Defined in Cardano.Api.Eras

Methods

toJSON ∷ AnyCardanoEra → Value #

toEncoding ∷ AnyCardanoEra → Encoding #

toJSONList ∷ [AnyCardanoEra] → Value #

toEncodingList ∷ [AnyCardanoEra] → Encoding #

ToJSON CostModel 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

toJSON ∷ CostModel → Value #

toEncoding ∷ CostModel → Encoding #

toJSONList ∷ [CostModel] → Value #

toEncodingList ∷ [CostModel] → Encoding #

ToJSON ExecutionUnitPrices 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

toJSON ∷ ExecutionUnitPrices → Value #

toEncoding ∷ ExecutionUnitPrices → Encoding #

toJSONList ∷ [ExecutionUnitPrices] → Value #

toEncodingList ∷ [ExecutionUnitPrices] → Encoding #

ToJSON PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

toJSON ∷ PraosNonce → Value #

toEncoding ∷ PraosNonce → Encoding #

toJSONList ∷ [PraosNonce] → Value #

toEncodingList ∷ [PraosNonce] → Encoding #

ToJSON AnyPlutusScriptVersion 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ AnyPlutusScriptVersion → Value #

toEncoding ∷ AnyPlutusScriptVersion → Encoding #

toJSONList ∷ [AnyPlutusScriptVersion] → Value #

toEncodingList ∷ [AnyPlutusScriptVersion] → Encoding #

ToJSON ExecutionUnits 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ ExecutionUnits → Value #

toEncoding ∷ ExecutionUnits → Encoding #

toJSONList ∷ [ExecutionUnits] → Value #

toEncodingList ∷ [ExecutionUnits] → Encoding #

ToJSON ScriptHash 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ ScriptHash → Value #

toEncoding ∷ ScriptHash → Encoding #

toJSONList ∷ [ScriptHash] → Value #

toEncodingList ∷ [ScriptHash] → Encoding #

ToJSON ScriptInAnyLang 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ ScriptInAnyLang → Value #

toEncoding ∷ ScriptInAnyLang → Encoding #

toJSONList ∷ [ScriptInAnyLang] → Value #

toEncodingList ∷ [ScriptInAnyLang] → Encoding #

ToJSON TextEnvelope 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

toJSON ∷ TextEnvelope → Value #

toEncoding ∷ TextEnvelope → Encoding #

toJSONList ∷ [TextEnvelope] → Value #

toEncodingList ∷ [TextEnvelope] → Encoding #

ToJSON TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

toJSON ∷ TextEnvelopeDescr → Value #

toEncoding ∷ TextEnvelopeDescr → Encoding #

toJSONList ∷ [TextEnvelopeDescr] → Value #

toEncodingList ∷ [TextEnvelopeDescr] → Encoding #

ToJSON TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

Methods

toJSON ∷ TextEnvelopeType → Value #

toEncoding ∷ TextEnvelopeType → Encoding #

toJSONList ∷ [TextEnvelopeType] → Value #

toEncodingList ∷ [TextEnvelopeType] → Encoding #

ToJSON TxId 
Instance details

Defined in Cardano.Api.TxIn

Methods

toJSON ∷ TxId → Value #

toEncoding ∷ TxId → Encoding #

toJSONList ∷ [TxId] → Value #

toEncodingList ∷ [TxId] → Encoding #

ToJSON TxIn 
Instance details

Defined in Cardano.Api.TxIn

Methods

toJSON ∷ TxIn → Value #

toEncoding ∷ TxIn → Encoding #

toJSONList ∷ [TxIn] → Value #

toEncodingList ∷ [TxIn] → Encoding #

ToJSON TxIx 
Instance details

Defined in Cardano.Api.TxIn

Methods

toJSON ∷ TxIx → Value #

toEncoding ∷ TxIx → Encoding #

toJSONList ∷ [TxIx] → Value #

toEncodingList ∷ [TxIx] → Encoding #

ToJSON AssetName 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ AssetName → Value #

toEncoding ∷ AssetName → Encoding #

toJSONList ∷ [AssetName] → Value #

toEncodingList ∷ [AssetName] → Encoding #

ToJSON Lovelace 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ Lovelace → Value #

toEncoding ∷ Lovelace → Encoding #

toJSONList ∷ [Lovelace] → Value #

toEncodingList ∷ [Lovelace] → Encoding #

ToJSON PolicyId 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ PolicyId → Value #

toEncoding ∷ PolicyId → Encoding #

toJSONList ∷ [PolicyId] → Value #

toEncodingList ∷ [PolicyId] → Encoding #

ToJSON Quantity 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ Quantity → Value #

toEncoding ∷ Quantity → Encoding #

toJSONList ∷ [Quantity] → Value #

toEncodingList ∷ [Quantity] → Encoding #

ToJSON Value 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ Value → Value0 #

toEncoding ∷ Value → Encoding #

toJSONList ∷ [Value] → Value0 #

toEncodingList ∷ [Value] → Encoding #

ToJSON ValueNestedRep 
Instance details

Defined in Cardano.Api.Value

Methods

toJSON ∷ ValueNestedRep → Value #

toEncoding ∷ ValueNestedRep → Encoding #

toJSONList ∷ [ValueNestedRep] → Value #

toEncodingList ∷ [ValueNestedRep] → Encoding #

ToJSON EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

toJSON ∷ EpochNo → Value #

toEncoding ∷ EpochNo → Encoding #

toJSONList ∷ [EpochNo] → Value #

toEncodingList ∷ [EpochNo] → Encoding #

ToJSON SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

Methods

toJSON ∷ SlotNo → Value #

toEncoding ∷ SlotNo → Encoding #

toJSONList ∷ [SlotNo] → Value #

toEncodingList ∷ [SlotNo] → Encoding #

ToJSON ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ ProtVer → Value #

toEncoding ∷ ProtVer → Encoding #

toJSONList ∷ [ProtVer] → Value #

toEncodingList ∷ [ProtVer] → Encoding #

ToJSON RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

toJSON ∷ RequiresNetworkMagic → Value #

toEncoding ∷ RequiresNetworkMagic → Encoding #

toJSONList ∷ [RequiresNetworkMagic] → Value #

toEncodingList ∷ [RequiresNetworkMagic] → Encoding #

ToJSON ProtocolVersion 
Instance details

Defined in Cardano.Chain.Update.ProtocolVersion

Methods

toJSON ∷ ProtocolVersion → Value #

toEncoding ∷ ProtocolVersion → Encoding #

toJSONList ∷ [ProtocolVersion] → Value #

toEncodingList ∷ [ProtocolVersion] → Encoding #

ToJSON ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

toJSON ∷ ProtocolMagicId → Value #

toEncoding ∷ ProtocolMagicId → Encoding #

toJSONList ∷ [ProtocolMagicId] → Value #

toEncodingList ∷ [ProtocolMagicId] → Encoding #

ToJSON SoftwareVersion 
Instance details

Defined in Cardano.Chain.Update.SoftwareVersion

Methods

toJSON ∷ SoftwareVersion → Value #

toEncoding ∷ SoftwareVersion → Encoding #

toJSONList ∷ [SoftwareVersion] → Value #

toEncodingList ∷ [SoftwareVersion] → Encoding #

ToJSON CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

Methods

toJSON ∷ CompactRedeemVerificationKey → Value #

toEncoding ∷ CompactRedeemVerificationKey → Encoding #

toJSONList ∷ [CompactRedeemVerificationKey] → Value #

toEncodingList ∷ [CompactRedeemVerificationKey] → Encoding #

ToJSON Lovelace 
Instance details

Defined in Cardano.Chain.Common.Lovelace

Methods

toJSON ∷ Lovelace → Value #

toEncoding ∷ Lovelace → Encoding #

toJSONList ∷ [Lovelace] → Value #

toEncodingList ∷ [Lovelace] → Encoding #

ToJSON VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

Methods

toJSON ∷ VerificationKey → Value #

toEncoding ∷ VerificationKey → Encoding #

toJSONList ∷ [VerificationKey] → Value #

toEncodingList ∷ [VerificationKey] → Encoding #

ToJSON GenesisHash 
Instance details

Defined in Cardano.Chain.Genesis.Hash

Methods

toJSON ∷ GenesisHash → Value #

toEncoding ∷ GenesisHash → Encoding #

toJSONList ∷ [GenesisHash] → Value #

toEncodingList ∷ [GenesisHash] → Encoding #

ToJSON SlotNumber 
Instance details

Defined in Cardano.Chain.Slotting.SlotNumber

Methods

toJSON ∷ SlotNumber → Value #

toEncoding ∷ SlotNumber → Encoding #

toJSONList ∷ [SlotNumber] → Value #

toEncodingList ∷ [SlotNumber] → Encoding #

ToJSON Tx 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Methods

toJSON ∷ Tx → Value #

toEncoding ∷ Tx → Encoding #

toJSONList ∷ [Tx] → Value #

toEncodingList ∷ [Tx] → Encoding #

ToJSON ByteSpan 
Instance details

Defined in Cardano.Binary.Annotated

Methods

toJSON ∷ ByteSpan → Value #

toEncoding ∷ ByteSpan → Encoding #

toJSONList ∷ [ByteSpan] → Value #

toEncodingList ∷ [ByteSpan] → Encoding #

ToJSON EpochNumber 
Instance details

Defined in Cardano.Chain.Slotting.EpochNumber

Methods

toJSON ∷ EpochNumber → Value #

toEncoding ∷ EpochNumber → Encoding #

toJSONList ∷ [EpochNumber] → Value #

toEncodingList ∷ [EpochNumber] → Encoding #

ToJSON ProtocolMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Methods

toJSON ∷ ProtocolMagic → Value #

toEncoding ∷ ProtocolMagic → Encoding #

toJSONList ∷ [ProtocolMagic] → Value #

toEncodingList ∷ [ProtocolMagic] → Encoding #

ToJSON PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ PositiveUnitInterval → Value #

toEncoding ∷ PositiveUnitInterval → Encoding #

toJSONList ∷ [PositiveUnitInterval] → Value #

toEncodingList ∷ [PositiveUnitInterval] → Encoding #

ToJSON Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ Network → Value #

toEncoding ∷ Network → Encoding #

toJSONList ∷ [Network] → Value #

toEncodingList ∷ [Network] → Encoding #

ToJSON Coin 
Instance details

Defined in Cardano.Ledger.Coin

Methods

toJSON ∷ Coin → Value #

toEncoding ∷ Coin → Encoding #

toJSONList ∷ [Coin] → Value #

toEncodingList ∷ [Coin] → Encoding #

ToJSON Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ Nonce → Value #

toEncoding ∷ Nonce → Encoding #

toJSONList ∷ [Nonce] → Value #

toEncodingList ∷ [Nonce] → Encoding #

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Value → Value #

toEncoding ∷ Value → Encoding #

toJSONList ∷ [Value] → Value #

toEncodingList ∷ [Value] → Encoding #

ToJSON Key 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Key → Value #

toEncoding ∷ Key → Encoding #

toJSONList ∷ [Key] → Value #

toEncodingList ∷ [Key] → Encoding #

ToJSON StakePoolRelay 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toJSON ∷ StakePoolRelay → Value #

toEncoding ∷ StakePoolRelay → Encoding #

toJSONList ∷ [StakePoolRelay] → Value #

toEncodingList ∷ [StakePoolRelay] → Encoding #

ToJSON RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Methods

toJSON ∷ RewardParams → Value #

toEncoding ∷ RewardParams → Encoding #

toJSONList ∷ [RewardParams] → Value #

toEncodingList ∷ [RewardParams] → Encoding #

ToJSON RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Methods

toJSON ∷ RewardInfoPool → Value #

toEncoding ∷ RewardInfoPool → Encoding #

toJSONList ∷ [RewardInfoPool] → Value #

toEncodingList ∷ [RewardInfoPool] → Encoding #

ToJSON UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ UnitInterval → Value #

toEncoding ∷ UnitInterval → Encoding #

toJSONList ∷ [UnitInterval] → Value #

toEncodingList ∷ [UnitInterval] → Encoding #

ToJSON NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ NonNegativeInterval → Value #

toEncoding ∷ NonNegativeInterval → Encoding #

toJSONList ∷ [NonNegativeInterval] → Value #

toEncodingList ∷ [NonNegativeInterval] → Encoding #

ToJSON AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

Methods

toJSON ∷ AlonzoGenesis → Value #

toEncoding ∷ AlonzoGenesis → Encoding #

toJSONList ∷ [AlonzoGenesis] → Value #

toEncodingList ∷ [AlonzoGenesis] → Encoding #

ToJSON ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

toJSON ∷ ExCPU → Value #

toEncoding ∷ ExCPU → Encoding #

toJSONList ∷ [ExCPU] → Value #

toEncodingList ∷ [ExCPU] → Encoding #

ToJSON ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

toJSON ∷ ExMemory → Value #

toEncoding ∷ ExMemory → Encoding #

toJSONList ∷ [ExMemory] → Value #

toEncodingList ∷ [ExMemory] → Encoding #

ToJSON ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Methods

toJSON ∷ ExBudget → Value #

toEncoding ∷ ExBudget → Encoding #

toJSONList ∷ [ExBudget] → Value #

toEncodingList ∷ [ExBudget] → Encoding #

ToJSON Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

toJSON ∷ Desirability → Value #

toEncoding ∷ Desirability → Encoding #

toJSONList ∷ [Desirability] → Value #

toEncodingList ∷ [Desirability] → Encoding #

ToJSON PoolMetadata 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toJSON ∷ PoolMetadata → Value #

toEncoding ∷ PoolMetadata → Encoding #

toJSONList ∷ [PoolMetadata] → Value #

toEncodingList ∷ [PoolMetadata] → Encoding #

ToJSON Number 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Number → Value #

toEncoding ∷ Number → Encoding #

toJSONList ∷ [Number] → Value #

toEncodingList ∷ [Number] → Encoding #

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Scientific → Value #

toEncoding ∷ Scientific → Encoding #

toJSONList ∷ [Scientific] → Value #

toEncodingList ∷ [Scientific] → Encoding #

ToJSON ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

toJSON ∷ ProtocolParameters → Value #

toEncoding ∷ ProtocolParameters → Encoding #

toJSONList ∷ [ProtocolParameters] → Value #

toEncodingList ∷ [ProtocolParameters] → Encoding #

ToJSON EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

Methods

toJSON ∷ EpochSize → Value #

toEncoding ∷ EpochSize → Encoding #

toJSONList ∷ [EpochSize] → Value #

toEncodingList ∷ [EpochSize] → Encoding #

ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ DotNetTime → Value #

toEncoding ∷ DotNetTime → Encoding #

toJSONList ∷ [DotNetTime] → Value #

toEncodingList ∷ [DotNetTime] → Encoding #

ToJSON Month 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Month → Value #

toEncoding ∷ Month → Encoding #

toJSONList ∷ [Month] → Value #

toEncodingList ∷ [Month] → Encoding #

ToJSON Quarter 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Quarter → Value #

toEncoding ∷ Quarter → Encoding #

toJSONList ∷ [Quarter] → Value #

toEncodingList ∷ [Quarter] → Encoding #

ToJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ QuarterOfYear → Value #

toEncoding ∷ QuarterOfYear → Encoding #

toJSONList ∷ [QuarterOfYear] → Value #

toEncodingList ∷ [QuarterOfYear] → Encoding #

ToJSON ShortText 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ ShortText → Value #

toEncoding ∷ ShortText → Encoding #

toJSONList ∷ [ShortText] → Value #

toEncodingList ∷ [ShortText] → Encoding #

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ UUID → Value #

toEncoding ∷ UUID → Encoding #

toJSONList ∷ [UUID] → Value #

toEncodingList ∷ [UUID] → Encoding #

ToJSON BaseUrl 
Instance details

Defined in Servant.Client.Core.BaseUrl

Methods

toJSON ∷ BaseUrl → Value #

toEncoding ∷ BaseUrl → Encoding #

toJSONList ∷ [BaseUrl] → Value #

toEncodingList ∷ [BaseUrl] → Encoding #

ToJSON ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Methods

toJSON ∷ ByteString64 → Value #

toEncoding ∷ ByteString64 → Encoding #

toJSONList ∷ [ByteString64] → Value #

toEncodingList ∷ [ByteString64] → Encoding #

ToJSON Address 
Instance details

Defined in Cardano.Chain.Common.Address

Methods

toJSON ∷ Address → Value #

toEncoding ∷ Address → Encoding #

toJSONList ∷ [Address] → Value #

toEncodingList ∷ [Address] → Encoding #

ToJSON NetworkMagic 
Instance details

Defined in Cardano.Chain.Common.NetworkMagic

Methods

toJSON ∷ NetworkMagic → Value #

toEncoding ∷ NetworkMagic → Encoding #

toJSONList ∷ [NetworkMagic] → Value #

toEncodingList ∷ [NetworkMagic] → Encoding #

ToJSON AddrAttributes 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Methods

toJSON ∷ AddrAttributes → Value #

toEncoding ∷ AddrAttributes → Encoding #

toJSONList ∷ [AddrAttributes] → Value #

toEncodingList ∷ [AddrAttributes] → Encoding #

ToJSON HDAddressPayload 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Methods

toJSON ∷ HDAddressPayload → Value #

toEncoding ∷ HDAddressPayload → Encoding #

toJSONList ∷ [HDAddressPayload] → Value #

toEncodingList ∷ [HDAddressPayload] → Encoding #

ToJSON Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ Url → Value #

toEncoding ∷ Url → Encoding #

toJSONList ∷ [Url] → Value #

toEncodingList ∷ [Url] → Encoding #

ToJSON CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Methods

toJSON ∷ CekMachineCosts → Value #

toEncoding ∷ CekMachineCosts → Encoding #

toJSONList ∷ [CekMachineCosts] → Value #

toEncodingList ∷ [CekMachineCosts] → Encoding #

ToJSON TxInWitness 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Methods

toJSON ∷ TxInWitness → Value #

toEncoding ∷ TxInWitness → Encoding #

toJSONList ∷ [TxInWitness] → Value #

toEncodingList ∷ [TxInWitness] → Encoding #

ToJSON TxSigData 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Methods

toJSON ∷ TxSigData → Value #

toEncoding ∷ TxSigData → Encoding #

toJSONList ∷ [TxSigData] → Value #

toEncodingList ∷ [TxSigData] → Encoding #

ToJSON TxIn 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Methods

toJSON ∷ TxIn → Value #

toEncoding ∷ TxIn → Encoding #

toJSONList ∷ [TxIn] → Value #

toEncodingList ∷ [TxIn] → Encoding #

ToJSON RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

Methods

toJSON ∷ RedeemVerificationKey → Value #

toEncoding ∷ RedeemVerificationKey → Encoding #

toJSONList ∷ [RedeemVerificationKey] → Value #

toEncodingList ∷ [RedeemVerificationKey] → Encoding #

ToJSON DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ DnsName → Value #

toEncoding ∷ DnsName → Encoding #

toJSONList ∷ [DnsName] → Value #

toEncodingList ∷ [DnsName] → Encoding #

ToJSON Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ Port → Value #

toEncoding ∷ Port → Encoding #

toJSONList ∷ [Port] → Value #

toEncodingList ∷ [Port] → Encoding #

ToJSON PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ PositiveInterval → Value #

toEncoding ∷ PositiveInterval → Encoding #

toJSONList ∷ [PositiveInterval] → Value #

toEncodingList ∷ [PositiveInterval] → Encoding #

ToJSON ChainDifficulty 
Instance details

Defined in Cardano.Chain.Common.ChainDifficulty

Methods

toJSON ∷ ChainDifficulty → Value #

toEncoding ∷ ChainDifficulty → Encoding #

toJSONList ∷ [ChainDifficulty] → Value #

toEncodingList ∷ [ChainDifficulty] → Encoding #

ToJSON Proof 
Instance details

Defined in Cardano.Chain.Block.Proof

Methods

toJSON ∷ Proof → Value #

toEncoding ∷ Proof → Encoding #

toJSONList ∷ [Proof] → Value #

toEncodingList ∷ [Proof] → Encoding #

ToJSON SscPayload 
Instance details

Defined in Cardano.Chain.Ssc

Methods

toJSON ∷ SscPayload → Value #

toEncoding ∷ SscPayload → Encoding #

toJSONList ∷ [SscPayload] → Value #

toEncodingList ∷ [SscPayload] → Encoding #

ToJSON ProposalBody 
Instance details

Defined in Cardano.Chain.Update.Proposal

Methods

toJSON ∷ ProposalBody → Value #

toEncoding ∷ ProposalBody → Encoding #

toJSONList ∷ [ProposalBody] → Value #

toEncodingList ∷ [ProposalBody] → Encoding #

ToJSON SscProof 
Instance details

Defined in Cardano.Chain.Ssc

Methods

toJSON ∷ SscProof → Value #

toEncoding ∷ SscProof → Encoding #

toJSONList ∷ [SscProof] → Value #

toEncodingList ∷ [SscProof] → Encoding #

ToJSON TxProof 
Instance details

Defined in Cardano.Chain.UTxO.TxProof

Methods

toJSON ∷ TxProof → Value #

toEncoding ∷ TxProof → Encoding #

toJSONList ∷ [TxProof] → Value #

toEncodingList ∷ [TxProof] → Encoding #

ToJSON ApplicationName 
Instance details

Defined in Cardano.Chain.Update.ApplicationName

Methods

toJSON ∷ ApplicationName → Value #

toEncoding ∷ ApplicationName → Encoding #

toJSONList ∷ [ApplicationName] → Value #

toEncodingList ∷ [ApplicationName] → Encoding #

ToJSON TxOut 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Methods

toJSON ∷ TxOut → Value #

toEncoding ∷ TxOut → Encoding #

toJSONList ∷ [TxOut] → Value #

toEncodingList ∷ [TxOut] → Encoding #

ToJSON AddrType 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Methods

toJSON ∷ AddrType → Value #

toEncoding ∷ AddrType → Encoding #

toJSONList ∷ [AddrType] → Value #

toEncodingList ∷ [AddrType] → Encoding #

ToJSON UnparsedFields 
Instance details

Defined in Cardano.Chain.Common.Attributes

Methods

toJSON ∷ UnparsedFields → Value #

toEncoding ∷ UnparsedFields → Encoding #

toJSONList ∷ [UnparsedFields] → Value #

toEncodingList ∷ [UnparsedFields] → Encoding #

ToJSON LovelacePortion 
Instance details

Defined in Cardano.Chain.Common.LovelacePortion

Methods

toJSON ∷ LovelacePortion → Value #

toEncoding ∷ LovelacePortion → Encoding #

toJSONList ∷ [LovelacePortion] → Value #

toEncodingList ∷ [LovelacePortion] → Encoding #

ToJSON TxFeePolicy 
Instance details

Defined in Cardano.Chain.Common.TxFeePolicy

Methods

toJSON ∷ TxFeePolicy → Value #

toEncoding ∷ TxFeePolicy → Encoding #

toJSONList ∷ [TxFeePolicy] → Value #

toEncodingList ∷ [TxFeePolicy] → Encoding #

ToJSON TxSizeLinear 
Instance details

Defined in Cardano.Chain.Common.TxSizeLinear

Methods

toJSON ∷ TxSizeLinear → Value #

toEncoding ∷ TxSizeLinear → Encoding #

toJSONList ∷ [TxSizeLinear] → Value #

toEncodingList ∷ [TxSizeLinear] → Encoding #

ToJSON SoftforkRule 
Instance details

Defined in Cardano.Chain.Update.SoftforkRule

Methods

toJSON ∷ SoftforkRule → Value #

toEncoding ∷ SoftforkRule → Encoding #

toJSONList ∷ [SoftforkRule] → Value #

toEncodingList ∷ [SoftforkRule] → Encoding #

ToJSON InstallerHash 
Instance details

Defined in Cardano.Chain.Update.InstallerHash

Methods

toJSON ∷ InstallerHash → Value #

toEncoding ∷ InstallerHash → Encoding #

toJSONList ∷ [InstallerHash] → Value #

toEncodingList ∷ [InstallerHash] → Encoding #

ToJSON SystemTag 
Instance details

Defined in Cardano.Chain.Update.SystemTag

Methods

toJSON ∷ SystemTag → Value #

toEncoding ∷ SystemTag → Encoding #

toJSONList ∷ [SystemTag] → Value #

toEncodingList ∷ [SystemTag] → Encoding #

ToJSON ProtocolParametersUpdate 
Instance details

Defined in Cardano.Chain.Update.ProtocolParametersUpdate

Methods

toJSON ∷ ProtocolParametersUpdate → Value #

toEncoding ∷ ProtocolParametersUpdate → Encoding #

toJSONList ∷ [ProtocolParametersUpdate] → Value #

toEncodingList ∷ [ProtocolParametersUpdate] → Encoding #

ToJSON PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.Types

Methods

toJSON ∷ PeerAdvertise → Value #

toEncoding ∷ PeerAdvertise → Encoding #

toJSONList ∷ [PeerAdvertise] → Value #

toEncodingList ∷ [PeerAdvertise] → Encoding #

ToJSON SatInt 
Instance details

Defined in Data.SatInt

Methods

toJSON ∷ SatInt → Value #

toEncoding ∷ SatInt → Encoding #

toJSONList ∷ [SatInt] → Value #

toEncodingList ∷ [SatInt] → Encoding #

ToJSON ModelAddedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelAddedSizes → Value #

toEncoding ∷ ModelAddedSizes → Encoding #

toJSONList ∷ [ModelAddedSizes] → Value #

toEncodingList ∷ [ModelAddedSizes] → Encoding #

ToJSON ModelConstantOrLinear 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelConstantOrLinear → Value #

toEncoding ∷ ModelConstantOrLinear → Encoding #

toJSONList ∷ [ModelConstantOrLinear] → Value #

toEncodingList ∷ [ModelConstantOrLinear] → Encoding #

ToJSON ModelConstantOrTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelConstantOrTwoArguments → Value #

toEncoding ∷ ModelConstantOrTwoArguments → Encoding #

toJSONList ∷ [ModelConstantOrTwoArguments] → Value #

toEncodingList ∷ [ModelConstantOrTwoArguments] → Encoding #

ToJSON ModelFiveArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelFiveArguments → Value #

toEncoding ∷ ModelFiveArguments → Encoding #

toJSONList ∷ [ModelFiveArguments] → Value #

toEncodingList ∷ [ModelFiveArguments] → Encoding #

ToJSON ModelFourArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelFourArguments → Value #

toEncoding ∷ ModelFourArguments → Encoding #

toJSONList ∷ [ModelFourArguments] → Value #

toEncodingList ∷ [ModelFourArguments] → Encoding #

ToJSON ModelLinearSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelLinearSize → Value #

toEncoding ∷ ModelLinearSize → Encoding #

toJSONList ∷ [ModelLinearSize] → Value #

toEncodingList ∷ [ModelLinearSize] → Encoding #

ToJSON ModelMaxSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelMaxSize → Value #

toEncoding ∷ ModelMaxSize → Encoding #

toJSONList ∷ [ModelMaxSize] → Value #

toEncodingList ∷ [ModelMaxSize] → Encoding #

ToJSON ModelMinSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelMinSize → Value #

toEncoding ∷ ModelMinSize → Encoding #

toJSONList ∷ [ModelMinSize] → Value #

toEncodingList ∷ [ModelMinSize] → Encoding #

ToJSON ModelMultipliedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelMultipliedSizes → Value #

toEncoding ∷ ModelMultipliedSizes → Encoding #

toJSONList ∷ [ModelMultipliedSizes] → Value #

toEncodingList ∷ [ModelMultipliedSizes] → Encoding #

ToJSON ModelOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelOneArgument → Value #

toEncoding ∷ ModelOneArgument → Encoding #

toJSONList ∷ [ModelOneArgument] → Value #

toEncodingList ∷ [ModelOneArgument] → Encoding #

ToJSON ModelSixArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelSixArguments → Value #

toEncoding ∷ ModelSixArguments → Encoding #

toJSONList ∷ [ModelSixArguments] → Value #

toEncodingList ∷ [ModelSixArguments] → Encoding #

ToJSON ModelSubtractedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelSubtractedSizes → Value #

toEncoding ∷ ModelSubtractedSizes → Encoding #

toJSONList ∷ [ModelSubtractedSizes] → Value #

toEncodingList ∷ [ModelSubtractedSizes] → Encoding #

ToJSON ModelThreeArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelThreeArguments → Value #

toEncoding ∷ ModelThreeArguments → Encoding #

toJSONList ∷ [ModelThreeArguments] → Value #

toEncodingList ∷ [ModelThreeArguments] → Encoding #

ToJSON ModelTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ ModelTwoArguments → Value #

toEncoding ∷ ModelTwoArguments → Encoding #

toJSONList ∷ [ModelTwoArguments] → Value #

toEncodingList ∷ [ModelTwoArguments] → Encoding #

ToJSON CovLoc 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CovLoc → Value #

toEncoding ∷ CovLoc → Encoding #

toJSONList ∷ [CovLoc] → Value #

toEncodingList ∷ [CovLoc] → Encoding #

ToJSON CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CoverageAnnotation → Value #

toEncoding ∷ CoverageAnnotation → Encoding #

toJSONList ∷ [CoverageAnnotation] → Value #

toEncodingList ∷ [CoverageAnnotation] → Encoding #

ToJSON CoverageData 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CoverageData → Value #

toEncoding ∷ CoverageData → Encoding #

toJSONList ∷ [CoverageData] → Value #

toEncodingList ∷ [CoverageData] → Encoding #

ToJSON CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CoverageIndex → Value #

toEncoding ∷ CoverageIndex → Encoding #

toJSONList ∷ [CoverageIndex] → Value #

toEncodingList ∷ [CoverageIndex] → Encoding #

ToJSON CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CoverageMetadata → Value #

toEncoding ∷ CoverageMetadata → Encoding #

toJSONList ∷ [CoverageMetadata] → Value #

toEncodingList ∷ [CoverageMetadata] → Encoding #

ToJSON CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ CoverageReport → Value #

toEncoding ∷ CoverageReport → Encoding #

toJSONList ∷ [CoverageReport] → Value #

toEncodingList ∷ [CoverageReport] → Encoding #

ToJSON Metadata 
Instance details

Defined in PlutusTx.Coverage

Methods

toJSON ∷ Metadata → Value #

toEncoding ∷ Metadata → Encoding #

toJSONList ∷ [Metadata] → Value #

toEncodingList ∷ [Metadata] → Encoding #

ToJSON StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

Methods

toJSON ∷ StudentT → Value #

toEncoding ∷ StudentT → Encoding #

toJSONList ∷ [StudentT] → Value #

toEncodingList ∷ [StudentT] → Encoding #

ToJSON Environment 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ Environment → Value #

toEncoding ∷ Environment → Encoding #

toJSONList ∷ [Environment] → Value #

toEncodingList ∷ [Environment] → Encoding #

ToJSON Namespace 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ Namespace → Value #

toEncoding ∷ Namespace → Encoding #

toJSONList ∷ [Namespace] → Value #

toEncodingList ∷ [Namespace] → Encoding #

ToJSON Severity 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ Severity → Value #

toEncoding ∷ Severity → Encoding #

toJSONList ∷ [Severity] → Value #

toEncodingList ∷ [Severity] → Encoding #

ToJSON SimpleLogPayload 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ SimpleLogPayload → Value #

toEncoding ∷ SimpleLogPayload → Encoding #

toJSONList ∷ [SimpleLogPayload] → Value #

toEncodingList ∷ [SimpleLogPayload] → Encoding #

ToJSON ThreadIdText 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ ThreadIdText → Value #

toEncoding ∷ ThreadIdText → Encoding #

toJSONList ∷ [ThreadIdText] → Value #

toEncodingList ∷ [ThreadIdText] → Encoding #

ToJSON Verbosity 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ Verbosity → Value #

toEncoding ∷ Verbosity → Encoding #

toJSONList ∷ [Verbosity] → Value #

toEncodingList ∷ [Verbosity] → Encoding #

ToJSON LogContexts 
Instance details

Defined in Katip.Monadic

Methods

toJSON ∷ LogContexts → Value #

toEncoding ∷ LogContexts → Encoding #

toJSONList ∷ [LogContexts] → Value #

toEncodingList ∷ [LogContexts] → Encoding #

ToJSON LocJs 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ LocJs → Value #

toEncoding ∷ LocJs → Encoding #

toJSONList ∷ [LocJs] → Value #

toEncodingList ∷ [LocJs] → Encoding #

ToJSON ProcessIDJs 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ ProcessIDJs → Value #

toEncoding ∷ ProcessIDJs → Encoding #

toJSONList ∷ [ProcessIDJs] → Value #

toEncodingList ∷ [ProcessIDJs] → Encoding #

ToJSON SentryRecord 
Instance details

Defined in System.Log.Raven.Types

Methods

toJSON ∷ SentryRecord → Value #

toEncoding ∷ SentryRecord → Encoding #

toJSONList ∷ [SentryRecord] → Value #

toEncodingList ∷ [SentryRecord] → Encoding #

ToJSON SentryLevel 
Instance details

Defined in System.Log.Raven.Types

Methods

toJSON ∷ SentryLevel → Value #

toEncoding ∷ SentryLevel → Encoding #

toJSONList ∷ [SentryLevel] → Value #

toEncodingList ∷ [SentryLevel] → Encoding #

ToJSON GYEra # 
Instance details

Defined in GeniusYield.Types.Era

Methods

toJSONGYEra → Value #

toEncodingGYEra → Encoding #

toJSONList ∷ [GYEra] → Value #

toEncodingList ∷ [GYEra] → Encoding #

ToJSON GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

Methods

toJSONGYDatumHash → Value #

toEncodingGYDatumHash → Encoding #

toJSONList ∷ [GYDatumHash] → Value #

toEncodingList ∷ [GYDatumHash] → Encoding #

ToJSON GYLogScribeConfig #
>>> LBS8.putStrLn $ Aeson.encode $ GYLogScribeConfig (GYCustomSourceScribe "log.txt") GYWarning (read "GYLogVerbosity V1")
{"type":{"tag":"gySource","source":"log.txt"},"severity":"Warning","verbosity":"V1"}
Instance details

Defined in GeniusYield.Types.Logging

Methods

toJSONGYLogScribeConfig → Value #

toEncodingGYLogScribeConfig → Encoding #

toJSONList ∷ [GYLogScribeConfig] → Value #

toEncodingList ∷ [GYLogScribeConfig] → Encoding #

ToJSON GYLogScribeType #
>>> LBS8.putStrLn $ Aeson.encode GYStdErrScribe
{"tag":"stderr"}
>>> LBS8.putStrLn $ Aeson.encode $ GYCustomSourceScribe "https://pub:priv@sentry.hostname.tld:8443/sentry/example_project"
{"tag":"gySource","source":"https://pub:...@sentry.hostname.tld:8443/sentry/example_project"}
>>> LBS8.putStrLn $ Aeson.encode $ GYCustomSourceScribe "log.txt"
{"tag":"gySource","source":"log.txt"}
Instance details

Defined in GeniusYield.Types.Logging

Methods

toJSONGYLogScribeType → Value #

toEncodingGYLogScribeType → Encoding #

toJSONList ∷ [GYLogScribeType] → Value #

toEncodingList ∷ [GYLogScribeType] → Encoding #

ToJSON LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

toJSONLogSrc → Value #

toEncodingLogSrc → Encoding #

toJSONList ∷ [LogSrc] → Value #

toEncodingList ∷ [LogSrc] → Encoding #

ToJSON GYLogVerbosity # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

toJSONGYLogVerbosity → Value #

toEncodingGYLogVerbosity → Encoding #

toJSONList ∷ [GYLogVerbosity] → Value #

toEncodingList ∷ [GYLogVerbosity] → Encoding #

ToJSON GYLogSeverity # 
Instance details

Defined in GeniusYield.Types.Logging

Methods

toJSONGYLogSeverity → Value #

toEncodingGYLogSeverity → Encoding #

toJSONList ∷ [GYLogSeverity] → Value #

toEncodingList ∷ [GYLogSeverity] → Encoding #

ToJSON GYNetworkId #
>>> mapM_ LBS8.putStrLn $ Aeson.encode <$> [GYMainnet, GYTestnetPreprod, GYTestnetPreview, GYTestnetLegacy, GYPrivnet]
"mainnet"
"testnet-preprod"
"testnet-preview"
"testnet"
"privnet"
Instance details

Defined in GeniusYield.Types.NetworkId

Methods

toJSONGYNetworkId → Value #

toEncodingGYNetworkId → Encoding #

toJSONList ∷ [GYNetworkId] → Value #

toEncodingList ∷ [GYNetworkId] → Encoding #

ToJSON AdditionalProperties 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ AdditionalProperties → Value #

toEncoding ∷ AdditionalProperties → Encoding #

toJSONList ∷ [AdditionalProperties] → Value #

toEncodingList ∷ [AdditionalProperties] → Encoding #

ToJSON ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ApiKeyLocation → Value #

toEncoding ∷ ApiKeyLocation → Encoding #

toJSONList ∷ [ApiKeyLocation] → Value #

toEncodingList ∷ [ApiKeyLocation] → Encoding #

ToJSON ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ApiKeyParams → Value #

toEncoding ∷ ApiKeyParams → Encoding #

toJSONList ∷ [ApiKeyParams] → Value #

toEncodingList ∷ [ApiKeyParams] → Encoding #

ToJSON Contact 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Contact → Value #

toEncoding ∷ Contact → Encoding #

toJSONList ∷ [Contact] → Value #

toEncodingList ∷ [Contact] → Encoding #

ToJSON Example 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Example → Value #

toEncoding ∷ Example → Encoding #

toJSONList ∷ [Example] → Value #

toEncodingList ∷ [Example] → Encoding #

ToJSON ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ExternalDocs → Value #

toEncoding ∷ ExternalDocs → Encoding #

toJSONList ∷ [ExternalDocs] → Value #

toEncodingList ∷ [ExternalDocs] → Encoding #

ToJSON Header 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Header → Value #

toEncoding ∷ Header → Encoding #

toJSONList ∷ [Header] → Value #

toEncodingList ∷ [Header] → Encoding #

ToJSON Host 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Host → Value #

toEncoding ∷ Host → Encoding #

toJSONList ∷ [Host] → Value #

toEncodingList ∷ [Host] → Encoding #

ToJSON Info 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Info → Value #

toEncoding ∷ Info → Encoding #

toJSONList ∷ [Info] → Value #

toEncodingList ∷ [Info] → Encoding #

ToJSON License 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ License → Value #

toEncoding ∷ License → Encoding #

toJSONList ∷ [License] → Value #

toEncodingList ∷ [License] → Encoding #

ToJSON MimeList 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ MimeList → Value #

toEncoding ∷ MimeList → Encoding #

toJSONList ∷ [MimeList] → Value #

toEncodingList ∷ [MimeList] → Encoding #

ToJSON OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ OAuth2Flow → Value #

toEncoding ∷ OAuth2Flow → Encoding #

toJSONList ∷ [OAuth2Flow] → Value #

toEncodingList ∷ [OAuth2Flow] → Encoding #

ToJSON OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ OAuth2Params → Value #

toEncoding ∷ OAuth2Params → Encoding #

toJSONList ∷ [OAuth2Params] → Value #

toEncodingList ∷ [OAuth2Params] → Encoding #

ToJSON Operation 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Operation → Value #

toEncoding ∷ Operation → Encoding #

toJSONList ∷ [Operation] → Value #

toEncodingList ∷ [Operation] → Encoding #

ToJSON Param 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Param → Value #

toEncoding ∷ Param → Encoding #

toJSONList ∷ [Param] → Value #

toEncodingList ∷ [Param] → Encoding #

ToJSON ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ParamAnySchema → Value #

toEncoding ∷ ParamAnySchema → Encoding #

toJSONList ∷ [ParamAnySchema] → Value #

toEncodingList ∷ [ParamAnySchema] → Encoding #

ToJSON ParamLocation 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ParamLocation → Value #

toEncoding ∷ ParamLocation → Encoding #

toJSONList ∷ [ParamLocation] → Value #

toEncodingList ∷ [ParamLocation] → Encoding #

ToJSON ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ParamOtherSchema → Value #

toEncoding ∷ ParamOtherSchema → Encoding #

toJSONList ∷ [ParamOtherSchema] → Value #

toEncodingList ∷ [ParamOtherSchema] → Encoding #

ToJSON PathItem 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ PathItem → Value #

toEncoding ∷ PathItem → Encoding #

toJSONList ∷ [PathItem] → Value #

toEncodingList ∷ [PathItem] → Encoding #

ToJSON Reference 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Reference → Value #

toEncoding ∷ Reference → Encoding #

toJSONList ∷ [Reference] → Value #

toEncodingList ∷ [Reference] → Encoding #

ToJSON Response 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Response → Value #

toEncoding ∷ Response → Encoding #

toJSONList ∷ [Response] → Value #

toEncodingList ∷ [Response] → Encoding #

ToJSON Responses 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Responses → Value #

toEncoding ∷ Responses → Encoding #

toJSONList ∷ [Responses] → Value #

toEncodingList ∷ [Responses] → Encoding #

ToJSON Schema 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Schema → Value #

toEncoding ∷ Schema → Encoding #

toJSONList ∷ [Schema] → Value #

toEncodingList ∷ [Schema] → Encoding #

ToJSON Scheme 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Scheme → Value #

toEncoding ∷ Scheme → Encoding #

toJSONList ∷ [Scheme] → Value #

toEncodingList ∷ [Scheme] → Encoding #

ToJSON SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SecurityDefinitions → Value #

toEncoding ∷ SecurityDefinitions → Encoding #

toJSONList ∷ [SecurityDefinitions] → Value #

toEncodingList ∷ [SecurityDefinitions] → Encoding #

ToJSON SecurityRequirement 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SecurityRequirement → Value #

toEncoding ∷ SecurityRequirement → Encoding #

toJSONList ∷ [SecurityRequirement] → Value #

toEncodingList ∷ [SecurityRequirement] → Encoding #

ToJSON SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SecurityScheme → Value #

toEncoding ∷ SecurityScheme → Encoding #

toJSONList ∷ [SecurityScheme] → Value #

toEncodingList ∷ [SecurityScheme] → Encoding #

ToJSON SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SecuritySchemeType → Value #

toEncoding ∷ SecuritySchemeType → Encoding #

toJSONList ∷ [SecuritySchemeType] → Value #

toEncodingList ∷ [SecuritySchemeType] → Encoding #

ToJSON Swagger 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Swagger → Value #

toEncoding ∷ Swagger → Encoding #

toJSONList ∷ [Swagger] → Value #

toEncodingList ∷ [Swagger] → Encoding #

ToJSON Tag 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Tag → Value #

toEncoding ∷ Tag → Encoding #

toJSONList ∷ [Tag] → Value #

toEncodingList ∷ [Tag] → Encoding #

ToJSON URL 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ URL → Value #

toEncoding ∷ URL → Encoding #

toJSONList ∷ [URL] → Value #

toEncodingList ∷ [URL] → Encoding #

ToJSON Xml 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Xml → Value #

toEncoding ∷ Xml → Encoding #

toJSONList ∷ [Xml] → Value #

toEncodingList ∷ [Xml] → Encoding #

ToJSON GYPubKeyHash #
>>> let Just pkh = Aeson.decode @GYPubKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d\""
>>> LBS8.putStrLn $ Aeson.encode pkh
"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
Instance details

Defined in GeniusYield.Types.PubKeyHash

Methods

toJSONGYPubKeyHash → Value #

toEncodingGYPubKeyHash → Encoding #

toJSONList ∷ [GYPubKeyHash] → Value #

toEncodingList ∷ [GYPubKeyHash] → Encoding #

ToJSON GYPaymentSigningKey #
>>> LBS8.putStrLn $ Aeson.encode ("5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290" :: GYPaymentSigningKey)
"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290"
Instance details

Defined in GeniusYield.Types.Key

Methods

toJSONGYPaymentSigningKey → Value #

toEncodingGYPaymentSigningKey → Encoding #

toJSONList ∷ [GYPaymentSigningKey] → Value #

toEncodingList ∷ [GYPaymentSigningKey] → Encoding #

ToJSON GYPaymentVerificationKey #
>>> LBS8.putStrLn $ Aeson.encode ("0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605" :: GYPaymentVerificationKey)
"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605"
Instance details

Defined in GeniusYield.Types.Key

ToJSON Rational 
Instance details

Defined in PlutusTx.Ratio

Methods

toJSON ∷ Rational → Value #

toEncoding ∷ Rational → Encoding #

toJSONList ∷ [Rational] → Value #

toEncodingList ∷ [Rational] → Encoding #

ToJSON GYRational #
>>> LBS8.putStrLn $ Aeson.encode (fromRational @GYRational 0.123)
"0.123"
Instance details

Defined in GeniusYield.Types.Rational

Methods

toJSONGYRational → Value #

toEncodingGYRational → Encoding #

toJSONList ∷ [GYRational] → Value #

toEncodingList ∷ [GYRational] → Encoding #

ToJSON GYMintingPolicyId # 
Instance details

Defined in GeniusYield.Types.Script

Methods

toJSONGYMintingPolicyId → Value #

toEncodingGYMintingPolicyId → Encoding #

toJSONList ∷ [GYMintingPolicyId] → Value #

toEncodingList ∷ [GYMintingPolicyId] → Encoding #

ToJSON GYAddressBech32 #
>>> LBS8.putStrLn $ Aeson.encode $ addressToBech32 addr
"addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5"
Instance details

Defined in GeniusYield.Types.Address

Methods

toJSONGYAddressBech32 → Value #

toEncodingGYAddressBech32 → Encoding #

toJSONList ∷ [GYAddressBech32] → Value #

toEncodingList ∷ [GYAddressBech32] → Encoding #

ToJSON GYAddress #
>>> LBS8.putStrLn $ Aeson.encode addr
"00e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d1b930e9f7add78a174a21000e989ff551366dcd127028cb2aa39f616"
Instance details

Defined in GeniusYield.Types.Address

Methods

toJSONGYAddress → Value #

toEncodingGYAddress → Encoding #

toJSONList ∷ [GYAddress] → Value #

toEncodingList ∷ [GYAddress] → Encoding #

ToJSON GYSlot # 
Instance details

Defined in GeniusYield.Types.Slot

Methods

toJSONGYSlot → Value #

toEncodingGYSlot → Encoding #

toJSONList ∷ [GYSlot] → Value #

toEncodingList ∷ [GYSlot] → Encoding #

ToJSON GYTime #
>>> LBS8.putStrLn $ Aeson.encode $ timeFromPlutus 0
"1970-01-01T00:00:00Z"
Instance details

Defined in GeniusYield.Types.Time

Methods

toJSONGYTime → Value #

toEncodingGYTime → Encoding #

toJSONList ∷ [GYTime] → Value #

toEncodingList ∷ [GYTime] → Encoding #

ToJSON GYTxId #
>>> Aeson.toJSON gyTxId
String "6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8"
Instance details

Defined in GeniusYield.Types.Tx

Methods

toJSONGYTxId → Value #

toEncodingGYTxId → Encoding #

toJSONList ∷ [GYTxId] → Value #

toEncodingList ∷ [GYTxId] → Encoding #

ToJSON GYTx #
>>> Aeson.toJSON tx
String "84a70082825820975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb27501825820c887cba672004607a0f60ab28091d5c24860dbefb92b1a8776272d752846574f000d818258207a67cd033169e330c9ae9b8d0ef8b71de9eb74bbc8f3f6be90446dab7d1e8bfd00018282583900fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf401a1abac7d882583900fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40821a0017ad4aa2581ca6bb5fd825455e7c69bdaa9d3a6dda9bcbe9b570bc79bd55fa50889ba1466e69636b656c1911d7581cb17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6fa14853696c6c69636f6e190258021a00072f3c0e8009a1581cb17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6fa14853696c6c69636f6e1902580b5820291b4e4c5f189cb896674e02e354028915b11889687c53d9cf4c1c710ff5e4aea203815908d45908d101000033332332232332232323232323232323232323232323232323232222223232323235500222222222225335333553024120013232123300122333500522002002001002350012200112330012253350021001102d02c25335325335333573466e3cd400488008d404c880080b40b04ccd5cd19b873500122001350132200102d02c102c3500122002102b102c00a132635335738921115554784f206e6f7420636f6e73756d65640002302115335333573466e3c048d5402c880080ac0a854cd4ccd5cd19b8701335500b2200102b02a10231326353357389210c77726f6e6720616d6f756e740002302113263533573892010b77726f6e6720746f6b656e00023021135500122222222225335330245027007162213500222253350041335502d00200122161353333573466e1cd55cea8012400046644246600200600464646464646464646464646666ae68cdc39aab9d500a480008cccccccccc888888888848cccccccccc00402c02802402001c01801401000c008cd40548c8c8cccd5cd19b8735573aa0049000119910919800801801180f1aba15002301a357426ae8940088c98d4cd5ce01381401301289aab9e5001137540026ae854028cd4054058d5d0a804999aa80c3ae501735742a010666aa030eb9405cd5d0a80399a80a80f1aba15006335015335502101f75a6ae854014c8c8c8cccd5cd19b8735573aa00490001199109198008018011919191999ab9a3370e6aae754009200023322123300100300233502475a6ae854008c094d5d09aba2500223263533573805605805405226aae7940044dd50009aba150023232323333573466e1cd55cea8012400046644246600200600466a048eb4d5d0a80118129aba135744a004464c6a66ae700ac0b00a80a44d55cf280089baa001357426ae8940088c98d4cd5ce01381401301289aab9e5001137540026ae854010cd4055d71aba15003335015335502175c40026ae854008c06cd5d09aba2500223263533573804604804404226ae8940044d5d1280089aba25001135744a00226ae8940044d5d1280089aba25001135744a00226aae7940044dd50009aba150023232323333573466e1d400520062321222230040053016357426aae79400c8cccd5cd19b875002480108c848888c008014c060d5d09aab9e500423333573466e1d400d20022321222230010053014357426aae7940148cccd5cd19b875004480008c848888c00c014dd71aba135573ca00c464c6a66ae7007807c07407006c0680644d55cea80089baa001357426ae8940088c98d4cd5ce00b80c00b00a9100109aab9e5001137540022464460046eb0004c8004d5406488cccd55cf8009280c119a80b98021aba100230033574400402446464646666ae68cdc39aab9d5003480008ccc88848ccc00401000c008c8c8c8cccd5cd19b8735573aa004900011991091980080180118099aba1500233500c012357426ae8940088c98d4cd5ce00b00b80a80a09aab9e5001137540026ae85400cccd5401dd728031aba1500233500875c6ae84d5d1280111931a99ab9c012013011010135744a00226aae7940044dd5000899aa800bae75a224464460046eac004c8004d5405c88c8cccd55cf8011280b919a80b19aa80c18031aab9d5002300535573ca00460086ae8800c0444d5d080089119191999ab9a3370ea0029000119091180100198029aba135573ca00646666ae68cdc3a801240044244002464c6a66ae7004004403c0380344d55cea80089baa001232323333573466e1cd55cea80124000466442466002006004600a6ae854008dd69aba135744a004464c6a66ae7003403803002c4d55cf280089baa0012323333573466e1cd55cea800a400046eb8d5d09aab9e500223263533573801601801401226ea8004488c8c8cccd5cd19b87500148010848880048cccd5cd19b875002480088c84888c00c010c018d5d09aab9e500423333573466e1d400d20002122200223263533573801c01e01a01801601426aae7540044dd50009191999ab9a3370ea0029001100911999ab9a3370ea0049000100911931a99ab9c00a00b009008007135573a6ea80048c8c8c8c8c8cccd5cd19b8750014803084888888800c8cccd5cd19b875002480288488888880108cccd5cd19b875003480208cc8848888888cc004024020dd71aba15005375a6ae84d5d1280291999ab9a3370ea00890031199109111111198010048041bae35742a00e6eb8d5d09aba2500723333573466e1d40152004233221222222233006009008300c35742a0126eb8d5d09aba2500923333573466e1d40192002232122222223007008300d357426aae79402c8cccd5cd19b875007480008c848888888c014020c038d5d09aab9e500c23263533573802402602202001e01c01a01801601426aae7540104d55cf280189aab9e5002135573ca00226ea80048c8c8c8c8cccd5cd19b875001480088ccc888488ccc00401401000cdd69aba15004375a6ae85400cdd69aba135744a00646666ae68cdc3a80124000464244600400660106ae84d55cf280311931a99ab9c00b00c00a009008135573aa00626ae8940044d55cf280089baa001232323333573466e1d400520022321223001003375c6ae84d55cf280191999ab9a3370ea004900011909118010019bae357426aae7940108c98d4cd5ce00400480380300289aab9d5001137540022244464646666ae68cdc39aab9d5002480008cd5403cc018d5d0a80118029aba135744a004464c6a66ae7002002401c0184d55cf280089baa00149924103505431001200132001355008221122253350011350032200122133350052200230040023335530071200100500400132001355007222533500110022213500222330073330080020060010033200135500622225335001100222135002225335333573466e1c005200000d00c13330080070060031333008007335009123330010080030020060031122002122122330010040031122123300100300212200212200111232300100122330033002002001482c0252210853696c6c69636f6e003351223300248920975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb27500480088848cc00400c00880050581840100d87980821a001f372a1a358a2b14f5f6"
Instance details

Defined in GeniusYield.Types.Tx

Methods

toJSONGYTx → Value #

toEncodingGYTx → Encoding #

toJSONList ∷ [GYTx] → Value #

toEncodingList ∷ [GYTx] → Encoding #

ToJSON GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

Methods

toJSONGYTxOutRef → Value #

toEncodingGYTxOutRef → Encoding #

toJSONList ∷ [GYTxOutRef] → Value #

toEncodingList ∷ [GYTxOutRef] → Encoding #

ToJSON GYTokenName #
>>> Aeson.encode @GYTokenName "Gold"
"\"476f6c64\""
Instance details

Defined in GeniusYield.Types.Value

Methods

toJSONGYTokenName → Value #

toEncodingGYTokenName → Encoding #

toJSONList ∷ [GYTokenName] → Value #

toEncodingList ∷ [GYTokenName] → Encoding #

ToJSON GYAssetClass #
>>> LBS8.putStrLn $ Aeson.encode GYLovelace
"lovelace"
>>> LBS8.putStrLn $ Aeson.encode $ GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "Gold"
"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.476f6c64"
Instance details

Defined in GeniusYield.Types.Value

Methods

toJSONGYAssetClass → Value #

toEncodingGYAssetClass → Encoding #

toJSONList ∷ [GYAssetClass] → Value #

toEncodingList ∷ [GYAssetClass] → Encoding #

ToJSON GYValue #
>>> LBS8.putStrLn . Aeson.encode . valueFromList $ [(GYLovelace,22),(GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "GOLD",101)]
{"lovelace":22,"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.474f4c44":101}
Instance details

Defined in GeniusYield.Types.Value

Methods

toJSONGYValue → Value #

toEncodingGYValue → Encoding #

toJSONList ∷ [GYValue] → Value #

toEncodingList ∷ [GYValue] → Encoding #

ToJSON TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Methods

toJSON ∷ TokenPolicyId → Value #

toEncoding ∷ TokenPolicyId → Encoding #

toJSONList ∷ [TokenPolicyId] → Value #

toEncodingList ∷ [TokenPolicyId] → Encoding #

ToJSON TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Methods

toJSON ∷ TokenName → Value #

toEncoding ∷ TokenName → Encoding #

toJSONList ∷ [TokenName] → Value #

toEncodingList ∷ [TokenName] → Encoding #

ToJSON TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

Methods

toJSON ∷ TokenQuantity → Value #

toEncoding ∷ TokenQuantity → Encoding #

toJSONList ∷ [TokenQuantity] → Value #

toEncodingList ∷ [TokenQuantity] → Encoding #

ToJSON FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ FlatAssetQuantity → Value #

toEncoding ∷ FlatAssetQuantity → Encoding #

toJSONList ∷ [FlatAssetQuantity] → Value #

toEncodingList ∷ [FlatAssetQuantity] → Encoding #

ToJSON NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ NestedMapEntry → Value #

toEncoding ∷ NestedMapEntry → Encoding #

toJSONList ∷ [NestedMapEntry] → Value #

toEncodingList ∷ [NestedMapEntry] → Encoding #

ToJSON NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ NestedTokenQuantity → Value #

toEncoding ∷ NestedTokenQuantity → Encoding #

toJSONList ∷ [NestedTokenQuantity] → Value #

toEncodingList ∷ [NestedTokenQuantity] → Encoding #

ToJSON Percentage 
Instance details

Defined in Data.Quantity

Methods

toJSON ∷ Percentage → Value #

toEncoding ∷ Percentage → Encoding #

toJSONList ∷ [Percentage] → Value #

toEncodingList ∷ [Percentage] → Encoding #

ToJSON Ada 
Instance details

Defined in Plutus.Model.Ada

Methods

toJSON ∷ Ada → Value #

toEncoding ∷ Ada → Encoding #

toJSONList ∷ [Ada] → Value #

toEncodingList ∷ [Ada] → Encoding #

ToJSON Slot 
Instance details

Defined in Plutus.Model.Fork.Ledger.Slot

Methods

toJSON ∷ Slot → Value #

toEncoding ∷ Slot → Encoding #

toJSONList ∷ [Slot] → Value #

toEncodingList ∷ [Slot] → Encoding #

ToJSON a ⇒ ToJSON [a] 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ [a] → Value #

toEncoding ∷ [a] → Encoding #

toJSONList ∷ [[a]] → Value #

toEncodingList ∷ [[a]] → Encoding #

ToJSON a ⇒ ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMaybe a → Value #

toEncodingMaybe a → Encoding #

toJSONList ∷ [Maybe a] → Value #

toEncodingList ∷ [Maybe a] → Encoding #

(ToJSON a, Integral a) ⇒ ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONRatio a → Value #

toEncodingRatio a → Encoding #

toJSONList ∷ [Ratio a] → Value #

toEncodingList ∷ [Ratio a] → Encoding #

ToJSON a ⇒ ToJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMin a → Value #

toEncodingMin a → Encoding #

toJSONList ∷ [Min a] → Value #

toEncodingList ∷ [Min a] → Encoding #

ToJSON a ⇒ ToJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMax a → Value #

toEncodingMax a → Encoding #

toJSONList ∷ [Max a] → Value #

toEncodingList ∷ [Max a] → Encoding #

ToJSON a ⇒ ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONFirst a → Value #

toEncodingFirst a → Encoding #

toJSONList ∷ [First a] → Value #

toEncodingList ∷ [First a] → Encoding #

ToJSON a ⇒ ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONLast a → Value #

toEncodingLast a → Encoding #

toJSONList ∷ [Last a] → Value #

toEncodingList ∷ [Last a] → Encoding #

ToJSON a ⇒ ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONWrappedMonoid a → Value #

toEncodingWrappedMonoid a → Encoding #

toJSONList ∷ [WrappedMonoid a] → Value #

toEncodingList ∷ [WrappedMonoid a] → Encoding #

ToJSON a ⇒ ToJSON (Option a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONOption a → Value #

toEncodingOption a → Encoding #

toJSONList ∷ [Option a] → Value #

toEncodingList ∷ [Option a] → Encoding #

ToJSON a ⇒ ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONIdentity a → Value #

toEncodingIdentity a → Encoding #

toJSONList ∷ [Identity a] → Value #

toEncodingList ∷ [Identity a] → Encoding #

ToJSON a ⇒ ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONFirst a → Value #

toEncodingFirst a → Encoding #

toJSONList ∷ [First a] → Value #

toEncodingList ∷ [First a] → Encoding #

ToJSON a ⇒ ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONLast a → Value #

toEncodingLast a → Encoding #

toJSONList ∷ [Last a] → Value #

toEncodingList ∷ [Last a] → Encoding #

ToJSON a ⇒ ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONDual a → Value #

toEncodingDual a → Encoding #

toJSONList ∷ [Dual a] → Value #

toEncodingList ∷ [Dual a] → Encoding #

ToJSON a ⇒ ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONNonEmpty a → Value #

toEncodingNonEmpty a → Encoding #

toJSONList ∷ [NonEmpty a] → Value #

toEncodingList ∷ [NonEmpty a] → Encoding #

ToJSON a ⇒ ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONIntMap a → Value #

toEncodingIntMap a → Encoding #

toJSONList ∷ [IntMap a] → Value #

toEncodingList ∷ [IntMap a] → Encoding #

ToJSON v ⇒ ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONTree v → Value #

toEncodingTree v → Encoding #

toJSONList ∷ [Tree v] → Value #

toEncodingList ∷ [Tree v] → Encoding #

ToJSON a ⇒ ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONSeq a → Value #

toEncodingSeq a → Encoding #

toJSONList ∷ [Seq a] → Value #

toEncodingList ∷ [Seq a] → Encoding #

ToJSON a ⇒ ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONSet a → Value #

toEncodingSet a → Encoding #

toJSONList ∷ [Set a] → Value #

toEncodingList ∷ [Set a] → Encoding #

IsCardanoEra era ⇒ ToJSON (AddressInEra era) 
Instance details

Defined in Cardano.Api.Address

Methods

toJSON ∷ AddressInEra era → Value #

toEncoding ∷ AddressInEra era → Encoding #

toJSONList ∷ [AddressInEra era] → Value #

toEncodingList ∷ [AddressInEra era] → Encoding #

ToJSON (CardanoEra era) 
Instance details

Defined in Cardano.Api.Eras

Methods

toJSON ∷ CardanoEra era → Value #

toEncoding ∷ CardanoEra era → Encoding #

toJSONList ∷ [CardanoEra era] → Value #

toEncodingList ∷ [CardanoEra era] → Encoding #

ToJSON (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

Methods

toJSON ∷ Hash BlockHeader → Value #

toEncoding ∷ Hash BlockHeader → Encoding #

toJSONList ∷ [Hash BlockHeader] → Value #

toEncodingList ∷ [Hash BlockHeader] → Encoding #

ToJSON (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

Methods

toJSON ∷ Hash ScriptData → Value #

toEncoding ∷ Hash ScriptData → Encoding #

toJSONList ∷ [Hash ScriptData] → Value #

toEncodingList ∷ [Hash ScriptData] → Encoding #

ToJSON (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.KeysShelley

Methods

toJSON ∷ Hash StakePoolKey → Value #

toEncoding ∷ Hash StakePoolKey → Encoding #

toJSONList ∷ [Hash StakePoolKey] → Value #

toEncodingList ∷ [Hash StakePoolKey] → Encoding #

IsCardanoEra era ⇒ ToJSON (UTxO era) 
Instance details

Defined in Cardano.Api.Query

Methods

toJSON ∷ UTxO era → Value #

toEncoding ∷ UTxO era → Encoding #

toJSONList ∷ [UTxO era] → Value #

toEncodingList ∷ [UTxO era] → Encoding #

ToJSON (SimpleScript lang) 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ SimpleScript lang → Value #

toEncoding ∷ SimpleScript lang → Encoding #

toJSONList ∷ [SimpleScript lang] → Value #

toEncodingList ∷ [SimpleScript lang] → Encoding #

ToJSON (MultiAssetSupportedInEra era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

toJSON ∷ MultiAssetSupportedInEra era → Value #

toEncoding ∷ MultiAssetSupportedInEra era → Encoding #

toJSONList ∷ [MultiAssetSupportedInEra era] → Value #

toEncodingList ∷ [MultiAssetSupportedInEra era] → Encoding #

ToJSON (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

toJSON ∷ TxOutValue era → Value #

toEncoding ∷ TxOutValue era → Encoding #

toJSONList ∷ [TxOutValue era] → Value #

toEncodingList ∷ [TxOutValue era] → Encoding #

ToJSON a ⇒ ToJSON (AHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Methods

toJSON ∷ AHeader a → Value #

toEncoding ∷ AHeader a → Encoding #

toJSONList ∷ [AHeader a] → Value #

toEncodingList ∷ [AHeader a] → Encoding #

ToJSON a ⇒ ToJSON (ATxAux a) 
Instance details

Defined in Cardano.Chain.UTxO.TxAux

Methods

toJSON ∷ ATxAux a → Value #

toEncoding ∷ ATxAux a → Encoding #

toJSONList ∷ [ATxAux a] → Value #

toEncodingList ∷ [ATxAux a] → Encoding #

ToJSON a ⇒ ToJSON (ACertificate a) 
Instance details

Defined in Cardano.Chain.Delegation.Certificate

Methods

toJSON ∷ ACertificate a → Value #

toEncoding ∷ ACertificate a → Encoding #

toJSONList ∷ [ACertificate a] → Value #

toEncodingList ∷ [ACertificate a] → Encoding #

ToJSON a ⇒ ToJSON (AProposal a) 
Instance details

Defined in Cardano.Chain.Update.Proposal

Methods

toJSON ∷ AProposal a → Value #

toEncoding ∷ AProposal a → Encoding #

toJSONList ∷ [AProposal a] → Value #

toEncodingList ∷ [AProposal a] → Encoding #

ToJSON a ⇒ ToJSON (AVote a) 
Instance details

Defined in Cardano.Chain.Update.Vote

Methods

toJSON ∷ AVote a → Value #

toEncoding ∷ AVote a → Encoding #

toJSONList ∷ [AVote a] → Value #

toEncodingList ∷ [AVote a] → Encoding #

ToJSON a ⇒ ToJSON (ABlockOrBoundary a) 
Instance details

Defined in Cardano.Chain.Block.Block

Methods

toJSON ∷ ABlockOrBoundary a → Value #

toEncoding ∷ ABlockOrBoundary a → Encoding #

toJSONList ∷ [ABlockOrBoundary a] → Value #

toEncodingList ∷ [ABlockOrBoundary a] → Encoding #

ToJSON a ⇒ ToJSON (StrictSeq a) 
Instance details

Defined in Data.Sequence.Strict

Methods

toJSON ∷ StrictSeq a → Value #

toEncoding ∷ StrictSeq a → Encoding #

toJSONList ∷ [StrictSeq a] → Value #

toEncodingList ∷ [StrictSeq a] → Encoding #

ToJSON a ⇒ ToJSON (ABoundaryHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Methods

toJSON ∷ ABoundaryHeader a → Value #

toEncoding ∷ ABoundaryHeader a → Encoding #

toJSONList ∷ [ABoundaryHeader a] → Value #

toEncodingList ∷ [ABoundaryHeader a] → Encoding #

ToJSON a ⇒ ToJSON (ABoundaryBlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Methods

toJSON ∷ ABoundaryBlock a → Value #

toEncoding ∷ ABoundaryBlock a → Encoding #

toJSONList ∷ [ABoundaryBlock a] → Value #

toEncodingList ∷ [ABoundaryBlock a] → Encoding #

Crypto crypto ⇒ ToJSON (ShelleyGenesisStaking crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Methods

toJSON ∷ ShelleyGenesisStaking crypto → Value #

toEncoding ∷ ShelleyGenesisStaking crypto → Encoding #

toJSONList ∷ [ShelleyGenesisStaking crypto] → Value #

toEncodingList ∷ [ShelleyGenesisStaking crypto] → Encoding #

ToJSON (Addr crypto) 
Instance details

Defined in Cardano.Ledger.Address

Methods

toJSON ∷ Addr crypto → Value #

toEncoding ∷ Addr crypto → Encoding #

toJSONList ∷ [Addr crypto] → Value #

toEncodingList ∷ [Addr crypto] → Encoding #

Crypto crypto ⇒ ToJSON (GenDelegPair crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

toJSON ∷ GenDelegPair crypto → Value #

toEncoding ∷ GenDelegPair crypto → Encoding #

toJSONList ∷ [GenDelegPair crypto] → Value #

toEncodingList ∷ [GenDelegPair crypto] → Encoding #

ToJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

toJSON ∷ PParams era → Value #

toEncoding ∷ PParams era → Encoding #

toJSONList ∷ [PParams era] → Value #

toEncodingList ∷ [PParams era] → Encoding #

Era era ⇒ ToJSON (ShelleyGenesis era) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Methods

toJSON ∷ ShelleyGenesis era → Value #

toEncoding ∷ ShelleyGenesis era → Encoding #

toJSONList ∷ [ShelleyGenesis era] → Value #

toEncodingList ∷ [ShelleyGenesis era] → Encoding #

ToJSON a ⇒ ToJSON (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

Methods

toJSON ∷ StrictMaybe a → Value #

toEncoding ∷ StrictMaybe a → Encoding #

toJSONList ∷ [StrictMaybe a] → Value #

toEncodingList ∷ [StrictMaybe a] → Encoding #

Crypto crypto ⇒ ToJSON (PoolParams crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toJSON ∷ PoolParams crypto → Value #

toEncoding ∷ PoolParams crypto → Encoding #

toJSONList ∷ [PoolParams crypto] → Value #

toEncodingList ∷ [PoolParams crypto] → Encoding #

ToJSON a ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Vector a → Value #

toEncoding ∷ Vector a → Encoding #

toJSONList ∷ [Vector a] → Value #

toEncodingList ∷ [Vector a] → Encoding #

ToJSON a ⇒ ToJSON (ABlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Methods

toJSON ∷ ABlock a → Value #

toEncoding ∷ ABlock a → Encoding #

toJSONList ∷ [ABlock a] → Value #

toEncodingList ∷ [ABlock a] → Encoding #

ToJSON1 f ⇒ ToJSON (Fix f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Fix f → Value #

toEncoding ∷ Fix f → Encoding #

toJSONList ∷ [Fix f] → Value #

toEncodingList ∷ [Fix f] → Encoding #

Crypto crypto ⇒ ToJSON (RewardProvenance crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

toJSON ∷ RewardProvenance crypto → Value #

toEncoding ∷ RewardProvenance crypto → Encoding #

toJSONList ∷ [RewardProvenance crypto] → Value #

toEncodingList ∷ [RewardProvenance crypto] → Encoding #

Crypto crypto ⇒ ToJSON (BlocksMade crypto) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ BlocksMade crypto → Value #

toEncoding ∷ BlocksMade crypto → Encoding #

toJSONList ∷ [BlocksMade crypto] → Value #

toEncodingList ∷ [BlocksMade crypto] → Encoding #

Crypto crypto ⇒ ToJSON (ScriptHash crypto) 
Instance details

Defined in Cardano.Ledger.Hashes

Methods

toJSON ∷ ScriptHash crypto → Value #

toEncoding ∷ ScriptHash crypto → Encoding #

toJSONList ∷ [ScriptHash crypto] → Value #

toEncodingList ∷ [ScriptHash crypto] → Encoding #

ToJSON a ⇒ ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ DList a → Value #

toEncoding ∷ DList a → Encoding #

toJSONList ∷ [DList a] → Value #

toEncodingList ∷ [DList a] → Encoding #

ToJSON a ⇒ ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ HashSet a → Value #

toEncoding ∷ HashSet a → Encoding #

toJSONList ∷ [HashSet a] → Value #

toEncodingList ∷ [HashSet a] → Encoding #

(Vector Vector a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Vector a → Value #

toEncoding ∷ Vector a → Encoding #

toJSONList ∷ [Vector a] → Value #

toEncodingList ∷ [Vector a] → Encoding #

(Storable a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Vector a → Value #

toEncoding ∷ Vector a → Encoding #

toJSONList ∷ [Vector a] → Value #

toEncodingList ∷ [Vector a] → Encoding #

(Prim a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Vector a → Value #

toEncoding ∷ Vector a → Encoding #

toJSONList ∷ [Vector a] → Value #

toEncodingList ∷ [Vector a] → Encoding #

Crypto crypto ⇒ ToJSON (RewardProvenancePool crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Methods

toJSON ∷ RewardProvenancePool crypto → Value #

toEncoding ∷ RewardProvenancePool crypto → Encoding #

toJSONList ∷ [RewardProvenancePool crypto] → Value #

toEncodingList ∷ [RewardProvenancePool crypto] → Encoding #

Crypto crypto ⇒ ToJSON (RewardAcnt crypto) 
Instance details

Defined in Cardano.Ledger.Address

Methods

toJSON ∷ RewardAcnt crypto → Value #

toEncoding ∷ RewardAcnt crypto → Encoding #

toJSONList ∷ [RewardAcnt crypto] → Value #

toEncodingList ∷ [RewardAcnt crypto] → Encoding #

ToJSON a ⇒ ToJSON (Solo a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Solo a → Value #

toEncoding ∷ Solo a → Encoding #

toJSONList ∷ [Solo a] → Value #

toEncodingList ∷ [Solo a] → Encoding #

(IsShelleyBasedEra era, ShelleyLedgerEra era ~ ledgerera, ShelleyBasedEra ledgerera, ToJSON (PParams ledgerera), ToJSON (PParamsDelta ledgerera), ToJSON (TxOut ledgerera), Share (TxOut (ShelleyLedgerEra era)) ~ Interns (Credential 'Staking (Crypto (ShelleyLedgerEra era)))) ⇒ ToJSON (DebugLedgerState era) 
Instance details

Defined in Cardano.Api.Query

Methods

toJSON ∷ DebugLedgerState era → Value #

toEncoding ∷ DebugLedgerState era → Encoding #

toJSONList ∷ [DebugLedgerState era] → Value #

toEncodingList ∷ [DebugLedgerState era] → Encoding #

ToJSON v ⇒ ToJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ KeyMap v → Value #

toEncoding ∷ KeyMap v → Encoding #

toJSONList ∷ [KeyMap v] → Value #

toEncodingList ∷ [KeyMap v] → Encoding #

ToJSON a ⇒ ToJSON (DNonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ DNonEmpty a → Value #

toEncoding ∷ DNonEmpty a → Encoding #

toJSONList ∷ [DNonEmpty a] → Value #

toEncodingList ∷ [DNonEmpty a] → Encoding #

ToJSON a ⇒ ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Maybe a → Value #

toEncoding ∷ Maybe a → Encoding #

toJSONList ∷ [Maybe a] → Value #

toEncodingList ∷ [Maybe a] → Encoding #

ToJSON a ⇒ ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Array a → Value #

toEncoding ∷ Array a → Encoding #

toJSONList ∷ [Array a] → Value #

toEncodingList ∷ [Array a] → Encoding #

(Generic a, GToJSON' Value Zero (Rep a), GToJSON' Encoding Zero (Rep a)) ⇒ ToJSON (Generically a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Generically a → Value #

toEncoding ∷ Generically a → Encoding #

toJSONList ∷ [Generically a] → Value #

toEncodingList ∷ [Generically a] → Encoding #

(ToJSON1 f, Functor f) ⇒ ToJSON (Mu f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Mu f → Value #

toEncoding ∷ Mu f → Encoding #

toJSONList ∷ [Mu f] → Value #

toEncodingList ∷ [Mu f] → Encoding #

(ToJSON1 f, Functor f) ⇒ ToJSON (Nu f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Nu f → Value #

toEncoding ∷ Nu f → Encoding #

toJSONList ∷ [Nu f] → Value #

toEncodingList ∷ [Nu f] → Encoding #

(Prim a, ToJSON a) ⇒ ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ PrimArray a → Value #

toEncoding ∷ PrimArray a → Encoding #

toJSONList ∷ [PrimArray a] → Value #

toEncodingList ∷ [PrimArray a] → Encoding #

ToJSON a ⇒ ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ SmallArray a → Value #

toEncoding ∷ SmallArray a → Encoding #

toJSONList ∷ [SmallArray a] → Value #

toEncodingList ∷ [SmallArray a] → Encoding #

IsCardanoEra era ⇒ ToJSON (ReferenceScript era) 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ ReferenceScript era → Value #

toEncoding ∷ ReferenceScript era → Encoding #

toJSONList ∷ [ReferenceScript era] → Value #

toEncodingList ∷ [ReferenceScript era] → Encoding #

ToJSON a ⇒ ToJSON (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

Methods

toJSON ∷ RedeemSignature a → Value #

toEncoding ∷ RedeemSignature a → Encoding #

toJSONList ∷ [RedeemSignature a] → Value #

toEncodingList ∷ [RedeemSignature a] → Encoding #

ToJSON (Signature w) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Methods

toJSON ∷ Signature w → Value #

toEncoding ∷ Signature w → Encoding #

toJSONList ∷ [Signature w] → Value #

toEncodingList ∷ [Signature w] → Encoding #

ToJSON a ⇒ ToJSON (ABoundaryBody a) 
Instance details

Defined in Cardano.Chain.Block.Block

Methods

toJSON ∷ ABoundaryBody a → Value #

toEncoding ∷ ABoundaryBody a → Encoding #

toJSONList ∷ [ABoundaryBody a] → Value #

toEncodingList ∷ [ABoundaryBody a] → Encoding #

ToJSON a ⇒ ToJSON (ABody a) 
Instance details

Defined in Cardano.Chain.Block.Body

Methods

toJSON ∷ ABody a → Value #

toEncoding ∷ ABody a → Encoding #

toJSONList ∷ [ABody a] → Value #

toEncodingList ∷ [ABody a] → Encoding #

ToJSON a ⇒ ToJSON (APayload a) 
Instance details

Defined in Cardano.Chain.Delegation.Payload

Methods

toJSON ∷ APayload a → Value #

toEncoding ∷ APayload a → Encoding #

toJSONList ∷ [APayload a] → Value #

toEncodingList ∷ [APayload a] → Encoding #

ToJSON a ⇒ ToJSON (ABlockSignature a) 
Instance details

Defined in Cardano.Chain.Block.Header

Methods

toJSON ∷ ABlockSignature a → Value #

toEncoding ∷ ABlockSignature a → Encoding #

toJSONList ∷ [ABlockSignature a] → Value #

toEncodingList ∷ [ABlockSignature a] → Encoding #

ToJSON a ⇒ ToJSON (ATxPayload a) 
Instance details

Defined in Cardano.Chain.UTxO.TxPayload

Methods

toJSON ∷ ATxPayload a → Value #

toEncoding ∷ ATxPayload a → Encoding #

toJSONList ∷ [ATxPayload a] → Value #

toEncodingList ∷ [ATxPayload a] → Encoding #

ToJSON a ⇒ ToJSON (APayload a) 
Instance details

Defined in Cardano.Chain.Update.Payload

Methods

toJSON ∷ APayload a → Value #

toEncoding ∷ APayload a → Encoding #

toJSONList ∷ [APayload a] → Value #

toEncodingList ∷ [APayload a] → Encoding #

ToJSON a ⇒ ToJSON (MerkleRoot a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Methods

toJSON ∷ MerkleRoot a → Value #

toEncoding ∷ MerkleRoot a → Encoding #

toJSONList ∷ [MerkleRoot a] → Value #

toEncodingList ∷ [MerkleRoot a] → Encoding #

ToJSON a ⇒ ToJSON (Attributes a) 
Instance details

Defined in Cardano.Chain.Common.Attributes

Methods

toJSON ∷ Attributes a → Value #

toEncoding ∷ Attributes a → Encoding #

toJSONList ∷ [Attributes a] → Value #

toEncodingList ∷ [Attributes a] → Encoding #

Crypto crypto ⇒ ToJSON (StakeCreds crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Methods

toJSON ∷ StakeCreds crypto → Value #

toEncoding ∷ StakeCreds crypto → Encoding #

toJSONList ∷ [StakeCreds crypto] → Value #

toEncodingList ∷ [StakeCreds crypto] → Encoding #

ToJSON (BuiltinCostModelBase CostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ BuiltinCostModelBase CostingFun → Value #

toEncoding ∷ BuiltinCostModelBase CostingFun → Encoding #

toJSONList ∷ [BuiltinCostModelBase CostingFun] → Value #

toEncodingList ∷ [BuiltinCostModelBase CostingFun] → Encoding #

ToJSON (BuiltinCostModelBase MCostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ BuiltinCostModelBase MCostingFun → Value #

toEncoding ∷ BuiltinCostModelBase MCostingFun → Encoding #

toJSONList ∷ [BuiltinCostModelBase MCostingFun] → Value #

toEncodingList ∷ [BuiltinCostModelBase MCostingFun] → Encoding #

ToJSON model ⇒ ToJSON (CostingFun model) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ CostingFun model → Value #

toEncoding ∷ CostingFun model → Encoding #

toJSONList ∷ [CostingFun model] → Value #

toEncodingList ∷ [CostingFun model] → Encoding #

ToJSON a ⇒ ToJSON (MCostingFun a) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Methods

toJSON ∷ MCostingFun a → Value #

toEncoding ∷ MCostingFun a → Encoding #

toJSONList ∷ [MCostingFun a] → Value #

toEncodingList ∷ [MCostingFun a] → Encoding #

ToJSON d ⇒ ToJSON (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

Methods

toJSON ∷ LinearTransform d → Value #

toEncoding ∷ LinearTransform d → Encoding #

toJSONList ∷ [LinearTransform d] → Value #

toEncodingList ∷ [LinearTransform d] → Encoding #

ToJSON a ⇒ ToJSON (Item a) 
Instance details

Defined in Katip.Core

Methods

toJSON ∷ Item a → Value #

toEncoding ∷ Item a → Encoding #

toJSONList ∷ [Item a] → Value #

toEncodingList ∷ [Item a] → Encoding #

ToJSON (CollectionFormat t) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ CollectionFormat t → Value #

toEncoding ∷ CollectionFormat t → Encoding #

toJSONList ∷ [CollectionFormat t] → Value #

toEncodingList ∷ [CollectionFormat t] → Encoding #

ToJSON (ParamSchema k) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ ParamSchema k → Value #

toEncoding ∷ ParamSchema k → Encoding #

toJSONList ∷ [ParamSchema k] → Value #

toEncodingList ∷ [ParamSchema k] → Encoding #

ToJSON (Referenced Param) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Referenced Param → Value #

toEncoding ∷ Referenced Param → Encoding #

toJSONList ∷ [Referenced Param] → Value #

toEncodingList ∷ [Referenced Param] → Encoding #

ToJSON (Referenced Response) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Referenced Response → Value #

toEncoding ∷ Referenced Response → Encoding #

toJSONList ∷ [Referenced Response] → Value #

toEncodingList ∷ [Referenced Response] → Encoding #

ToJSON (Referenced Schema) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ Referenced Schema → Value #

toEncoding ∷ Referenced Schema → Encoding #

toJSONList ∷ [Referenced Schema] → Value #

toEncodingList ∷ [Referenced Schema] → Encoding #

ToJSON (ParamSchema t) ⇒ ToJSON (SwaggerItems t) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SwaggerItems t → Value #

toEncoding ∷ SwaggerItems t → Encoding #

toJSONList ∷ [SwaggerItems t] → Value #

toEncodingList ∷ [SwaggerItems t] → Encoding #

ToJSON (SwaggerType t) 
Instance details

Defined in Data.Swagger.Internal

Methods

toJSON ∷ SwaggerType t → Value #

toEncoding ∷ SwaggerType t → Encoding #

toJSONList ∷ [SwaggerType t] → Value #

toEncodingList ∷ [SwaggerType t] → Encoding #

ToJSON a ⇒ ToJSON (InsOrdHashSet a) 
Instance details

Defined in Data.HashSet.InsOrd

Methods

toJSON ∷ InsOrdHashSet a → Value #

toEncoding ∷ InsOrdHashSet a → Encoding #

toJSONList ∷ [InsOrdHashSet a] → Value #

toEncodingList ∷ [InsOrdHashSet a] → Encoding #

ToJSON (Flat TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ Flat TokenMap → Value #

toEncoding ∷ Flat TokenMap → Encoding #

toJSONList ∷ [Flat TokenMap] → Value #

toEncodingList ∷ [Flat TokenMap] → Encoding #

ToJSON (Nested TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ Nested TokenMap → Value #

toEncoding ∷ Nested TokenMap → Encoding #

toJSONList ∷ [Nested TokenMap] → Value #

toEncodingList ∷ [Nested TokenMap] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONEither a b → Value #

toEncodingEither a b → Encoding #

toJSONList ∷ [Either a b] → Value #

toEncodingList ∷ [Either a b] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b) → Value #

toEncoding ∷ (a, b) → Encoding #

toJSONList ∷ [(a, b)] → Value #

toEncodingList ∷ [(a, b)] → Encoding #

HasResolution a ⇒ ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONFixed a → Value #

toEncodingFixed a → Encoding #

toJSONList ∷ [Fixed a] → Value #

toEncodingList ∷ [Fixed a] → Encoding #

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONProxy a → Value #

toEncodingProxy a → Encoding #

toJSONList ∷ [Proxy a] → Value #

toEncodingList ∷ [Proxy a] → Encoding #

(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMap k v → Value #

toEncodingMap k v → Encoding #

toJSONList ∷ [Map k v] → Value #

toEncodingList ∷ [Map k v] → Encoding #

ToJSON (EraInMode era mode) 
Instance details

Defined in Cardano.Api.Modes

Methods

toJSON ∷ EraInMode era mode → Value #

toEncoding ∷ EraInMode era mode → Encoding #

toJSONList ∷ [EraInMode era mode] → Value #

toEncodingList ∷ [EraInMode era mode] → Encoding #

ToJSON (ScriptLanguageInEra lang era) 
Instance details

Defined in Cardano.Api.Script

Methods

toJSON ∷ ScriptLanguageInEra lang era → Value #

toEncoding ∷ ScriptLanguageInEra lang era → Encoding #

toJSONList ∷ [ScriptLanguageInEra lang era] → Value #

toEncodingList ∷ [ScriptLanguageInEra lang era] → Encoding #

IsCardanoEra era ⇒ ToJSON (TxOut ctx era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

toJSON ∷ TxOut ctx era → Value #

toEncoding ∷ TxOut ctx era → Encoding #

toJSONList ∷ [TxOut ctx era] → Value #

toEncodingList ∷ [TxOut ctx era] → Encoding #

Crypto crypto ⇒ ToJSON (KeyHash disc crypto) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

toJSON ∷ KeyHash disc crypto → Value #

toEncoding ∷ KeyHash disc crypto → Encoding #

toJSONList ∷ [KeyHash disc crypto] → Value #

toEncodingList ∷ [KeyHash disc crypto] → Encoding #

HashAlgorithm h ⇒ ToJSON (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

toJSON ∷ Hash h a → Value #

toEncoding ∷ Hash h a → Encoding #

toJSONList ∷ [Hash h a] → Value #

toEncodingList ∷ [Hash h a] → Encoding #

ToJSON b ⇒ ToJSON (Annotated b a) 
Instance details

Defined in Cardano.Binary.Annotated

Methods

toJSON ∷ Annotated b a → Value #

toEncoding ∷ Annotated b a → Encoding #

toJSONList ∷ [Annotated b a] → Value #

toEncodingList ∷ [Annotated b a] → Encoding #

ToJSON (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

Methods

toJSON ∷ AbstractHash algo a → Value #

toEncoding ∷ AbstractHash algo a → Encoding #

toJSONList ∷ [AbstractHash algo a] → Value #

toEncodingList ∷ [AbstractHash algo a] → Encoding #

Crypto crypto ⇒ ToJSON (Credential kr crypto) 
Instance details

Defined in Cardano.Ledger.Credential

Methods

toJSON ∷ Credential kr crypto → Value #

toEncoding ∷ Credential kr crypto → Encoding #

toJSONList ∷ [Credential kr crypto] → Value #

toEncodingList ∷ [Credential kr crypto] → Encoding #

(ToJSON v, ToJSONKey k) ⇒ ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ HashMap k v → Value #

toEncoding ∷ HashMap k v → Encoding #

toJSONList ∷ [HashMap k v] → Value #

toEncodingList ∷ [HashMap k v] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Either a b → Value #

toEncoding ∷ Either a b → Encoding #

toJSONList ∷ [Either a b] → Value #

toEncodingList ∷ [Either a b] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (Pair a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Pair a b → Value #

toEncoding ∷ Pair a b → Encoding #

toJSONList ∷ [Pair a b] → Value #

toEncodingList ∷ [Pair a b] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ These a b → Value #

toEncoding ∷ These a b → Encoding #

toJSONList ∷ [These a b] → Value #

toEncodingList ∷ [These a b] → Encoding #

(ToJSON a, ToJSON b) ⇒ ToJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ These a b → Value #

toEncoding ∷ These a b → Encoding #

toJSONList ∷ [These a b] → Value #

toEncodingList ∷ [These a b] → Encoding #

ToJSON (BoundedRatio b Word64) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ BoundedRatio b Word64 → Value #

toEncoding ∷ BoundedRatio b Word64 → Encoding #

toJSONList ∷ [BoundedRatio b Word64] → Value #

toEncodingList ∷ [BoundedRatio b Word64] → Encoding #

(ToJSON a, ToJSONKey k) ⇒ ToJSON (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

Methods

toJSON ∷ MonoidalMap k a → Value #

toEncoding ∷ MonoidalMap k a → Encoding #

toJSONList ∷ [MonoidalMap k a] → Value #

toEncodingList ∷ [MonoidalMap k a] → Encoding #

(ToJSONKey k, ToJSON v) ⇒ ToJSON (InsOrdHashMap k v) 
Instance details

Defined in Data.HashMap.Strict.InsOrd

Methods

toJSON ∷ InsOrdHashMap k v → Value #

toEncoding ∷ InsOrdHashMap k v → Encoding #

toJSONList ∷ [InsOrdHashMap k v] → Value #

toEncodingList ∷ [InsOrdHashMap k v] → Encoding #

(KnownSymbol unit, ToJSON a) ⇒ ToJSON (Quantity unit a) 
Instance details

Defined in Data.Quantity

Methods

toJSON ∷ Quantity unit a → Value #

toEncoding ∷ Quantity unit a → Encoding #

toJSONList ∷ [Quantity unit a] → Value #

toEncodingList ∷ [Quantity unit a] → Encoding #

(ToJSON a, ToJSON b, ToJSON c) ⇒ ToJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c) → Value #

toEncoding ∷ (a, b, c) → Encoding #

toJSONList ∷ [(a, b, c)] → Value #

toEncodingList ∷ [(a, b, c)] → Encoding #

ToJSON a ⇒ ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONConst a b → Value #

toEncodingConst a b → Encoding #

toJSONList ∷ [Const a b] → Value #

toEncodingList ∷ [Const a b] → Encoding #

ToJSON b ⇒ ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ Tagged a b → Value #

toEncoding ∷ Tagged a b → Encoding #

toJSONList ∷ [Tagged a b] → Value #

toEncodingList ∷ [Tagged a b] → Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (These1 f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ These1 f g a → Value #

toEncoding ∷ These1 f g a → Encoding #

toJSONList ∷ [These1 f g a] → Value #

toEncodingList ∷ [These1 f g a] → Encoding #

(AesonOptions t, Generic a, GToJSON Zero (Rep a), GToEncoding Zero (Rep a)) ⇒ ToJSON (CustomJSON t a) 
Instance details

Defined in Deriving.Aeson

Methods

toJSON ∷ CustomJSON t a → Value #

toEncoding ∷ CustomJSON t a → Encoding #

toJSONList ∷ [CustomJSON t a] → Value #

toEncodingList ∷ [CustomJSON t a] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d) ⇒ ToJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d) → Value #

toEncoding ∷ (a, b, c, d) → Encoding #

toJSONList ∷ [(a, b, c, d)] → Value #

toEncodingList ∷ [(a, b, c, d)] → Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONProduct f g a → Value #

toEncodingProduct f g a → Encoding #

toJSONList ∷ [Product f g a] → Value #

toEncodingList ∷ [Product f g a] → Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONSum f g a → Value #

toEncodingSum f g a → Encoding #

toJSONList ∷ [Sum f g a] → Value #

toEncodingList ∷ [Sum f g a] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) ⇒ ToJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e) → Value #

toEncoding ∷ (a, b, c, d, e) → Encoding #

toJSONList ∷ [(a, b, c, d, e)] → Value #

toEncodingList ∷ [(a, b, c, d, e)] → Encoding #

(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONCompose f g a → Value #

toEncodingCompose f g a → Encoding #

toJSONList ∷ [Compose f g a] → Value #

toEncodingList ∷ [Compose f g a] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) ⇒ ToJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f) → Value #

toEncoding ∷ (a, b, c, d, e, f) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) ⇒ ToJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g) → Value #

toEncoding ∷ (a, b, c, d, e, f, g) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) ⇒ ToJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) ⇒ ToJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Encoding #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Value #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Encoding #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Value #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Encoding #

data Some (tag ∷ k → Type) where #

Bundled Patterns

pattern Some ∷ ∀ k tag (a ∷ k). () ⇒ tag a → Some tag 

Instances

Instances details
GEq tag ⇒ Eq (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

(==)Some tag → Some tag → Bool #

(/=)Some tag → Some tag → Bool #

GCompare tag ⇒ Ord (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

compareSome tag → Some tag → Ordering #

(<)Some tag → Some tag → Bool #

(<=)Some tag → Some tag → Bool #

(>)Some tag → Some tag → Bool #

(>=)Some tag → Some tag → Bool #

maxSome tag → Some tag → Some tag #

minSome tag → Some tag → Some tag #

GRead f ⇒ Read (Some f) 
Instance details

Defined in Data.Some.Newtype

GShow tag ⇒ Show (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

showsPrecIntSome tag → ShowS #

showSome tag → String #

showList ∷ [Some tag] → ShowS #

Applicative m ⇒ Semigroup (Some m) 
Instance details

Defined in Data.Some.Newtype

Methods

(<>)Some m → Some m → Some m #

sconcatNonEmpty (Some m) → Some m #

stimesIntegral b ⇒ b → Some m → Some m #

Applicative m ⇒ Monoid (Some m) 
Instance details

Defined in Data.Some.Newtype

Methods

memptySome m #

mappendSome m → Some m → Some m #

mconcat ∷ [Some m] → Some m #

GNFData tag ⇒ NFData (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

rnfSome tag → () #

(Closed uni, Everywhere uni ExMemoryUsage) ⇒ ExMemoryUsage (Some (ValueOf uni)) 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Methods

memoryUsageSome (ValueOf uni) → ExMemory

rightToMaybeEither a b → Maybe b #

ifor_ ∷ (FoldableWithIndex i t, Applicative f) ⇒ t a → (i → a → f b) → f () #

itoList ∷ FoldableWithIndex i f ⇒ f a → [(i, a)] #

withSomeSome tag → (∀ (a ∷ k). tag a → b) → b #

catMaybes ∷ Filterable f ⇒ f (Maybe a) → f a #

mapMaybe ∷ Filterable f ⇒ (a → Maybe b) → f a → f b #

wither ∷ (Witherable t, Applicative f) ⇒ (a → f (Maybe b)) → t a → f (t b) #

iwither ∷ (WitherableWithIndex i t, Applicative f) ⇒ (i → a → f (Maybe b)) → t a → f (t b) #

pattern TODO ∷ () ⇒ HasCallStack ⇒ a #

Deprecated: TODO left in the code

Use TODO instead of undefineds

findFirstFoldable f ⇒ (a → Maybe b) → f a → Maybe b #

decodeUtf8LenientByteStringText #

Decode a strict ByteString containing UTF-8 encoded text.

lazyDecodeUtf8LenientByteStringText #

Decode a lazy ByteString containing UTF-8 encoded text.

Any invalid input bytes will be replaced with the Unicode replacement character U+FFFD.

hushEither e a → Maybe a #

Convert a Either into a Maybe, using the Right as Just and silencing the Left val as Nothing.

Orphan instances

(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # 
Instance details

Methods

parseJSON ∷ Value → Parser ByteString #

parseJSONList ∷ Value → Parser [ByteString] #

(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # 
Instance details

Methods

toJSONByteString → Value #

toEncodingByteString → Encoding #

toJSONList ∷ [ByteString] → Value #

toEncodingList ∷ [ByteString] → Encoding #