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

GeniusYield.Imports

Description

 
Synopsis

Documentation

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

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

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

guardAlternative f ⇒ Bool → f () Source #

Conditional failure of Alternative computations. Defined by

guard True  = pure ()
guard False = empty

Examples

Expand

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

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

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

A definition of safeDiv using guards, but not guard:

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

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

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

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

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

'join bss' can be understood as the do expression

do bs <- bss
   bs

Examples

Expand

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

atomically :: STM a -> IO a

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

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

we can compose them as

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

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

class IsString a where Source #

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

Methods

fromStringString → a Source #

Instances

Instances details
IsString Key 
Instance details

Defined in Data.Aeson.Key

Methods

fromStringStringKey Source #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromStringStringValue Source #

IsString GYAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

IsString GYStakeAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

IsString GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

IsString GYExtendedPaymentSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYExtendedStakeSigningKey # 
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 GYStakeSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYStakeVerificationKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYLogNamespace # 
Instance details

Defined in GeniusYield.Types.Logging

IsString LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

IsString GYPaymentKeyHash # 
Instance details

Defined in GeniusYield.Types.PaymentKeyHash

IsString GYPubKeyHash # 
Instance details

Defined in GeniusYield.Types.PubKeyHash

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

Defined in GeniusYield.Types.Script

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

Defined in GeniusYield.Types.Script

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

Defined in GeniusYield.Types.Script

IsString GYStakeKeyHash # 
Instance details

Defined in GeniusYield.Types.StakeKeyHash

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

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

Defined in GeniusYield.Types.Tx

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

IsString GYAssetClass # 
Instance details

Defined in GeniusYield.Types.Value

IsString GYTokenName #

Does NOT UTF8-encode.

Instance details

Defined in GeniusYield.Types.Value

IsString Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

IsString ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

IsString AsciiString 
Instance details

Defined in Basement.Types.AsciiString

IsString String 
Instance details

Defined in Basement.UTF8.Base

IsString Project 
Instance details

Defined in Blockfrost.Auth

IsString Address 
Instance details

Defined in Blockfrost.Types.Shared.Address

IsString AssetId 
Instance details

Defined in Blockfrost.Types.Shared.AssetId

IsString BlockHash 
Instance details

Defined in Blockfrost.Types.Shared.BlockHash

IsString DatumHash 
Instance details

Defined in Blockfrost.Types.Shared.DatumHash

IsString PolicyId 
Instance details

Defined in Blockfrost.Types.Shared.PolicyId

IsString PoolId 
Instance details

Defined in Blockfrost.Types.Shared.PoolId

IsString ScriptHash 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

IsString TxHash 
Instance details

Defined in Blockfrost.Types.Shared.TxHash

IsString ByteString

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

Instance details

Defined in Data.ByteString.Internal.Type

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

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

Defined in Cardano.Api.ProtocolParameters

IsString ScriptHash 
Instance details

Defined in Cardano.Api.Script

IsString TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

IsString TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

IsString TxId 
Instance details

Defined in Cardano.Api.TxIn

Methods

fromStringStringTxId Source #

IsString AssetName 
Instance details

Defined in Cardano.Api.Value

IsString PolicyId 
Instance details

Defined in Cardano.Api.Value

IsString Seed 
Instance details

Defined in Crypto.Encoding.BIP39

Methods

fromStringStringSeed Source #

IsString ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

IsString SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

IsString GroupName 
Instance details

Defined in Hedgehog.Internal.Property

IsString LabelName 
Instance details

Defined in Hedgehog.Internal.Property

IsString PropertyName 
Instance details

Defined in Hedgehog.Internal.Property

IsString Skip

We use this instance to support usage like

  withSkip "3:aB"

It throws an error if the input is not a valid compressed Skip.

Instance details

Defined in Hedgehog.Internal.Property

Methods

fromStringStringSkip Source #

IsString RequestBody

Since 0.4.12

Instance details

Defined in Network.HTTP.Client.Types

IsString MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

IsString IP 
Instance details

Defined in Data.IP.Addr

Methods

fromStringStringIP Source #

IsString IPv4 
Instance details

Defined in Data.IP.Addr

Methods

fromStringStringIPv4 Source #

IsString IPv6 
Instance details

Defined in Data.IP.Addr

Methods

fromStringStringIPv6 Source #

IsString IPRange 
Instance details

Defined in Data.IP.Range

IsString Environment 
Instance details

Defined in Katip.Core

IsString LogStr 
Instance details

Defined in Katip.Core

IsString Namespace 
Instance details

Defined in Katip.Core

IsString PolicyId 
Instance details

Defined in Maestro.Types.Common

IsString TokenName 
Instance details

Defined in Maestro.Types.Common

IsString TxHash 
Instance details

Defined in Maestro.Types.Common

IsString NextCursor 
Instance details

Defined in Maestro.Types.V1.Common.Pagination

IsString ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

IsString UnliftingError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

IsString LedgerBytes

Read in arbitrary LedgerBytes as a "string" (of characters).

This is mostly used together with GHC's OverloadedStrings extension to specify at the source code any LedgerBytes constants, by utilizing Haskell's double-quoted string syntax.

IMPORTANT: the LedgerBytes are expected to be already hex-encoded (base16); otherwise, LedgerBytesError will be raised as an Exception.

Instance details

Defined in PlutusLedgerApi.V1.Bytes

IsString PubKeyHash

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Crypto

IsString DatumHash

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

IsString RedeemerHash

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

IsString ScriptHash

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Scripts

IsString TxId

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Tx

Methods

fromStringStringTxId Source #

IsString CurrencySymbol

from hex encoding

Instance details

Defined in PlutusLedgerApi.V1.Value

IsString TokenName

UTF-8 encoding. Doesn't verify length.

Instance details

Defined in PlutusLedgerApi.V1.Value

IsString Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

IsString QualifiedIdentifier

"foo.bar" will get turned into QualifiedIdentifier (Just "foo") "bar", while "foo" will get turned into QualifiedIdentifier Nothing "foo". Note this instance is for convenience, and does not match postgres syntax. It only examines the first period character, and thus cannot be used if the qualifying identifier contains a period for example.

Instance details

Defined in Database.PostgreSQL.Simple.Types

IsString Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromStringStringQuery Source #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromStringStringDoc Source #

IsString Host 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringStringHost Source #

IsString License 
Instance details

Defined in Data.Swagger.Internal

IsString Response 
Instance details

Defined in Data.Swagger.Internal

IsString Tag 
Instance details

Defined in Data.Swagger.Internal

Methods

fromStringStringTag Source #

IsString Builder 
Instance details

Defined in Data.Text.Internal.Builder

IsString ShortText

Note: Surrogate pairs ([U+D800 .. U+DFFF]) in string literals are replaced by U+FFFD.

This matches the behaviour of IsString instance for Text.

Instance details

Defined in Data.Text.Short.Internal

IsString a ⇒ IsString (Graph a) 
Instance details

Defined in Algebra.Graph

Methods

fromStringStringGraph a Source #

IsString a ⇒ IsString (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.AdjacencyMap

IsString a ⇒ IsString (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

IsString a ⇒ IsString (Relation a) 
Instance details

Defined in Algebra.Graph.Relation

Methods

fromStringStringRelation a Source #

IsString a ⇒ IsString (Relation a) 
Instance details

Defined in Algebra.Graph.Relation.Symmetric

Methods

fromStringStringRelation a Source #

IsString a ⇒ IsString (Graph a) 
Instance details

Defined in Algebra.Graph.Undirected

Methods

fromStringStringGraph a Source #

IsString a ⇒ IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringIdentity a Source #

IsString (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

IsString (Hash GovernancePoll) 
Instance details

Defined in Cardano.Api.Governance.Poll

IsString (Hash ByronKey) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (Hash ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (Hash KesKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (Hash VrfKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (Hash GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash GenesisKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash PaymentKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash StakeExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash StakeKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

IsString (SigningKey ByronKey) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (SigningKey ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (SigningKey KesKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (SigningKey VrfKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (SigningKey GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey GenesisKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey PaymentKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey StakeExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey StakeKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (SigningKey StakePoolKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey ByronKey) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (VerificationKey ByronKeyLegacy) 
Instance details

Defined in Cardano.Api.Keys.Byron

IsString (VerificationKey KesKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (VerificationKey VrfKey) 
Instance details

Defined in Cardano.Api.Keys.Praos

IsString (VerificationKey GenesisDelegateExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey GenesisDelegateKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey GenesisExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey GenesisKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey GenesisUTxOKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey PaymentExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey PaymentKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey StakeExtendedKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey StakeKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

IsString (VerificationKey StakePoolKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

SerialiseAsBech32 a ⇒ IsString (UsingBech32 a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

SerialiseAsRawBytes a ⇒ IsString (UsingRawBytesHex a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

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

Defined in Data.CaseInsensitive.Internal

Methods

fromStringStringCI s Source #

a ~ CharIsString (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

fromStringStringSeq a Source #

a ~ CharIsString (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

a ~ CharIsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromStringStringDList a Source #

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

Defined in Data.Hashable.Class

Methods

fromStringStringHashed a Source #

IsString (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

IsString (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

IsString (Bech32StringOf a) 
Instance details

Defined in Maestro.Types.Common

IsString (HashStringOf a) 
Instance details

Defined in Maestro.Types.Common

IsString (HexStringOf a) 
Instance details

Defined in Maestro.Types.Common

IsString (TaggedText description) 
Instance details

Defined in Maestro.Types.V1.Common

Methods

fromStringStringTaggedText description Source #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromStringStringDoc a Source #

IsString (Doc ann)
>>> pretty ("hello\nworld")
hello
world

This instance uses the Pretty Doc instance, and uses the same newline to line conversion.

Instance details

Defined in Prettyprinter.Internal

Methods

fromStringStringDoc ann Source #

IsString a ⇒ IsString (Referenced a) 
Instance details

Defined in Data.Swagger.Internal

HashAlgorithm h ⇒ IsString (Q (TExp (Hash h a)))

This instance is meant to be used with TemplateHaskell

>>> import Cardano.Crypto.Hash.Class (Hash)
>>> import Cardano.Crypto.Hash.Short (ShortHash)
>>> :set -XTemplateHaskell
>>> :set -XOverloadedStrings
>>> let hash = $$("0xBADC0FFEE0DDF00D") :: Hash ShortHash ()
>>> print hash
"badc0ffee0ddf00d"
>>> let hash = $$("0123456789abcdef") :: Hash ShortHash ()
>>> print hash
"0123456789abcdef"
>>> let hash = $$("deadbeef") :: Hash ShortHash ()
<interactive>:5:15: error:
    • <Hash blake2b_prefix_8>: Expected in decoded form to be: 8 bytes, but got: 4
    • In the Template Haskell splice $$("deadbeef")
      In the expression: $$("deadbeef") :: Hash ShortHash ()
      In an equation for ‘hash’:
          hash = $$("deadbeef") :: Hash ShortHash ()
>>> let hash = $$("123") :: Hash ShortHash ()
<interactive>:6:15: error:
    • <Hash blake2b_prefix_8>: Malformed hex: invalid bytestring size
    • In the Template Haskell splice $$("123")
      In the expression: $$("123") :: Hash ShortHash ()
      In an equation for ‘hash’: hash = $$("123") :: Hash ShortHash ()
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

fromStringStringQ (TExp (Hash h a)) Source #

KnownNat n ⇒ IsString (Q (TExp (PinnedSizedBytes n)))

This instance is meant to be used with TemplateHaskell

>>> import Cardano.Crypto.PinnedSizedBytes
>>> :set -XTemplateHaskell
>>> :set -XOverloadedStrings
>>> :set -XDataKinds
>>> print ($$("0xdeadbeef") :: PinnedSizedBytes 4)
"deadbeef"
>>> print ($$("deadbeef") :: PinnedSizedBytes 4)
"deadbeef"
>>> let bsb = $$("0xdeadbeef") :: PinnedSizedBytes 5
<interactive>:9:14: error:
    • <PinnedSizedBytes>: Expected in decoded form to be: 5 bytes, but got: 4
    • In the Template Haskell splice $$("0xdeadbeef")
      In the expression: $$("0xdeadbeef") :: PinnedSizedBytes 5
      In an equation for ‘bsb’:
          bsb = $$("0xdeadbeef") :: PinnedSizedBytes 5
>>> let bsb = $$("nogood") :: PinnedSizedBytes 5
<interactive>:11:14: error:
    • <PinnedSizedBytes>: Malformed hex: invalid character at offset: 0
    • In the Template Haskell splice $$("nogood")
      In the expression: $$("nogood") :: PinnedSizedBytes 5
      In an equation for ‘bsb’: bsb = $$("nogood") :: PinnedSizedBytes 5
Instance details

Defined in Cardano.Crypto.PinnedSizedBytes

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

fromStringStringDoc a Source #

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] Source #

IsString a ⇒ IsString (Graph e a) 
Instance details

Defined in Algebra.Graph.Labelled

Methods

fromStringStringGraph e a Source #

IsString a ⇒ IsString (AdjacencyMap e a) 
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

IsString (File content direction) 
Instance details

Defined in Cardano.Api.IO.Base

Methods

fromStringStringFile content direction Source #

HashAlgorithm h ⇒ IsString (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

fromStringStringHash h a Source #

IsString a ⇒ IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringConst a b Source #

IsString a ⇒ IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromStringStringTagged s a Source #

HashAlgorithm h ⇒ IsString (Code Q (Hash h a)) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

fromStringStringCode Q (Hash h a) Source #

KnownNat n ⇒ IsString (Code Q (PinnedSizedBytes n)) 
Instance details

Defined in Cardano.Crypto.PinnedSizedBytes

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

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.

Example

Expand
>>> liftA2 (,) (Just 3) (Just 5)
Just (3,5)

toListFoldable t ⇒ t a → [a] Source #

List of elements of a structure, from left to right. If the entire list is intended to be reduced via a fold, just fold the structure directly bypassing the list.

Examples

Expand

Basic usage:

>>> toList Nothing
[]
>>> toList (Just 42)
[42]
>>> toList (Left "foo")
[]
>>> toList (Node (Leaf 5) 17 (Node Empty 12 (Leaf 8)))
[5,17,12,8]

For lists, toList is the identity:

>>> toList [1, 2, 3]
[1,2,3]

Since: base-4.8.0.0

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

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

This ensures that each step of the fold is forced to Weak Head Normal Form before being applied, avoiding the collection of thunks that would otherwise occur. This is often what you want to strictly reduce a finite structure to a single strict result (e.g. sum).

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

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

A Generic instance must satisfy the following laws:

from . toid
to . fromid

Minimal complete definition

from, to

Instances

Instances details
Generic CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Associated Types

type Rep CabalSpecVersionTypeType Source #

Generic PError 
Instance details

Defined in Distribution.Parsec.Error

Associated Types

type Rep PErrorTypeType Source #

Methods

fromPErrorRep PError x Source #

toRep PError x → PError Source #

Generic Position 
Instance details

Defined in Distribution.Parsec.Position

Associated Types

type Rep PositionTypeType Source #

Generic PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarnTypeTypeType Source #

Generic PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarningTypeType Source #

Generic Arch 
Instance details

Defined in Distribution.System

Associated Types

type Rep ArchTypeType Source #

Methods

fromArchRep Arch x Source #

toRep Arch x → Arch Source #

Generic OS 
Instance details

Defined in Distribution.System

Associated Types

type Rep OSTypeType Source #

Methods

fromOSRep OS x Source #

toRep OS x → OS Source #

Generic Platform 
Instance details

Defined in Distribution.System

Associated Types

type Rep PlatformTypeType Source #

Generic Structure 
Instance details

Defined in Distribution.Utils.Structured

Associated Types

type Rep StructureTypeType Source #

Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep ValueTypeType Source #

Methods

fromValueRep Value x Source #

toRep Value x → Value Source #

Generic AdjacencyIntMap 
Instance details

Defined in Algebra.Graph.AdjacencyIntMap

Associated Types

type Rep AdjacencyIntMapTypeType Source #

Generic GYAddress # 
Instance details

Defined in GeniusYield.Types.Address

Associated Types

type Rep GYAddressTypeType Source #

Generic GYStakeAddress # 
Instance details

Defined in GeniusYield.Types.Address

Associated Types

type Rep GYStakeAddressTypeType Source #

Generic GYEra # 
Instance details

Defined in GeniusYield.Types.Era

Associated Types

type Rep GYEraTypeType Source #

Methods

fromGYEraRep GYEra x Source #

toRep GYEra x → GYEra Source #

Generic GYNatural # 
Instance details

Defined in GeniusYield.Types.Natural

Associated Types

type Rep GYNaturalTypeType Source #

Generic GYRational # 
Instance details

Defined in GeniusYield.Types.Rational

Associated Types

type Rep GYRationalTypeType Source #

Generic GYAssetClass # 
Instance details

Defined in GeniusYield.Types.Value

Associated Types

type Rep GYAssetClassTypeType Source #

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep AllTypeType Source #

Methods

fromAllRep All x Source #

toRep All x → All Source #

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep AnyTypeType Source #

Methods

fromAnyRep Any x Source #

toRep Any x → Any Source #

Generic Version 
Instance details

Defined in Data.Version

Associated Types

type Rep VersionTypeType Source #

Methods

fromVersionRep Version x Source #

toRep Version x → Version Source #

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep VoidTypeType Source #

Methods

fromVoidRep Void x Source #

toRep Void x → Void Source #

Generic ByteOrder 
Instance details

Defined in GHC.ByteOrder

Associated Types

type Rep ByteOrderTypeType Source #

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep FingerprintTypeType Source #

Generic Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep AssociativityTypeType Source #

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictnessTypeType Source #

Generic Fixity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep FixityTypeType Source #

Methods

fromFixityRep Fixity x Source #

toRep Fixity x → Fixity Source #

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictnessTypeType Source #

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackednessTypeType Source #

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCodeTypeType Source #

Generic CCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep CCFlagsTypeType Source #

Methods

fromCCFlagsRep CCFlags x Source #

toRep CCFlags x → CCFlags Source #

Generic ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ConcFlagsTypeType Source #

Generic DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DebugFlagsTypeType Source #

Generic DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoCostCentresTypeType Source #

Generic DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoHeapProfileTypeType Source #

Generic DoTrace 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoTraceTypeType Source #

Methods

fromDoTraceRep DoTrace x Source #

toRep DoTrace x → DoTrace Source #

Generic GCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GCFlagsTypeType Source #

Methods

fromGCFlagsRep GCFlags x Source #

toRep GCFlags x → GCFlags Source #

Generic GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GiveGCStatsTypeType Source #

Generic MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep MiscFlagsTypeType Source #

Generic ParFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ParFlagsTypeType Source #

Generic ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ProfFlagsTypeType Source #

Generic RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep RTSFlagsTypeType Source #

Generic TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TickyFlagsTypeType Source #

Generic TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TraceFlagsTypeType Source #

Generic SrcLoc 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SrcLocTypeType Source #

Methods

fromSrcLocRep SrcLoc x Source #

toRep SrcLoc x → SrcLoc Source #

Generic GCDetails 
Instance details

Defined in GHC.Stats

Associated Types

type Rep GCDetailsTypeType Source #

Generic RTSStats 
Instance details

Defined in GHC.Stats

Associated Types

type Rep RTSStatsTypeType Source #

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategoryTypeType Source #

Generic Alphabet 
Instance details

Defined in Data.ByteString.Base58.Internal

Associated Types

type Rep AlphabetTypeType Source #

Generic ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

Associated Types

type Rep ByteString64TypeType Source #

Generic Project 
Instance details

Defined in Blockfrost.Auth

Associated Types

type Rep ProjectTypeType Source #

Methods

fromProjectRep Project x Source #

toRep Project x → Project Source #

Generic Env 
Instance details

Defined in Blockfrost.Env

Associated Types

type Rep EnvTypeType Source #

Methods

fromEnvRep Env x Source #

toRep Env x → Env Source #

Generic ApiError 
Instance details

Defined in Blockfrost.Types.ApiError

Associated Types

type Rep ApiErrorTypeType Source #

Generic AccountDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountDelegationTypeType Source #

Generic AccountHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountHistoryTypeType Source #

Generic AccountInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountInfoTypeType Source #

Generic AccountMir 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountMirTypeType Source #

Generic AccountRegistration 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountRegistrationTypeType Source #

Generic AccountRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountRegistrationActionTypeType Source #

Generic AccountReward 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountRewardTypeType Source #

Generic AccountWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AccountWithdrawalTypeType Source #

Generic AddressAssociated 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep AddressAssociatedTypeType Source #

Generic RewardType 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

Associated Types

type Rep RewardTypeTypeType Source #

Generic AddressDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

Associated Types

type Rep AddressDetailsTypeType Source #

Generic AddressInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

Associated Types

type Rep AddressInfoTypeType Source #

Generic AddressTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

Associated Types

type Rep AddressTransactionTypeType Source #

Generic AddressType 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

Associated Types

type Rep AddressTypeTypeType Source #

Generic AddressUtxo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

Associated Types

type Rep AddressUtxoTypeType Source #

Generic AssetAction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetActionTypeType Source #

Generic AssetAddress 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetAddressTypeType Source #

Generic AssetDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetDetailsTypeType Source #

Generic AssetHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetHistoryTypeType Source #

Generic AssetInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetInfoTypeType Source #

Generic AssetMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetMetadataTypeType Source #

Generic AssetOnChainMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetOnChainMetadataTypeType Source #

Generic AssetTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

Associated Types

type Rep AssetTransactionTypeType Source #

Generic Block 
Instance details

Defined in Blockfrost.Types.Cardano.Blocks

Associated Types

type Rep BlockTypeType Source #

Methods

fromBlockRep Block x Source #

toRep Block x → Block Source #

Generic CostModels 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

Associated Types

type Rep CostModelsTypeType Source #

Generic EpochInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

Associated Types

type Rep EpochInfoTypeType Source #

Generic PoolStakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

Associated Types

type Rep PoolStakeDistributionTypeType Source #

Generic ProtocolParams 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

Associated Types

type Rep ProtocolParamsTypeType Source #

Generic StakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

Associated Types

type Rep StakeDistributionTypeType Source #

Generic Genesis 
Instance details

Defined in Blockfrost.Types.Cardano.Genesis

Associated Types

type Rep GenesisTypeType Source #

Methods

fromGenesisRep Genesis x Source #

toRep Genesis x → Genesis Source #

Generic TxMeta 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

Associated Types

type Rep TxMetaTypeType Source #

Methods

fromTxMetaRep TxMeta x Source #

toRep TxMeta x → TxMeta Source #

Generic TxMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

Associated Types

type Rep TxMetaCBORTypeType Source #

Generic TxMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

Associated Types

type Rep TxMetaJSONTypeType Source #

Generic Network 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkTypeType Source #

Methods

fromNetworkRep Network x Source #

toRep Network x → Network Source #

Generic NetworkEraBound 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkEraBoundTypeType Source #

Generic NetworkEraParameters 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkEraParametersTypeType Source #

Generic NetworkEraSummary 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkEraSummaryTypeType Source #

Generic NetworkStake 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkStakeTypeType Source #

Generic NetworkSupply 
Instance details

Defined in Blockfrost.Types.Cardano.Network

Associated Types

type Rep NetworkSupplyTypeType Source #

Generic PoolDelegator 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolDelegatorTypeType Source #

Generic PoolEpoch 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolEpochTypeType Source #

Generic PoolHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolHistoryTypeType Source #

Generic PoolInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolInfoTypeType Source #

Generic PoolMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolMetadataTypeType Source #

Generic PoolRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolRegistrationActionTypeType Source #

Generic PoolRelay 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolRelayTypeType Source #

Generic PoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

Associated Types

type Rep PoolUpdateTypeType Source #

Generic InlineDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep InlineDatumTypeType Source #

Generic Script 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptTypeType Source #

Methods

fromScriptRep Script x Source #

toRep Script x → Script Source #

Generic ScriptCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptCBORTypeType Source #

Generic ScriptDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptDatumTypeType Source #

Generic ScriptDatumCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptDatumCBORTypeType Source #

Generic ScriptJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptJSONTypeType Source #

Generic ScriptRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptRedeemerTypeType Source #

Generic ScriptType 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

Associated Types

type Rep ScriptTypeTypeType Source #

Generic PoolUpdateMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep PoolUpdateMetadataTypeType Source #

Generic Pot 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep PotTypeType Source #

Methods

fromPotRep Pot x Source #

toRep Pot x → Pot Source #

Generic Transaction 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionTypeType Source #

Generic TransactionDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionDelegationTypeType Source #

Generic TransactionMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionMetaCBORTypeType Source #

Generic TransactionMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionMetaJSONTypeType Source #

Generic TransactionMir 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionMirTypeType Source #

Generic TransactionPoolRetiring 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionPoolRetiringTypeType Source #

Generic TransactionPoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionPoolUpdateTypeType Source #

Generic TransactionRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionRedeemerTypeType Source #

Generic TransactionStake 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionStakeTypeType Source #

Generic TransactionUtxos 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionUtxosTypeType Source #

Generic TransactionWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep TransactionWithdrawalTypeType Source #

Generic UtxoInput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep UtxoInputTypeType Source #

Generic UtxoOutput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

Associated Types

type Rep UtxoOutputTypeType Source #

Generic Healthy 
Instance details

Defined in Blockfrost.Types.Common

Associated Types

type Rep HealthyTypeType Source #

Methods

fromHealthyRep Healthy x Source #

toRep Healthy x → Healthy Source #

Generic Metric 
Instance details

Defined in Blockfrost.Types.Common

Associated Types

type Rep MetricTypeType Source #

Methods

fromMetricRep Metric x Source #

toRep Metric x → Metric Source #

Generic ServerTime 
Instance details

Defined in Blockfrost.Types.Common

Associated Types

type Rep ServerTimeTypeType Source #

Generic URLVersion 
Instance details

Defined in Blockfrost.Types.Common

Associated Types

type Rep URLVersionTypeType Source #

Generic IPFSAdd 
Instance details

Defined in Blockfrost.Types.IPFS

Associated Types

type Rep IPFSAddTypeType Source #

Methods

fromIPFSAddRep IPFSAdd x Source #

toRep IPFSAdd x → IPFSAdd Source #

Generic IPFSData 
Instance details

Defined in Blockfrost.Types.IPFS

Associated Types

type Rep IPFSDataTypeType Source #

Generic IPFSPin 
Instance details

Defined in Blockfrost.Types.IPFS

Associated Types

type Rep IPFSPinTypeType Source #

Methods

fromIPFSPinRep IPFSPin x Source #

toRep IPFSPin x → IPFSPin Source #

Generic IPFSPinChange 
Instance details

Defined in Blockfrost.Types.IPFS

Associated Types

type Rep IPFSPinChangeTypeType Source #

Generic PinState 
Instance details

Defined in Blockfrost.Types.IPFS

Associated Types

type Rep PinStateTypeType Source #

Generic NutlinkAddress 
Instance details

Defined in Blockfrost.Types.NutLink

Associated Types

type Rep NutlinkAddressTypeType Source #

Generic NutlinkAddressTicker 
Instance details

Defined in Blockfrost.Types.NutLink

Associated Types

type Rep NutlinkAddressTickerTypeType Source #

Generic NutlinkTicker 
Instance details

Defined in Blockfrost.Types.NutLink

Associated Types

type Rep NutlinkTickerTypeType Source #

Generic Address 
Instance details

Defined in Blockfrost.Types.Shared.Address

Associated Types

type Rep AddressTypeType Source #

Methods

fromAddressRep Address x Source #

toRep Address x → Address Source #

Generic Amount 
Instance details

Defined in Blockfrost.Types.Shared.Amount

Associated Types

type Rep AmountTypeType Source #

Methods

fromAmountRep Amount x Source #

toRep Amount x → Amount Source #

Generic AssetId 
Instance details

Defined in Blockfrost.Types.Shared.AssetId

Associated Types

type Rep AssetIdTypeType Source #

Methods

fromAssetIdRep AssetId x Source #

toRep AssetId x → AssetId Source #

Generic BlockHash 
Instance details

Defined in Blockfrost.Types.Shared.BlockHash

Associated Types

type Rep BlockHashTypeType Source #

Generic BlockIndex 
Instance details

Defined in Blockfrost.Types.Shared.BlockIndex

Associated Types

type Rep BlockIndexTypeType Source #

Generic DatumHash 
Instance details

Defined in Blockfrost.Types.Shared.DatumHash

Associated Types

type Rep DatumHashTypeType Source #

Generic Epoch 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

Associated Types

type Rep EpochTypeType Source #

Methods

fromEpochRep Epoch x Source #

toRep Epoch x → Epoch Source #

Generic EpochLength 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

Associated Types

type Rep EpochLengthTypeType Source #

Generic POSIXMillis 
Instance details

Defined in Blockfrost.Types.Shared.POSIXMillis

Associated Types

type Rep POSIXMillisTypeType Source #

Generic PolicyId 
Instance details

Defined in Blockfrost.Types.Shared.PolicyId

Associated Types

type Rep PolicyIdTypeType Source #

Generic PoolId 
Instance details

Defined in Blockfrost.Types.Shared.PoolId

Associated Types

type Rep PoolIdTypeType Source #

Methods

fromPoolIdRep PoolId x Source #

toRep PoolId x → PoolId Source #

Generic Quantity 
Instance details

Defined in Blockfrost.Types.Shared.Quantity

Associated Types

type Rep QuantityTypeType Source #

Generic ScriptHash 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

Associated Types

type Rep ScriptHashTypeType Source #

Generic ScriptHashList 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

Associated Types

type Rep ScriptHashListTypeType Source #

Generic Slot 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Associated Types

type Rep SlotTypeType Source #

Methods

fromSlotRep Slot x Source #

toRep Slot x → Slot Source #

Generic TxHash 
Instance details

Defined in Blockfrost.Types.Shared.TxHash

Associated Types

type Rep TxHashTypeType Source #

Methods

fromTxHashRep TxHash x Source #

toRep TxHash x → TxHash Source #

Generic ValidationPurpose 
Instance details

Defined in Blockfrost.Types.Shared.ValidationPurpose

Associated Types

type Rep ValidationPurposeTypeType Source #

Generic Address 
Instance details

Defined in Cardano.Address

Associated Types

type Rep AddressTypeType Source #

Methods

fromAddressRep Address x Source #

toRep Address x → Address Source #

Generic AddressDiscrimination 
Instance details

Defined in Cardano.Address

Associated Types

type Rep AddressDiscriminationTypeType Source #

Generic ChainPointer 
Instance details

Defined in Cardano.Address

Associated Types

type Rep ChainPointerTypeType Source #

Generic NetworkTag 
Instance details

Defined in Cardano.Address

Associated Types

type Rep NetworkTagTypeType Source #

Generic Cosigner 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep CosignerTypeType Source #

Generic KeyHash 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep KeyHashTypeType Source #

Methods

fromKeyHashRep KeyHash x Source #

toRep KeyHash x → KeyHash Source #

Generic KeyRole 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep KeyRoleTypeType Source #

Methods

fromKeyRoleRep KeyRole x Source #

toRep KeyRole x → KeyRole Source #

Generic ScriptHash 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep ScriptHashTypeType Source #

Generic ScriptTemplate 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep ScriptTemplateTypeType Source #

Generic ValidationLevel 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep ValidationLevelTypeType Source #

Generic AddressInfo 
Instance details

Defined in Cardano.Address.Style.Byron

Associated Types

type Rep AddressInfoTypeType Source #

Generic ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Byron

Associated Types

type Rep ErrInspectAddressTypeType Source #

Generic PayloadInfo 
Instance details

Defined in Cardano.Address.Style.Byron

Associated Types

type Rep PayloadInfo ∷ TypeType Source #

Methods

from ∷ PayloadInfo → Rep PayloadInfo x Source #

toRep PayloadInfo x → PayloadInfo Source #

Generic AddressInfo 
Instance details

Defined in Cardano.Address.Style.Icarus

Associated Types

type Rep AddressInfoTypeType Source #

Generic ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Icarus

Associated Types

type Rep ErrInspectAddressTypeType Source #

Generic Role 
Instance details

Defined in Cardano.Address.Style.Icarus

Associated Types

type Rep RoleTypeType Source #

Methods

fromRoleRep Role x Source #

toRep Role x → Role Source #

Generic AddressInfo 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep AddressInfoTypeType Source #

Generic ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep ErrInspectAddressTypeType Source #

Generic ErrInspectAddressOnlyShelley 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep ErrInspectAddressOnlyShelleyTypeType Source #

Generic ErrInvalidStakeAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep ErrInvalidStakeAddress ∷ TypeType Source #

Methods

from ∷ ErrInvalidStakeAddress → Rep ErrInvalidStakeAddress x Source #

toRep ErrInvalidStakeAddress x → ErrInvalidStakeAddress Source #

Generic InspectAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep InspectAddressTypeType Source #

Generic ReferenceInfo 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep ReferenceInfoTypeType Source #

Generic Role 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep RoleTypeType Source #

Methods

fromRoleRep Role x Source #

toRep Role x → Role Source #

Generic PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

Associated Types

type Rep PraosNonceTypeType Source #

Generic ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

Associated Types

type Rep ProtocolParametersTypeType Source #

Generic SelectionConstraints 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionConstraintsTypeType Source #

Generic SelectionParams 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionParamsTypeType Source #

Generic SelectionReport 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReport ∷ TypeType Source #

Methods

from ∷ SelectionReport → Rep SelectionReport x Source #

toRep SelectionReport x → SelectionReport Source #

Generic SelectionReportDetailed 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReportDetailedTypeType Source #

Generic SelectionReportSummarized 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionReportSummarizedTypeType Source #

Generic SelectionSkeleton 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep SelectionSkeletonTypeType Source #

Generic WalletUTxO 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep WalletUTxOTypeType Source #

Generic ComputeMinimumCollateralParams 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep ComputeMinimumCollateralParamsTypeType Source #

Generic SelectionCollateralRequirement 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep SelectionCollateralRequirementTypeType Source #

Generic BalanceInsufficientError 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep BalanceInsufficientErrorTypeType Source #

Generic UTxOBalanceSufficiencyInfo 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep UTxOBalanceSufficiencyInfoTypeType Source #

Generic UnableToConstructChangeError 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep UnableToConstructChangeErrorTypeType Source #

Generic SelectionConstraints 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep SelectionConstraintsTypeType Source #

Generic XPub 
Instance details

Defined in Cardano.Crypto.Wallet

Associated Types

type Rep XPubTypeType Source #

Methods

fromXPubRep XPub x Source #

toRep XPub x → XPub Source #

Generic XPub 
Instance details

Defined in Cardano.Crypto.Wallet.Pure

Associated Types

type Rep XPubTypeType Source #

Methods

fromXPubRep XPub x Source #

toRep XPub x → XPub Source #

Generic Point 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep Point ∷ TypeType Source #

Methods

from ∷ Point → Rep Point x Source #

toRep Point x → Point Source #

Generic Output 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep OutputTypeType Source #

Methods

fromOutputRep Output x Source #

toRep Output x → Output Source #

Generic Proof 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep ProofTypeType Source #

Methods

fromProofRep Proof x Source #

toRep Proof x → Proof Source #

Generic SignKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep SignKeyTypeType Source #

Methods

fromSignKeyRep SignKey x Source #

toRep SignKey x → SignKey Source #

Generic VerKey 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep VerKeyTypeType Source #

Methods

fromVerKeyRep VerKey x Source #

toRep VerKey x → VerKey Source #

Generic Output 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep Output ∷ TypeType Source #

Methods

from ∷ Output → Rep Output x Source #

toRep Output x → Output Source #

Generic Proof 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep Proof ∷ TypeType Source #

Methods

from ∷ Proof → Rep Proof x Source #

toRep Proof x → Proof Source #

Generic SignKey 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep SignKey ∷ TypeType Source #

Methods

from ∷ SignKey → Rep SignKey x Source #

toRep SignKey x → SignKey Source #

Generic VerKey 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep VerKey ∷ TypeType Source #

Methods

from ∷ VerKey → Rep VerKey x Source #

toRep VerKey x → VerKey Source #

Generic ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep ProtocolMagicIdTypeType Source #

Generic RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep RequiresNetworkMagicTypeType Source #

Generic CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

Associated Types

type Rep CompactRedeemVerificationKeyTypeType Source #

Generic RedeemSigningKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.SigningKey

Associated Types

type Rep RedeemSigningKeyTypeType Source #

Generic RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

Associated Types

type Rep RedeemVerificationKeyTypeType Source #

Generic SignTag 
Instance details

Defined in Cardano.Crypto.Signing.Tag

Associated Types

type Rep SignTagTypeType Source #

Methods

fromSignTagRep SignTag x Source #

toRep SignTag x → SignTag Source #

Generic VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

Associated Types

type Rep VerificationKeyTypeType Source #

Generic ValidityInterval 
Instance details

Defined in Cardano.Ledger.Allegra.Scripts

Associated Types

type Rep ValidityIntervalTypeType Source #

Generic AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

Associated Types

type Rep AlonzoGenesisTypeType Source #

Generic LangDepView 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep LangDepViewTypeType Source #

Generic FailureDescription 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep FailureDescriptionTypeType Source #

Generic TagMismatchDescription 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep TagMismatchDescriptionTypeType Source #

Generic CostModel 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep CostModelTypeType Source #

Generic CostModelError 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep CostModelErrorTypeType Source #

Generic CostModels 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep CostModelsTypeType Source #

Generic ExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep ExUnitsTypeType Source #

Methods

fromExUnitsRep ExUnits x Source #

toRep ExUnits x → ExUnits Source #

Generic Prices 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep PricesTypeType Source #

Methods

fromPricesRep Prices x Source #

toRep Prices x → Prices Source #

Generic Tag 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep TagTypeType Source #

Methods

fromTagRep Tag x Source #

toRep Tag x → Tag Source #

Generic IsValid 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep IsValidTypeType Source #

Methods

fromIsValidRep IsValid x Source #

toRep IsValid x → IsValid Source #

Generic ScriptFailure 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep ScriptFailureTypeType Source #

Generic ScriptResult 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep ScriptResultTypeType Source #

Generic Addr28Extra 
Instance details

Defined in Cardano.Ledger.Alonzo.TxOut

Associated Types

type Rep Addr28ExtraTypeType Source #

Generic DataHash32 
Instance details

Defined in Cardano.Ledger.Alonzo.TxOut

Associated Types

type Rep DataHash32TypeType Source #

Generic RdmrPtr 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWits

Associated Types

type Rep RdmrPtrTypeType Source #

Methods

fromRdmrPtrRep RdmrPtr x Source #

toRep RdmrPtr x → RdmrPtr Source #

Generic ByteSpan 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

Associated Types

type Rep ByteSpanTypeType Source #

Generic ToSign 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep ToSignTypeType Source #

Methods

fromToSignRep ToSign x Source #

toRep ToSign x → ToSign Source #

Generic Proof 
Instance details

Defined in Cardano.Chain.Block.Proof

Associated Types

type Rep ProofTypeType Source #

Methods

fromProofRep Proof x Source #

toRep Proof x → Proof Source #

Generic ChainValidationState 
Instance details

Defined in Cardano.Chain.Block.Validation

Associated Types

type Rep ChainValidationStateTypeType Source #

Generic AddrAttributes 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Associated Types

type Rep AddrAttributesTypeType Source #

Generic HDAddressPayload 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

Associated Types

type Rep HDAddressPayloadTypeType Source #

Generic AddrSpendingData 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Associated Types

type Rep AddrSpendingDataTypeType Source #

Generic AddrType 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

Associated Types

type Rep AddrTypeTypeType Source #

Generic Address 
Instance details

Defined in Cardano.Chain.Common.Address

Associated Types

type Rep AddressTypeType Source #

Methods

fromAddressRep Address x Source #

toRep Address x → Address Source #

Generic Address' 
Instance details

Defined in Cardano.Chain.Common.Address

Associated Types

type Rep Address'TypeType Source #

Generic UnparsedFields 
Instance details

Defined in Cardano.Chain.Common.Attributes

Associated Types

type Rep UnparsedFieldsTypeType Source #

Generic BlockCount 
Instance details

Defined in Cardano.Chain.Common.BlockCount

Associated Types

type Rep BlockCountTypeType Source #

Generic ChainDifficulty 
Instance details

Defined in Cardano.Chain.Common.ChainDifficulty

Associated Types

type Rep ChainDifficultyTypeType Source #

Generic CompactAddress 
Instance details

Defined in Cardano.Chain.Common.Compact

Associated Types

type Rep CompactAddressTypeType Source #

Generic Lovelace 
Instance details

Defined in Cardano.Chain.Common.Lovelace

Associated Types

type Rep LovelaceTypeType Source #

Generic LovelacePortion 
Instance details

Defined in Cardano.Chain.Common.LovelacePortion

Associated Types

type Rep LovelacePortionTypeType Source #

Generic NetworkMagic 
Instance details

Defined in Cardano.Chain.Common.NetworkMagic

Associated Types

type Rep NetworkMagicTypeType Source #

Generic TxFeePolicy 
Instance details

Defined in Cardano.Chain.Common.TxFeePolicy

Associated Types

type Rep TxFeePolicyTypeType Source #

Generic TxSizeLinear 
Instance details

Defined in Cardano.Chain.Common.TxSizeLinear

Associated Types

type Rep TxSizeLinearTypeType Source #

Generic Map 
Instance details

Defined in Cardano.Chain.Delegation.Map

Associated Types

type Rep MapTypeType Source #

Methods

fromMapRep Map x Source #

toRep Map x → Map Source #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Activation

Associated Types

type Rep StateTypeType Source #

Methods

fromStateRep State x Source #

toRep State x → State Source #

Generic Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Associated Types

type Rep EnvironmentTypeType Source #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Interface

Associated Types

type Rep StateTypeType Source #

Methods

fromStateRep State x Source #

toRep State x → State Source #

Generic Environment 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep EnvironmentTypeType Source #

Generic ScheduledDelegation 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep ScheduledDelegationTypeType Source #

Generic State 
Instance details

Defined in Cardano.Chain.Delegation.Validation.Scheduling

Associated Types

type Rep StateTypeType Source #

Methods

fromStateRep State x Source #

toRep State x → State Source #

Generic Config 
Instance details

Defined in Cardano.Chain.Genesis.Config

Associated Types

type Rep ConfigTypeType Source #

Methods

fromConfigRep Config x Source #

toRep Config x → Config Source #

Generic GenesisData 
Instance details

Defined in Cardano.Chain.Genesis.Data

Associated Types

type Rep GenesisDataTypeType Source #

Generic GeneratedSecrets 
Instance details

Defined in Cardano.Chain.Genesis.Generate

Associated Types

type Rep GeneratedSecretsTypeType Source #

Generic PoorSecret 
Instance details

Defined in Cardano.Chain.Genesis.Generate

Associated Types

type Rep PoorSecretTypeType Source #

Generic GenesisHash 
Instance details

Defined in Cardano.Chain.Genesis.Hash

Associated Types

type Rep GenesisHashTypeType Source #

Generic FakeAvvmOptions 
Instance details

Defined in Cardano.Chain.Genesis.Initializer

Associated Types

type Rep FakeAvvmOptionsTypeType Source #

Generic GenesisSpec 
Instance details

Defined in Cardano.Chain.Genesis.Spec

Associated Types

type Rep GenesisSpecTypeType Source #

Generic EpochAndSlotCount 
Instance details

Defined in Cardano.Chain.Slotting.EpochAndSlotCount

Associated Types

type Rep EpochAndSlotCountTypeType Source #

Generic EpochNumber 
Instance details

Defined in Cardano.Chain.Slotting.EpochNumber

Associated Types

type Rep EpochNumberTypeType Source #

Generic EpochSlots 
Instance details

Defined in Cardano.Chain.Slotting.EpochSlots

Associated Types

type Rep EpochSlotsTypeType Source #

Generic SlotCount 
Instance details

Defined in Cardano.Chain.Slotting.SlotCount

Associated Types

type Rep SlotCountTypeType Source #

Generic SlotNumber 
Instance details

Defined in Cardano.Chain.Slotting.SlotNumber

Associated Types

type Rep SlotNumberTypeType Source #

Generic SscPayload 
Instance details

Defined in Cardano.Chain.Ssc

Associated Types

type Rep SscPayloadTypeType Source #

Generic SscProof 
Instance details

Defined in Cardano.Chain.Ssc

Associated Types

type Rep SscProofTypeType Source #

Generic CompactTxId 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxIdTypeType Source #

Generic CompactTxIn 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxInTypeType Source #

Generic CompactTxOut 
Instance details

Defined in Cardano.Chain.UTxO.Compact

Associated Types

type Rep CompactTxOutTypeType Source #

Generic Tx 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep TxTypeType Source #

Methods

fromTxRep Tx x Source #

toRep Tx x → Tx Source #

Generic TxIn 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep TxInTypeType Source #

Methods

fromTxInRep TxIn x Source #

toRep TxIn x → TxIn Source #

Generic TxOut 
Instance details

Defined in Cardano.Chain.UTxO.Tx

Associated Types

type Rep TxOutTypeType Source #

Methods

fromTxOutRep TxOut x Source #

toRep TxOut x → TxOut Source #

Generic TxProof 
Instance details

Defined in Cardano.Chain.UTxO.TxProof

Associated Types

type Rep TxProofTypeType Source #

Methods

fromTxProofRep TxProof x Source #

toRep TxProof x → TxProof Source #

Generic TxInWitness 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Associated Types

type Rep TxInWitnessTypeType Source #

Generic TxSigData 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

Associated Types

type Rep TxSigDataTypeType Source #

Generic UTxO 
Instance details

Defined in Cardano.Chain.UTxO.UTxO

Associated Types

type Rep UTxOTypeType Source #

Methods

fromUTxORep UTxO x Source #

toRep UTxO x → UTxO Source #

Generic UTxOConfiguration 
Instance details

Defined in Cardano.Chain.UTxO.UTxOConfiguration

Associated Types

type Rep UTxOConfigurationTypeType Source #

Generic ApplicationName 
Instance details

Defined in Cardano.Chain.Update.ApplicationName

Associated Types

type Rep ApplicationNameTypeType Source #

Generic InstallerHash 
Instance details

Defined in Cardano.Chain.Update.InstallerHash

Associated Types

type Rep InstallerHashTypeType Source #

Generic ProposalBody 
Instance details

Defined in Cardano.Chain.Update.Proposal

Associated Types

type Rep ProposalBodyTypeType Source #

Generic ProtocolParameters 
Instance details

Defined in Cardano.Chain.Update.ProtocolParameters

Associated Types

type Rep ProtocolParametersTypeType Source #

Generic ProtocolParametersUpdate 
Instance details

Defined in Cardano.Chain.Update.ProtocolParametersUpdate

Associated Types

type Rep ProtocolParametersUpdateTypeType Source #

Generic ProtocolVersion 
Instance details

Defined in Cardano.Chain.Update.ProtocolVersion

Associated Types

type Rep ProtocolVersionTypeType Source #

Generic SoftforkRule 
Instance details

Defined in Cardano.Chain.Update.SoftforkRule

Associated Types

type Rep SoftforkRuleTypeType Source #

Generic SoftwareVersion 
Instance details

Defined in Cardano.Chain.Update.SoftwareVersion

Associated Types

type Rep SoftwareVersionTypeType Source #

Generic SystemTag 
Instance details

Defined in Cardano.Chain.Update.SystemTag

Associated Types

type Rep SystemTagTypeType Source #

Generic CandidateProtocolUpdate 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Associated Types

type Rep CandidateProtocolUpdateTypeType Source #

Generic Endorsement 
Instance details

Defined in Cardano.Chain.Update.Validation.Endorsement

Associated Types

type Rep EndorsementTypeType Source #

Generic State 
Instance details

Defined in Cardano.Chain.Update.Validation.Interface

Associated Types

type Rep StateTypeType Source #

Methods

fromStateRep State x Source #

toRep State x → State Source #

Generic ApplicationVersion 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep ApplicationVersionTypeType Source #

Generic ProtocolUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep ProtocolUpdateProposalTypeType Source #

Generic SoftwareUpdateProposal 
Instance details

Defined in Cardano.Chain.Update.Validation.Registration

Associated Types

type Rep SoftwareUpdateProposalTypeType Source #

Generic Environment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Associated Types

type Rep EnvironmentTypeType Source #

Generic RegistrationEnvironment 
Instance details

Defined in Cardano.Chain.Update.Validation.Voting

Associated Types

type Rep RegistrationEnvironmentTypeType Source #

Generic GovernanceActionIx 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep GovernanceActionIxTypeType Source #

Generic Vote 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep VoteTypeType Source #

Methods

fromVoteRep Vote x Source #

toRep Vote x → Vote Source #

Generic VoterRole 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep VoterRoleTypeType Source #

Generic ActiveSlotCoeff 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep ActiveSlotCoeffTypeType Source #

Generic DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep DnsNameTypeType Source #

Methods

fromDnsNameRep DnsName x Source #

toRep DnsName x → DnsName Source #

Generic Globals 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep GlobalsTypeType Source #

Methods

fromGlobalsRep Globals x Source #

toRep Globals x → Globals Source #

Generic Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep NetworkTypeType Source #

Methods

fromNetworkRep Network x Source #

toRep Network x → Network Source #

Generic NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep NonNegativeIntervalTypeType Source #

Generic Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep NonceTypeType Source #

Methods

fromNonceRep Nonce x Source #

toRep Nonce x → Nonce Source #

Generic Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep PortTypeType Source #

Methods

fromPortRep Port x Source #

toRep Port x → Port Source #

Generic PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep PositiveIntervalTypeType Source #

Generic PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep PositiveUnitIntervalTypeType Source #

Generic ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep ProtVerTypeType Source #

Methods

fromProtVerRep ProtVer x Source #

toRep ProtVer x → ProtVer Source #

Generic Seed 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep SeedTypeType Source #

Methods

fromSeedRep Seed x Source #

toRep Seed x → Seed Source #

Generic TxIx 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep TxIxTypeType Source #

Methods

fromTxIxRep TxIx x Source #

toRep TxIx x → TxIx Source #

Generic UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep UnitIntervalTypeType Source #

Generic Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep UrlTypeType Source #

Methods

fromUrlRep Url x Source #

toRep Url x → Url Source #

Generic Coin 
Instance details

Defined in Cardano.Ledger.Coin

Associated Types

type Rep CoinTypeType Source #

Methods

fromCoinRep Coin x Source #

toRep Coin x → Coin Source #

Generic DeltaCoin 
Instance details

Defined in Cardano.Ledger.Coin

Associated Types

type Rep DeltaCoinTypeType Source #

Generic Ptr 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep PtrTypeType Source #

Methods

fromPtrRep Ptr x Source #

toRep Ptr x → Ptr Source #

Generic ChainCode 
Instance details

Defined in Cardano.Ledger.Keys.Bootstrap

Associated Types

type Rep ChainCodeTypeType Source #

Generic Language 
Instance details

Defined in Cardano.Ledger.Language

Associated Types

type Rep LanguageTypeType Source #

Generic PoolMetadata 
Instance details

Defined in Cardano.Ledger.PoolParams

Associated Types

type Rep PoolMetadataTypeType Source #

Generic StakePoolRelay 
Instance details

Defined in Cardano.Ledger.PoolParams

Associated Types

type Rep StakePoolRelayTypeType Source #

Generic RewardType 
Instance details

Defined in Cardano.Ledger.Rewards

Associated Types

type Rep RewardTypeTypeType Source #

Generic Duration 
Instance details

Defined in Cardano.Ledger.Slot

Associated Types

type Rep DurationTypeType Source #

Generic RDPair 
Instance details

Defined in Cardano.Ledger.UMap

Associated Types

type Rep RDPairTypeType Source #

Methods

fromRDPairRep RDPair x Source #

toRep RDPair x → RDPair Source #

Generic ChainChecksPParams 
Instance details

Defined in Cardano.Ledger.Chain

Associated Types

type Rep ChainChecksPParamsTypeType Source #

Generic ChainPredicateFailure 
Instance details

Defined in Cardano.Ledger.Chain

Associated Types

type Rep ChainPredicateFailureTypeType Source #

Generic RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Associated Types

type Rep RewardInfoPoolTypeType Source #

Generic RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

Associated Types

type Rep RewardParamsTypeType Source #

Generic MIRPot 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep MIRPotTypeType Source #

Methods

fromMIRPotRep MIRPot x Source #

toRep MIRPot x → MIRPot Source #

Generic NominalDiffTimeMicro 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Associated Types

type Rep NominalDiffTimeMicroTypeType Source #

Generic AccountState 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep AccountStateTypeType Source #

Generic Histogram 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep HistogramTypeType Source #

Generic Likelihood 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep LikelihoodTypeType Source #

Generic LogWeight 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep LogWeightTypeType Source #

Generic PerformanceEstimate 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep PerformanceEstimateTypeType Source #

Generic Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep DesirabilityTypeType Source #

Generic StakeShare 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep StakeShareTypeType Source #

Generic VotingPeriod 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ppup

Associated Types

type Rep VotingPeriodTypeType Source #

Generic Metadatum 
Instance details

Defined in Cardano.Ledger.Shelley.TxAuxData

Associated Types

type Rep MetadatumTypeType Source #

Generic KESPeriod 
Instance details

Defined in Cardano.Protocol.TPraos.OCert

Associated Types

type Rep KESPeriodTypeType Source #

Generic TicknPredicateFailure 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Tickn

Associated Types

type Rep TicknPredicateFailureTypeType Source #

Generic TicknState 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Tickn

Associated Types

type Rep TicknStateTypeType Source #

Generic Slot 
Instance details

Defined in Cardano.Simple.Ledger.Slot

Associated Types

type Rep SlotTypeType Source #

Methods

fromSlotRep Slot x Source #

toRep Slot x → Slot Source #

Generic SlotConfig 
Instance details

Defined in Cardano.Simple.Ledger.TimeSlot

Associated Types

type Rep SlotConfigTypeType Source #

Generic SlotConversionError 
Instance details

Defined in Cardano.Simple.Ledger.TimeSlot

Associated Types

type Rep SlotConversionErrorTypeType Source #

Generic Tx 
Instance details

Defined in Cardano.Simple.Ledger.Tx

Associated Types

type Rep TxTypeType Source #

Methods

fromTxRep Tx x Source #

toRep Tx x → Tx Source #

Generic TxIn 
Instance details

Defined in Cardano.Simple.Ledger.Tx

Associated Types

type Rep TxInTypeType Source #

Methods

fromTxInRep TxIn x Source #

toRep TxIn x → TxIn Source #

Generic TxInType 
Instance details

Defined in Cardano.Simple.Ledger.Tx

Associated Types

type Rep TxInTypeTypeType Source #

Generic TxStripped 
Instance details

Defined in Cardano.Simple.Ledger.Tx

Associated Types

type Rep TxStripped ∷ TypeType Source #

Methods

from ∷ TxStripped → Rep TxStripped x Source #

toRep TxStripped x → TxStripped Source #

Generic Ada 
Instance details

Defined in Cardano.Simple.Plutus.Model.Ada

Associated Types

type Rep AdaTypeType Source #

Methods

fromAdaRep Ada x Source #

toRep Ada x → Ada Source #

Generic MintingPolicy 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep MintingPolicyTypeType Source #

Generic MintingPolicyHash 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep MintingPolicyHashTypeType Source #

Generic Script 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep ScriptTypeType Source #

Methods

fromScriptRep Script x Source #

toRep Script x → Script Source #

Generic StakeValidator 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep StakeValidatorTypeType Source #

Generic StakeValidatorHash 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep StakeValidatorHashTypeType Source #

Generic Validator 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep ValidatorTypeType Source #

Generic ValidatorHash 
Instance details

Defined in Cardano.Simple.PlutusLedgerApi.V1.Scripts

Associated Types

type Rep ValidatorHashTypeType Source #

Generic BlockNo 
Instance details

Defined in Cardano.Slotting.Block

Associated Types

type Rep BlockNoTypeType Source #

Methods

fromBlockNoRep BlockNo x Source #

toRep BlockNo x → BlockNo Source #

Generic EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep EpochNoTypeType Source #

Methods

fromEpochNoRep EpochNo x Source #

toRep EpochNo x → EpochNo Source #

Generic EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep EpochSizeTypeType Source #

Generic SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep SlotNoTypeType Source #

Methods

fromSlotNoRep SlotNo x Source #

toRep SlotNo x → SlotNo Source #

Generic RelativeTime 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep RelativeTimeTypeType Source #

Generic SlotLength 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep SlotLengthTypeType Source #

Generic SystemStart 
Instance details

Defined in Cardano.Slotting.Time

Associated Types

type Rep SystemStartTypeType Source #

Generic Address 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Address

Associated Types

type Rep AddressTypeType Source #

Methods

fromAddressRep Address x Source #

toRep Address x → Address Source #

Generic AddressState 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Address

Associated Types

type Rep AddressStateTypeType Source #

Generic Coin 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Coin

Associated Types

type Rep CoinTypeType Source #

Methods

fromCoinRep Coin x Source #

toRep Coin x → Coin Source #

Generic TokenBundle 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenBundle

Associated Types

type Rep TokenBundleTypeType Source #

Generic AssetId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep AssetIdTypeType Source #

Methods

fromAssetIdRep AssetId x Source #

toRep AssetId x → AssetId Source #

Generic FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep FlatAssetQuantity ∷ TypeType Source #

Methods

from ∷ FlatAssetQuantity → Rep FlatAssetQuantity x Source #

toRep FlatAssetQuantity x → FlatAssetQuantity Source #

Generic NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep NestedMapEntry ∷ TypeType Source #

Methods

from ∷ NestedMapEntry → Rep NestedMapEntry x Source #

toRep NestedMapEntry x → NestedMapEntry Source #

Generic NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep NestedTokenQuantity ∷ TypeType Source #

Methods

from ∷ NestedTokenQuantity → Rep NestedTokenQuantity x Source #

toRep NestedTokenQuantity x → NestedTokenQuantity Source #

Generic TokenMap 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep TokenMapTypeType Source #

Generic AssetDecimals 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetDecimalsTypeType Source #

Generic AssetLogo 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetLogoTypeType Source #

Generic AssetMetadata 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetMetadataTypeType Source #

Generic AssetURL 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep AssetURLTypeType Source #

Generic TokenFingerprint 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenFingerprintTypeType Source #

Generic TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenNameTypeType Source #

Generic TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

Associated Types

type Rep TokenPolicyIdTypeType Source #

Generic TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

Associated Types

type Rep TokenQuantityTypeType Source #

Generic TokenBundleSizeAssessment 
Instance details

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

Associated Types

type Rep TokenBundleSizeAssessmentTypeType Source #

Generic TokenBundleSizeAssessor 
Instance details

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

Associated Types

type Rep TokenBundleSizeAssessorTypeType Source #

Generic TxConstraints 
Instance details

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

Associated Types

type Rep TxConstraintsTypeType Source #

Generic TxSize 
Instance details

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

Associated Types

type Rep TxSizeTypeType Source #

Methods

fromTxSizeRep TxSize x Source #

toRep TxSize x → TxSize Source #

Generic TxIn 
Instance details

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

Associated Types

type Rep TxInTypeType Source #

Methods

fromTxInRep TxIn x Source #

toRep TxIn x → TxIn Source #

Generic TxOut 
Instance details

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

Associated Types

type Rep TxOutTypeType Source #

Methods

fromTxOutRep TxOut x Source #

toRep TxOut x → TxOut Source #

Generic DeltaUTxO 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxO

Associated Types

type Rep DeltaUTxOTypeType Source #

Generic UTxO 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxO

Associated Types

type Rep UTxOTypeType Source #

Methods

fromUTxORep UTxO x Source #

toRep UTxO x → UTxO Source #

Generic Asset 
Instance details

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

Associated Types

type Rep AssetTypeType Source #

Methods

fromAssetRep Asset x Source #

toRep Asset x → Asset Source #

Generic Percentage 
Instance details

Defined in Data.Quantity

Associated Types

type Rep PercentageTypeType Source #

Generic Clock 
Instance details

Defined in System.Clock

Associated Types

type Rep ClockTypeType Source #

Methods

fromClockRep Clock x Source #

toRep Clock x → Clock Source #

Generic TimeSpec 
Instance details

Defined in System.Clock

Associated Types

type Rep TimeSpecTypeType Source #

Generic Filler 
Instance details

Defined in Flat.Filler

Associated Types

type Rep FillerTypeType Source #

Methods

fromFillerRep Filler x Source #

toRep Filler x → Filler Source #

Generic FsPath 
Instance details

Defined in System.FS.API.Types

Associated Types

type Rep FsPathTypeType Source #

Methods

fromFsPathRep FsPath x Source #

toRep FsPath x → FsPath Source #

Generic CRC 
Instance details

Defined in System.FS.CRC

Associated Types

type Rep CRCTypeType Source #

Methods

fromCRCRep CRC x Source #

toRep CRC x → CRC Source #

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLangTypeType Source #

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep ExtensionTypeType Source #

Generic ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Associated Types

type Rep ClosureTypeTypeType Source #

Generic PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep PrimTypeTypeType Source #

Generic TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep TsoFlagsTypeType Source #

Generic WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep WhatNextTypeType Source #

Generic WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep WhyBlockedTypeType Source #

Generic StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Associated Types

type Rep StgInfoTableTypeType Source #

Generic CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep CostCentreTypeType Source #

Generic CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep CostCentreStackTypeType Source #

Generic IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep IndexTableTypeType Source #

Generic StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep StgTSOProfInfoTypeType Source #

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep OrderingTypeType Source #

Generic Half 
Instance details

Defined in Numeric.Half.Internal

Associated Types

type Rep HalfTypeType Source #

Methods

fromHalfRep Half x Source #

toRep Half x → Half Source #

Generic Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Associated Types

type Rep FormTypeType Source #

Methods

fromFormRep Form x Source #

toRep Form x → Form Source #

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPTypeType Source #

Methods

fromIPRep IP x Source #

toRep IP x → IP Source #

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4TypeType Source #

Methods

fromIPv4Rep IPv4 x Source #

toRep IPv4 x → IPv4 Source #

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6TypeType Source #

Methods

fromIPv6Rep IPv6 x Source #

toRep IPv6 x → IPv6 Source #

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRangeTypeType Source #

Methods

fromIPRangeRep IPRange x Source #

toRep IPRange x → IPRange Source #

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep EnvironmentTypeType Source #

Generic LogStr 
Instance details

Defined in Katip.Core

Associated Types

type Rep LogStrTypeType Source #

Methods

fromLogStrRep LogStr x Source #

toRep LogStr x → LogStr Source #

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep NamespaceTypeType Source #

Generic Severity 
Instance details

Defined in Katip.Core

Associated Types

type Rep SeverityTypeType Source #

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep VerbosityTypeType Source #

Generic ApiError 
Instance details

Defined in Maestro.Client.Error

Associated Types

type Rep ApiErrorTypeType Source #

Generic AbsoluteSlot 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep AbsoluteSlotTypeType Source #

Generic BlockHash 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep BlockHashTypeType Source #

Generic BlockHeight 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep BlockHeightTypeType Source #

Generic DatumOption 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep DatumOptionTypeType Source #

Generic DatumOptionType 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep DatumOptionTypeTypeType Source #

Generic EpochNo 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep EpochNoTypeType Source #

Methods

fromEpochNoRep EpochNo x Source #

toRep EpochNo x → EpochNo Source #

Generic EpochSize 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep EpochSizeTypeType Source #

Generic PolicyId 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep PolicyIdTypeType Source #

Generic Script 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep ScriptTypeType Source #

Methods

fromScriptRep Script x Source #

toRep Script x → Script Source #

Generic ScriptType 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep ScriptTypeTypeType Source #

Generic SlotNo 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep SlotNoTypeType Source #

Methods

fromSlotNoRep SlotNo x Source #

toRep SlotNo x → SlotNo Source #

Generic TokenName 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep TokenNameTypeType Source #

Generic TxHash 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep TxHashTypeType Source #

Methods

fromTxHashRep TxHash x Source #

toRep TxHash x → TxHash Source #

Generic TxIndex 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep TxIndexTypeType Source #

Methods

fromTxIndexRep TxIndex x Source #

toRep TxIndex x → TxIndex Source #

Generic AccountAction 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountAction ∷ TypeType Source #

Methods

from ∷ AccountAction → Rep AccountAction x Source #

toRep AccountAction x → AccountAction Source #

Generic AccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountHistoryTypeType Source #

Generic AccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountInfoTypeType Source #

Generic AccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountRewardTypeType Source #

Generic AccountStakingRewardType 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountStakingRewardTypeTypeType Source #

Generic AccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep AccountUpdateTypeType Source #

Generic PaginatedAccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep PaginatedAccountHistoryTypeType Source #

Generic PaginatedAccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep PaginatedAccountRewardTypeType Source #

Generic PaginatedAccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep PaginatedAccountUpdateTypeType Source #

Generic PaginatedAddress 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep PaginatedAddressTypeType Source #

Generic PaginatedAsset 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep PaginatedAssetTypeType Source #

Generic TimestampedAccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

Associated Types

type Rep TimestampedAccountInfoTypeType Source #

Generic AddressInfo 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep AddressInfoTypeType Source #

Generic AddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep AddressTransactionTypeType Source #

Generic CertIndex 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep CertIndexTypeType Source #

Generic ChainPointer 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep ChainPointerTypeType Source #

Generic NetworkId 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep NetworkIdTypeType Source #

Generic OutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep OutputReferenceObjectTypeType Source #

Generic PaginatedAddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep PaginatedAddressTransactionTypeType Source #

Generic PaginatedOutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep PaginatedOutputReferenceObjectTypeType Source #

Generic PaginatedPaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

Generic PaymentCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep PaymentCredKindTypeType Source #

Generic PaymentCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep PaymentCredentialTypeType Source #

Generic PaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep PaymentCredentialTransactionTypeType Source #

Generic StakingCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep StakingCredKindTypeType Source #

Generic StakingCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

Associated Types

type Rep StakingCredentialTypeType Source #

Generic AssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

Associated Types

type Rep AssetInfoTypeType Source #

Generic TimestampedAssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

Associated Types

type Rep TimestampedAssetInfoTypeType Source #

Generic TokenRegistryMetadata 
Instance details

Defined in Maestro.Types.V1.Assets

Associated Types

type Rep TokenRegistryMetadataTypeType Source #

Generic BlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

Associated Types

type Rep BlockDetailsTypeType Source #

Generic TimestampedBlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

Associated Types

type Rep TimestampedBlockDetailsTypeType Source #

Generic Asset 
Instance details

Defined in Maestro.Types.V1.Common

Associated Types

type Rep AssetTypeType Source #

Methods

fromAssetRep Asset x Source #

toRep Asset x → Asset Source #

Generic PaginatedUtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

Associated Types

type Rep PaginatedUtxoWithSlotTypeType Source #

Generic UtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

Associated Types

type Rep UtxoWithSlotTypeType Source #

Generic NextCursor 
Instance details

Defined in Maestro.Types.V1.Common.Pagination

Associated Types

type Rep NextCursorTypeType Source #

Generic LastUpdated 
Instance details

Defined in Maestro.Types.V1.Common.Timestamped

Associated Types

type Rep LastUpdatedTypeType Source #

Generic Datum 
Instance details

Defined in Maestro.Types.V1.Datum

Associated Types

type Rep DatumTypeType Source #

Methods

fromDatumRep Datum x Source #

toRep Datum x → Datum Source #

Generic TimestampedDatum 
Instance details

Defined in Maestro.Types.V1.Datum

Associated Types

type Rep TimestampedDatumTypeType Source #

Generic Dex 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

Associated Types

type Rep DexTypeType Source #

Methods

fromDexRep Dex x Source #

toRep Dex x → Dex Source #

Generic DexPairInfo 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

Associated Types

type Rep DexPairInfoTypeType Source #

Generic DexPairResponse 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

Associated Types

type Rep DexPairResponseTypeType Source #

Generic OHLCCandleInfo 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

Associated Types

type Rep OHLCCandleInfoTypeType Source #

Generic Resolution 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

Associated Types

type Rep ResolutionTypeType Source #

Generic ChainTip 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep ChainTipTypeType Source #

Generic CostModels 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep CostModelsTypeType Source #

Generic EraBound 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep EraBoundTypeType Source #

Generic EraParameters 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep EraParametersTypeType Source #

Generic EraSummary 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep EraSummaryTypeType Source #

Generic ProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep ProtocolParametersTypeType Source #

Generic ProtocolVersion 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep ProtocolVersionTypeType Source #

Generic TimestampedChainTip 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep TimestampedChainTipTypeType Source #

Generic TimestampedEraSummaries 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep TimestampedEraSummariesTypeType Source #

Generic TimestampedProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep TimestampedProtocolParametersTypeType Source #

Generic TimestampedSystemStart 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep TimestampedSystemStartTypeType Source #

Generic PaginatedPoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

Associated Types

type Rep PaginatedPoolListInfoTypeType Source #

Generic PoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

Associated Types

type Rep PoolListInfoTypeType Source #

Generic PaginatedUtxo 
Instance details

Defined in Maestro.Types.V1.Transactions

Associated Types

type Rep PaginatedUtxoTypeType Source #

Generic TimestampedTxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

Associated Types

type Rep TimestampedTxDetailsTypeType Source #

Generic TxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

Associated Types

type Rep TxDetailsTypeType Source #

Generic UtxoWithBytes 
Instance details

Defined in Maestro.Types.V1.Transactions

Associated Types

type Rep UtxoWithBytesTypeType Source #

Generic NewtonParam 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep NewtonParamTypeType Source #

Generic NewtonStep 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep NewtonStepTypeType Source #

Generic RiddersParam 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep RiddersParamTypeType Source #

Generic RiddersStep 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep RiddersStepTypeType Source #

Generic Tolerance 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep ToleranceTypeType Source #

Generic InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep InvalidPosExceptionTypeType Source #

Generic Pos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep PosTypeType Source #

Methods

fromPosRep Pos x Source #

toRep Pos x → Pos Source #

Generic SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep SourcePosTypeType Source #

Generic MuxError 
Instance details

Defined in Network.Mux.Trace

Associated Types

type Rep MuxErrorTypeType Source #

Generic SDUSize 
Instance details

Defined in Network.Mux.Types

Associated Types

type Rep SDUSizeTypeType Source #

Methods

fromSDUSizeRep SDUSize x Source #

toRep SDUSize x → SDUSize Source #

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URITypeType Source #

Methods

fromURIRep URI x Source #

toRep URI x → URI Source #

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuthTypeType Source #

Methods

fromURIAuthRep URIAuth x Source #

toRep URIAuth x → URIAuth Source #

Generic IsEBB 
Instance details

Defined in Ouroboros.Consensus.Block.EBB

Associated Types

type Rep IsEBBTypeType Source #

Methods

fromIsEBBRep IsEBB x Source #

toRep IsEBB x → IsEBB Source #

Generic CurrentSlot 
Instance details

Defined in Ouroboros.Consensus.BlockchainTime.API

Associated Types

type Rep CurrentSlotTypeType Source #

Generic SecurityParam 
Instance details

Defined in Ouroboros.Consensus.Config.SecurityParam

Associated Types

type Rep SecurityParamTypeType Source #

Generic EraMismatch 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.AcrossEras

Associated Types

type Rep EraMismatchTypeType Source #

Generic Past 
Instance details

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

Associated Types

type Rep PastTypeType Source #

Methods

fromPastRep Past x Source #

toRep Past x → Past Source #

Generic TransitionInfo 
Instance details

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

Associated Types

type Rep TransitionInfoTypeType Source #

Generic EraParams 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.EraParams

Associated Types

type Rep EraParamsTypeType Source #

Generic SafeZone 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.EraParams

Associated Types

type Rep SafeZoneTypeType Source #

Generic EpochInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep EpochInEra ∷ TypeType Source #

Methods

from ∷ EpochInEra → Rep EpochInEra x Source #

toRep EpochInEra x → EpochInEra Source #

Generic SlotInEpoch 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep SlotInEpoch ∷ TypeType Source #

Methods

from ∷ SlotInEpoch → Rep SlotInEpoch x Source #

toRep SlotInEpoch x → SlotInEpoch Source #

Generic SlotInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep SlotInEra ∷ TypeType Source #

Methods

from ∷ SlotInEra → Rep SlotInEra x Source #

toRep SlotInEra x → SlotInEra Source #

Generic TimeInEra 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep TimeInEra ∷ TypeType Source #

Methods

from ∷ TimeInEra → Rep TimeInEra x Source #

toRep TimeInEra x → TimeInEra Source #

Generic TimeInSlot 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Associated Types

type Rep TimeInSlot ∷ TypeType Source #

Methods

from ∷ TimeInSlot → Rep TimeInSlot x Source #

toRep TimeInSlot x → TimeInSlot Source #

Generic Bound 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep BoundTypeType Source #

Methods

fromBoundRep Bound x Source #

toRep Bound x → Bound Source #

Generic EraEnd 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep EraEndTypeType Source #

Methods

fromEraEndRep EraEnd x Source #

toRep EraEnd x → EraEnd Source #

Generic EraSummary 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Summary

Associated Types

type Rep EraSummaryTypeType Source #

Generic TriggerHardFork 
Instance details

Defined in Ouroboros.Consensus.HardFork.Simple

Associated Types

type Rep TriggerHardForkTypeType Source #

Generic CoreNodeId 
Instance details

Defined in Ouroboros.Consensus.NodeId

Associated Types

type Rep CoreNodeIdTypeType Source #

Generic NodeId 
Instance details

Defined in Ouroboros.Consensus.NodeId

Associated Types

type Rep NodeIdTypeType Source #

Methods

fromNodeIdRep NodeId x Source #

toRep NodeId x → NodeId Source #

Generic PBftParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftParamsTypeType Source #

Generic PBftSelectView 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftSelectViewTypeType Source #

Generic PBftSignatureThreshold 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep PBftSignatureThresholdTypeType Source #

Generic PBftMockVerKeyHash 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.Crypto

Associated Types

type Rep PBftMockVerKeyHashTypeType Source #

Generic ChainType 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Associated Types

type Rep ChainTypeTypeType Source #

Generic ScheduledGc 
Instance details

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

Associated Types

type Rep ScheduledGcTypeType Source #

Generic BinaryBlockInfo 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep BinaryBlockInfoTypeType Source #

Generic PrefixLen 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep PrefixLenTypeType Source #

Generic ChunkInfo 
Instance details

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

Associated Types

type Rep ChunkInfoTypeType Source #

Generic ChunkNo 
Instance details

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

Associated Types

type Rep ChunkNoTypeType Source #

Methods

fromChunkNoRep ChunkNo x Source #

toRep ChunkNo x → ChunkNo Source #

Generic ChunkSize 
Instance details

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

Associated Types

type Rep ChunkSizeTypeType Source #

Generic RelativeSlot 
Instance details

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

Associated Types

type Rep RelativeSlotTypeType Source #

Generic ChunkSlot 
Instance details

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

Associated Types

type Rep ChunkSlotTypeType Source #

Generic PrimaryIndex 
Instance details

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

Associated Types

type Rep PrimaryIndexTypeType Source #

Generic BlockSize 
Instance details

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

Associated Types

type Rep BlockSizeTypeType Source #

Generic BlockOrEBB 
Instance details

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

Associated Types

type Rep BlockOrEBBTypeType Source #

Generic TraceCacheEvent 
Instance details

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

Associated Types

type Rep TraceCacheEventTypeType Source #

Generic ValidationPolicy 
Instance details

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

Associated Types

type Rep ValidationPolicyTypeType Source #

Generic SnapshotInterval 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.DiskPolicy

Associated Types

type Rep SnapshotIntervalTypeType Source #

Generic DiskSnapshot 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Snapshots

Associated Types

type Rep DiskSnapshotTypeType Source #

Generic BlockOffset 
Instance details

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

Associated Types

type Rep BlockOffsetTypeType Source #

Generic BlockSize 
Instance details

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

Associated Types

type Rep BlockSizeTypeType Source #

Generic BlocksPerFile 
Instance details

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

Associated Types

type Rep BlocksPerFileTypeType Source #

Generic Appender 
Instance details

Defined in Ouroboros.Consensus.Util.MonadSTM.RAWLock

Associated Types

type Rep Appender ∷ TypeType Source #

Methods

from ∷ Appender → Rep Appender x Source #

toRep Appender x → Appender Source #

Generic RegistryStatus 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep RegistryStatus ∷ TypeType Source #

Methods

from ∷ RegistryStatus → Rep RegistryStatus x Source #

toRep RegistryStatus x → RegistryStatus Source #

Generic Fingerprint 
Instance details

Defined in Ouroboros.Consensus.Util.STM

Associated Types

type Rep FingerprintTypeType Source #

Generic ByronHash 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Block

Associated Types

type Rep ByronHashTypeType Source #

Generic ByronOtherHeaderEnvelopeError 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.HeaderValidation

Associated Types

type Rep ByronOtherHeaderEnvelopeErrorTypeType Source #

Generic ByronTransition 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Ledger

Associated Types

type Rep ByronTransitionTypeType Source #

Generic ByronPartialLedgerConfig 
Instance details

Defined in Ouroboros.Consensus.Cardano.CanHardFork

Associated Types

type Rep ByronPartialLedgerConfigTypeType Source #

Generic ShelleyTransition 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep ShelleyTransitionTypeType Source #

Generic AlonzoMeasure 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Mempool

Associated Types

type Rep AlonzoMeasureTypeType Source #

Generic PraosEnvelopeError 
Instance details

Defined in Ouroboros.Consensus.Shelley.Protocol.Praos

Associated Types

type Rep PraosEnvelopeErrorTypeType Source #

Generic KESInfo 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep KESInfoTypeType Source #

Methods

fromKESInfoRep KESInfo x Source #

toRep KESInfo x → KESInfo Source #

Generic PraosParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep PraosParamsTypeType Source #

Generic MaxMajorProtVer 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep MaxMajorProtVerTypeType Source #

Generic InputVRF 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.VRF

Associated Types

type Rep InputVRFTypeType Source #

Generic TPraosParams 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep TPraosParamsTypeType Source #

Generic MaxSlotNo 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep MaxSlotNoTypeType Source #

Generic NetworkMagic 
Instance details

Defined in Ouroboros.Network.Magic

Associated Types

type Rep NetworkMagicTypeType Source #

Generic PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerAdvertise

Associated Types

type Rep PeerAdvertiseTypeType Source #

Generic PeerSharing 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerSharing

Associated Types

type Rep PeerSharingTypeType Source #

Generic FileDescriptor 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep FileDescriptorTypeType Source #

Generic LocalAddress 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep LocalAddressTypeType Source #

Generic LocalSocket 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep LocalSocketTypeType Source #

Generic MempoolSizeAndCapacity 
Instance details

Defined in Ouroboros.Network.Protocol.LocalTxMonitor.Type

Associated Types

type Rep MempoolSizeAndCapacityTypeType Source #

Generic PeerSharingAmount 
Instance details

Defined in Ouroboros.Network.Protocol.PeerSharing.Type

Associated Types

type Rep PeerSharingAmountTypeType Source #

Generic Ann 
Instance details

Defined in PlutusCore.Annotation

Associated Types

type Rep AnnTypeType Source #

Methods

fromAnnRep Ann x Source #

toRep Ann x → Ann Source #

Generic Inline 
Instance details

Defined in PlutusCore.Annotation

Associated Types

type Rep InlineTypeType Source #

Methods

fromInlineRep Inline x Source #

toRep Inline x → Inline Source #

Generic SrcSpan 
Instance details

Defined in PlutusCore.Annotation

Associated Types

type Rep SrcSpanTypeType Source #

Methods

fromSrcSpanRep SrcSpan x Source #

toRep SrcSpan x → SrcSpan Source #

Generic SrcSpans 
Instance details

Defined in PlutusCore.Annotation

Associated Types

type Rep SrcSpansTypeType Source #

Generic Data 
Instance details

Defined in PlutusCore.Data

Associated Types

type Rep DataTypeType Source #

Methods

fromDataRep Data x Source #

toRep Data x → Data Source #

Generic DeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep DeBruijnTypeType Source #

Generic FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep FreeVariableErrorTypeType Source #

Generic Index 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep IndexTypeType Source #

Methods

fromIndexRep Index x Source #

toRep Index x → Index Source #

Generic NamedDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep NamedDeBruijnTypeType Source #

Generic NamedTyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep NamedTyDeBruijnTypeType Source #

Generic TyDeBruijn 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Associated Types

type Rep TyDeBruijnTypeType Source #

Generic DefaultFun 
Instance details

Defined in PlutusCore.Default.Builtins

Associated Types

type Rep DefaultFunTypeType Source #

Generic ParserError 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep ParserErrorTypeType Source #

Generic ParserErrorBundle 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep ParserErrorBundleTypeType Source #

Generic CkUserError 
Instance details

Defined in PlutusCore.Evaluation.Machine.Ck

Associated Types

type Rep CkUserError ∷ TypeType Source #

Methods

from ∷ CkUserError → Rep CkUserError x Source #

toRep CkUserError x → CkUserError Source #

Generic Intercept 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep InterceptTypeType Source #

Generic ModelAddedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelAddedSizesTypeType Source #

Generic ModelConstantOrLinear 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelConstantOrLinearTypeType Source #

Generic ModelConstantOrTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelConstantOrTwoArgumentsTypeType Source #

Generic ModelFiveArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelFiveArgumentsTypeType Source #

Generic ModelFourArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelFourArgumentsTypeType Source #

Generic ModelLinearSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelLinearSizeTypeType Source #

Generic ModelMaxSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelMaxSizeTypeType Source #

Generic ModelMinSize 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelMinSizeTypeType Source #

Generic ModelMultipliedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelMultipliedSizesTypeType Source #

Generic ModelOneArgument 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelOneArgumentTypeType Source #

Generic ModelSixArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelSixArgumentsTypeType Source #

Generic ModelSubtractedSizes 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelSubtractedSizesTypeType Source #

Generic ModelThreeArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelThreeArgumentsTypeType Source #

Generic ModelTwoArguments 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep ModelTwoArgumentsTypeType Source #

Generic Slope 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep SlopeTypeType Source #

Methods

fromSlopeRep Slope x Source #

toRep Slope x → Slope Source #

Generic ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

Associated Types

type Rep ExBudgetTypeType Source #

Generic ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Associated Types

type Rep ExCPUTypeType Source #

Methods

fromExCPURep ExCPU x Source #

toRep ExCPU x → ExCPU Source #

Generic ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

Associated Types

type Rep ExMemoryTypeType Source #

Generic Name 
Instance details

Defined in PlutusCore.Name

Associated Types

type Rep NameTypeType Source #

Methods

fromNameRep Name x Source #

toRep Name x → Name Source #

Generic TyName 
Instance details

Defined in PlutusCore.Name

Associated Types

type Rep TyNameTypeType Source #

Methods

fromTyNameRep TyName x Source #

toRep TyName x → TyName Source #

Generic Version 
Instance details

Defined in PlutusCore.Version

Associated Types

type Rep VersionTypeType Source #

Methods

fromVersionRep Version x Source #

toRep Version x → Version Source #

Generic CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

Associated Types

type Rep CekMachineCostsTypeType Source #

Generic CekUserError 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep CekUserErrorTypeType Source #

Generic StepKind 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep StepKindTypeType Source #

Generic Recursivity 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep Recursivity ∷ TypeType Source #

Methods

from ∷ Recursivity → Rep Recursivity x Source #

toRep Recursivity x → Recursivity Source #

Generic Strictness 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

type Rep Strictness ∷ TypeType Source #

Methods

from ∷ Strictness → Rep Strictness x Source #

toRep Strictness x → Strictness Source #

Generic SatInt 
Instance details

Defined in Data.SatInt

Associated Types

type Rep SatIntTypeType Source #

Methods

fromSatIntRep SatInt x Source #

toRep SatInt x → SatInt Source #

Generic EvaluationContext 
Instance details

Defined in PlutusLedgerApi.Common.Eval

Associated Types

type Rep EvaluationContextTypeType Source #

Generic ProtocolVersion 
Instance details

Defined in PlutusLedgerApi.Common.ProtocolVersions

Associated Types

type Rep ProtocolVersionTypeType Source #

Generic PlutusLedgerLanguage 
Instance details

Defined in PlutusLedgerApi.Common.Versions

Associated Types

type Rep PlutusLedgerLanguageTypeType Source #

Generic Address 
Instance details

Defined in PlutusLedgerApi.V1.Address

Associated Types

type Rep AddressTypeType Source #

Methods

fromAddressRep Address x Source #

toRep Address x → Address Source #

Generic LedgerBytes 
Instance details

Defined in PlutusLedgerApi.V1.Bytes

Associated Types

type Rep LedgerBytesTypeType Source #

Generic ScriptContext 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Associated Types

type Rep ScriptContextTypeType Source #

Generic ScriptPurpose 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Associated Types

type Rep ScriptPurposeTypeType Source #

Generic TxInInfo 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Associated Types

type Rep TxInInfoTypeType Source #

Generic TxInfo 
Instance details

Defined in PlutusLedgerApi.V1.Contexts

Associated Types

type Rep TxInfoTypeType Source #

Methods

fromTxInfoRep TxInfo x Source #

toRep TxInfo x → TxInfo Source #

Generic Credential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Associated Types

type Rep CredentialTypeType Source #

Generic StakingCredential 
Instance details

Defined in PlutusLedgerApi.V1.Credential

Associated Types

type Rep StakingCredentialTypeType Source #

Generic PubKeyHash 
Instance details

Defined in PlutusLedgerApi.V1.Crypto

Associated Types

type Rep PubKeyHashTypeType Source #

Generic DCert 
Instance details

Defined in PlutusLedgerApi.V1.DCert

Associated Types

type Rep DCertTypeType Source #

Methods

fromDCertRep DCert x Source #

toRep DCert x → DCert Source #

Generic ParamName 
Instance details

Defined in PlutusLedgerApi.V1.ParamName

Associated Types

type Rep ParamNameTypeType Source #

Generic Datum 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep DatumTypeType Source #

Methods

fromDatumRep Datum x Source #

toRep Datum x → Datum Source #

Generic DatumHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep DatumHashTypeType Source #

Generic Redeemer 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep RedeemerTypeType Source #

Generic RedeemerHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep RedeemerHashTypeType Source #

Generic ScriptError 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep ScriptErrorTypeType Source #

Generic ScriptHash 
Instance details

Defined in PlutusLedgerApi.V1.Scripts

Associated Types

type Rep ScriptHashTypeType Source #

Generic DiffMilliSeconds 
Instance details

Defined in PlutusLedgerApi.V1.Time

Associated Types

type Rep DiffMilliSecondsTypeType Source #

Generic POSIXTime 
Instance details

Defined in PlutusLedgerApi.V1.Time

Associated Types

type Rep POSIXTimeTypeType Source #

Generic RedeemerPtr 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Associated Types

type Rep RedeemerPtrTypeType Source #

Generic ScriptTag 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Associated Types

type Rep ScriptTagTypeType Source #

Generic TxId 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Associated Types

type Rep TxIdTypeType Source #

Methods

fromTxIdRep TxId x Source #

toRep TxId x → TxId Source #

Generic TxOut 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Associated Types

type Rep TxOutTypeType Source #

Methods

fromTxOutRep TxOut x Source #

toRep TxOut x → TxOut Source #

Generic TxOutRef 
Instance details

Defined in PlutusLedgerApi.V1.Tx

Associated Types

type Rep TxOutRefTypeType Source #

Generic AssetClass 
Instance details

Defined in PlutusLedgerApi.V1.Value

Associated Types

type Rep AssetClassTypeType Source #

Generic CurrencySymbol 
Instance details

Defined in PlutusLedgerApi.V1.Value

Associated Types

type Rep CurrencySymbolTypeType Source #

Generic TokenName 
Instance details

Defined in PlutusLedgerApi.V1.Value

Associated Types

type Rep TokenNameTypeType Source #

Generic Value 
Instance details

Defined in PlutusLedgerApi.V1.Value

Associated Types

type Rep ValueTypeType Source #

Methods

fromValueRep Value x Source #

toRep Value x → Value Source #

Generic ScriptContext 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Associated Types

type Rep ScriptContextTypeType Source #

Generic TxInInfo 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Associated Types

type Rep TxInInfoTypeType Source #

Generic TxInfo 
Instance details

Defined in PlutusLedgerApi.V2.Contexts

Associated Types

type Rep TxInfoTypeType Source #

Methods

fromTxInfoRep TxInfo x Source #

toRep TxInfo x → TxInfo Source #

Generic ParamName 
Instance details

Defined in PlutusLedgerApi.V2.ParamName

Associated Types

type Rep ParamNameTypeType Source #

Generic OutputDatum 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Associated Types

type Rep OutputDatumTypeType Source #

Generic TxOut 
Instance details

Defined in PlutusLedgerApi.V2.Tx

Associated Types

type Rep TxOutTypeType Source #

Methods

fromTxOutRep TxOut x Source #

toRep TxOut x → TxOut Source #

Generic ParamName 
Instance details

Defined in PlutusLedgerApi.V3.ParamName

Associated Types

type Rep ParamNameTypeType Source #

Generic CovLoc 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CovLocTypeType Source #

Methods

fromCovLocRep CovLoc x Source #

toRep CovLoc x → CovLoc Source #

Generic CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageAnnotationTypeType Source #

Generic CoverageData 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageDataTypeType Source #

Generic CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageIndexTypeType Source #

Generic CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageMetadataTypeType Source #

Generic CoverageReport 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep CoverageReportTypeType Source #

Generic Metadata 
Instance details

Defined in PlutusTx.Coverage

Associated Types

type Rep MetadataTypeType Source #

Generic ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Associated Types

type Rep ConnectInfoTypeType Source #

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep ModeTypeType Source #

Methods

fromModeRep Mode x Source #

toRep Mode x → Mode Source #

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep StyleTypeType Source #

Methods

fromStyleRep Style x Source #

toRep Style x → Style Source #

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetailsTypeType Source #

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep DocTypeType Source #

Methods

fromDocRep Doc x Source #

toRep Doc x → Doc Source #

Generic RetryAction 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryActionTypeType Source #

Generic RetryStatus 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryStatusTypeType Source #

Generic Approximation 
Instance details

Defined in Money.Internal

Associated Types

type Rep ApproximationTypeType Source #

Generic Scale 
Instance details

Defined in Money.Internal

Associated Types

type Rep ScaleTypeType Source #

Methods

fromScaleRep Scale x Source #

toRep Scale x → Scale Source #

Generic SomeDense 
Instance details

Defined in Money.Internal

Associated Types

type Rep SomeDenseTypeType Source #

Generic SomeDiscrete 
Instance details

Defined in Money.Internal

Associated Types

type Rep SomeDiscreteTypeType Source #

Generic SomeExchangeRate 
Instance details

Defined in Money.Internal

Associated Types

type Rep SomeExchangeRateTypeType Source #

Generic AcceptHeader 
Instance details

Defined in Servant.API.ContentTypes

Associated Types

type Rep AcceptHeaderTypeType Source #

Generic NoContent 
Instance details

Defined in Servant.API.ContentTypes

Associated Types

type Rep NoContentTypeType Source #

Generic IsSecure 
Instance details

Defined in Servant.API.IsSecure

Associated Types

type Rep IsSecureTypeType Source #

Generic BaseUrl 
Instance details

Defined in Servant.Client.Core.BaseUrl

Associated Types

type Rep BaseUrlTypeType Source #

Methods

fromBaseUrlRep BaseUrl x Source #

toRep BaseUrl x → BaseUrl Source #

Generic Scheme 
Instance details

Defined in Servant.Client.Core.BaseUrl

Associated Types

type Rep SchemeTypeType Source #

Methods

fromSchemeRep Scheme x Source #

toRep Scheme x → Scheme Source #

Generic ClientError 
Instance details

Defined in Servant.Client.Core.ClientError

Associated Types

type Rep ClientErrorTypeType Source #

Generic RequestBody 
Instance details

Defined in Servant.Client.Core.Request

Associated Types

type Rep RequestBodyTypeType Source #

Generic Endpoint 
Instance details

Defined in Servant.Docs.Internal

Associated Types

type Rep EndpointTypeType Source #

Generic Time 
Instance details

Defined in Control.Monad.Class.MonadTime.SI

Associated Types

type Rep TimeTypeType Source #

Methods

fromTimeRep Time x Source #

toRep Time x → Time Source #

Generic StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

Associated Types

type Rep StudentTTypeType Source #

Generic ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ApiKeyLocationTypeType Source #

Generic ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ApiKeyParamsTypeType Source #

Generic Contact 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ContactTypeType Source #

Methods

fromContactRep Contact x Source #

toRep Contact x → Contact Source #

Generic Example 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ExampleTypeType Source #

Methods

fromExampleRep Example x Source #

toRep Example x → Example Source #

Generic ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ExternalDocsTypeType Source #

Generic Header 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep HeaderTypeType Source #

Methods

fromHeaderRep Header x Source #

toRep Header x → Header Source #

Generic Host 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep HostTypeType Source #

Methods

fromHostRep Host x Source #

toRep Host x → Host Source #

Generic Info 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep InfoTypeType Source #

Methods

fromInfoRep Info x Source #

toRep Info x → Info Source #

Generic License 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep LicenseTypeType Source #

Methods

fromLicenseRep License x Source #

toRep License x → License Source #

Generic NamedSchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep NamedSchemaTypeType Source #

Generic OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep OAuth2FlowTypeType Source #

Generic OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep OAuth2ParamsTypeType Source #

Generic Operation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep OperationTypeType Source #

Generic Param 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamTypeType Source #

Methods

fromParamRep Param x Source #

toRep Param x → Param Source #

Generic ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamAnySchemaTypeType Source #

Generic ParamLocation 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamLocationTypeType Source #

Generic ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ParamOtherSchemaTypeType Source #

Generic PathItem 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep PathItemTypeType Source #

Generic Response 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ResponseTypeType Source #

Generic Responses 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep ResponsesTypeType Source #

Generic Schema 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SchemaTypeType Source #

Methods

fromSchemaRep Schema x Source #

toRep Schema x → Schema Source #

Generic Scheme 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SchemeTypeType Source #

Methods

fromSchemeRep Scheme x Source #

toRep Scheme x → Scheme Source #

Generic SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecurityDefinitionsTypeType Source #

Generic SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecuritySchemeTypeType Source #

Generic SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SecuritySchemeTypeTypeType Source #

Generic Swagger 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep SwaggerTypeType Source #

Methods

fromSwaggerRep Swagger x Source #

toRep Swagger x → Swagger Source #

Generic Tag 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep TagTypeType Source #

Methods

fromTagRep Tag x Source #

toRep Tag x → Tag Source #

Generic Xml 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep XmlTypeType Source #

Methods

fromXmlRep Xml x Source #

toRep Xml x → Xml Source #

Generic Outcome 
Instance details

Defined in Test.Tasty.Core

Associated Types

type Rep OutcomeTypeType Source #

Methods

fromOutcomeRep Outcome x Source #

toRep Outcome x → Outcome Source #

Generic Expr 
Instance details

Defined in Test.Tasty.Patterns.Types

Associated Types

type Rep ExprTypeType Source #

Methods

fromExprRep Expr x Source #

toRep Expr x → Expr Source #

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookupTypeType Source #

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTargetTypeType Source #

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BangTypeType Source #

Methods

fromBangRep Bang x Source #

toRep Bang x → Bang Source #

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BodyTypeType Source #

Methods

fromBodyRep Body x Source #

toRep Body x → Body Source #

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BytesTypeType Source #

Methods

fromBytesRep Bytes x Source #

toRep Bytes x → Bytes Source #

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep CallconvTypeType Source #

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ClauseTypeType Source #

Methods

fromClauseRep Clause x Source #

toRep Clause x → Clause Source #

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ConTypeType Source #

Methods

fromConRep Con x Source #

toRep Con x → Con Source #

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecTypeType Source #

Methods

fromDecRep Dec x Source #

toRep Dec x → Dec Source #

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictnessTypeType Source #

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClauseTypeType Source #

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategyTypeType Source #

Generic DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DocLocTypeType Source #

Methods

fromDocLocRep DocLoc x Source #

toRep DocLoc x → DocLoc Source #

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ExpTypeType Source #

Methods

fromExpRep Exp x Source #

toRep Exp x → Exp Source #

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSigTypeType Source #

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityTypeType Source #

Methods

fromFixityRep Fixity x Source #

toRep Fixity x → Fixity Source #

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirectionTypeType Source #

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ForeignTypeType Source #

Methods

fromForeignRep Foreign x Source #

toRep Foreign x → Foreign Source #

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDepTypeType Source #

Methods

fromFunDepRep FunDep x Source #

toRep FunDep x → FunDep Source #

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep GuardTypeType Source #

Methods

fromGuardRep Guard x Source #

toRep Guard x → Guard Source #

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InfoTypeType Source #

Methods

fromInfoRep Info x Source #

toRep Info x → Info Source #

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnnTypeType Source #

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InlineTypeType Source #

Methods

fromInlineRep Inline x Source #

toRep Inline x → Inline Source #

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep LitTypeType Source #

Methods

fromLitRep Lit x Source #

toRep Lit x → Lit Source #

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep LocTypeType Source #

Methods

fromLocRep Loc x Source #

toRep Loc x → Loc Source #

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep MatchTypeType Source #

Methods

fromMatchRep Match x Source #

toRep Match x → Match Source #

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModNameTypeType Source #

Methods

fromModNameRep ModName x Source #

toRep ModName x → ModName Source #

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleTypeType Source #

Methods

fromModuleRep Module x Source #

toRep Module x → Module Source #

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfoTypeType Source #

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameTypeType Source #

Methods

fromNameRep Name x Source #

toRep Name x → Name Source #

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavourTypeType Source #

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpaceTypeType Source #

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccNameTypeType Source #

Methods

fromOccNameRep OccName x Source #

toRep OccName x → OccName Source #

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OverlapTypeType Source #

Methods

fromOverlapRep Overlap x Source #

toRep Overlap x → Overlap Source #

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatTypeType Source #

Methods

fromPatRep Pat x Source #

toRep Pat x → Pat Source #

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgsTypeType Source #

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDirTypeType Source #

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PhasesTypeType Source #

Methods

fromPhasesRep Phases x Source #

toRep Phases x → Phases Source #

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgNameTypeType Source #

Methods

fromPkgNameRep PkgName x Source #

toRep PkgName x → PkgName Source #

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PragmaTypeType Source #

Methods

fromPragmaRep Pragma x Source #

toRep Pragma x → Pragma Source #

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RangeTypeType Source #

Methods

fromRangeRep Range x Source #

toRep Range x → Range Source #

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RoleTypeType Source #

Methods

fromRoleRep Role x Source #

toRep Role x → Role Source #

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndrTypeType Source #

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatchTypeType Source #

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SafetyTypeType Source #

Methods

fromSafetyRep Safety x Source #

toRep Safety x → Safety Source #

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictnessTypeType Source #

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackednessTypeType Source #

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SpecificityTypeType Source #

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep StmtTypeType Source #

Methods

fromStmtRep Stmt x Source #

toRep Stmt x → Stmt Source #

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLitTypeType Source #

Methods

fromTyLitRep TyLit x Source #

toRep TyLit x → TyLit Source #

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqnTypeType Source #

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeTypeType Source #

Methods

fromTypeRep Type x Source #

toRep Type x → Type Source #

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHeadTypeType Source #

Generic CaseStyle 
Instance details

Defined in Data.Text.Class

Associated Types

type Rep CaseStyleTypeType Source #

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfoTypeType Source #

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariantTypeType Source #

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfoTypeType Source #

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariantTypeType Source #

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictnessTypeType Source #

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep StrictnessTypeType Source #

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep UnpackednessTypeType Source #

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevelTypeType Source #

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategyTypeType Source #

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep FormatTypeType Source #

Methods

fromFormatRep Format x Source #

toRep Format x → Format Source #

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevelTypeType Source #

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MethodTypeType Source #

Methods

fromMethodRep Method x Source #

toRep Method x → Method Source #

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBitsTypeType Source #

Generic () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () ∷ TypeType Source #

Methods

from ∷ () → Rep () x Source #

toRep () x → () Source #

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep BoolTypeType Source #

Methods

fromBoolRep Bool x Source #

toRep Bool x → Bool Source #

Generic (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Last' a) ∷ TypeType Source #

Methods

fromLast' a → Rep (Last' a) x Source #

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

Generic (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Option' a) ∷ TypeType Source #

Methods

fromOption' a → Rep (Option' a) x Source #

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

Generic (Only a) 
Instance details

Defined in Data.Tuple.Only

Associated Types

type Rep (Only a) ∷ TypeType Source #

Methods

fromOnly a → Rep (Only a) x Source #

toRep (Only a) x → Only a Source #

Generic (Graph a) 
Instance details

Defined in Algebra.Graph

Associated Types

type Rep (Graph a) ∷ TypeType Source #

Methods

fromGraph a → Rep (Graph a) x Source #

toRep (Graph a) x → Graph a Source #

Generic (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.AdjacencyMap

Associated Types

type Rep (AdjacencyMap a) ∷ TypeType Source #

Generic (AdjacencyMap a) 
Instance details

Defined in Algebra.Graph.NonEmpty.AdjacencyMap

Associated Types

type Rep (AdjacencyMap a) ∷ TypeType Source #

Generic (Graph a) 
Instance details

Defined in Algebra.Graph.Undirected

Associated Types

type Rep (Graph a) ∷ TypeType Source #

Methods

fromGraph a → Rep (Graph a) x Source #

toRep (Graph a) x → Graph a Source #

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) ∷ TypeType Source #

Methods

fromZipList a → Rep (ZipList a) x Source #

toRep (ZipList a) x → ZipList a Source #

Generic (Complex a) 
Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) ∷ TypeType Source #

Methods

fromComplex a → Rep (Complex a) x Source #

toRep (Complex a) x → Complex a Source #

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) ∷ TypeType Source #

Methods

fromIdentity a → Rep (Identity a) x Source #

toRep (Identity a) x → Identity a Source #

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) ∷ TypeType Source #

Methods

fromFirst a → Rep (First a) x Source #

toRep (First a) x → First a Source #

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) ∷ TypeType Source #

Methods

fromLast a → Rep (Last a) x Source #

toRep (Last a) x → Last a Source #

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) ∷ TypeType Source #

Methods

fromDown a → Rep (Down a) x Source #

toRep (Down a) x → Down a Source #

Generic (First a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) ∷ TypeType Source #

Methods

fromFirst a → Rep (First a) x Source #

toRep (First a) x → First a Source #

Generic (Last a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) ∷ TypeType Source #

Methods

fromLast a → Rep (Last a) x Source #

toRep (Last a) x → Last a Source #

Generic (Max a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) ∷ TypeType Source #

Methods

fromMax a → Rep (Max a) x Source #

toRep (Max a) x → Max a Source #

Generic (Min a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) ∷ TypeType Source #

Methods

fromMin a → Rep (Min a) x Source #

toRep (Min a) x → Min a Source #

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) ∷ TypeType Source #

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) ∷ TypeType Source #

Methods

fromDual a → Rep (Dual a) x Source #

toRep (Dual a) x → Dual a Source #

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) ∷ TypeType Source #

Methods

fromEndo a → Rep (Endo a) x Source #

toRep (Endo a) x → Endo a Source #

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) ∷ TypeType Source #

Methods

fromProduct a → Rep (Product a) x Source #

toRep (Product a) x → Product a Source #

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) ∷ TypeType Source #

Methods

fromSum a → Rep (Sum a) x Source #

toRep (Sum a) x → Sum a Source #

Generic (Par1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) ∷ TypeType Source #

Methods

fromPar1 p → Rep (Par1 p) x Source #

toRep (Par1 p) x → Par1 p Source #

Generic (BlockfrostAPI route) 
Instance details

Defined in Blockfrost.API

Associated Types

type Rep (BlockfrostAPI route) ∷ TypeType Source #

Methods

from ∷ BlockfrostAPI route → Rep (BlockfrostAPI route) x Source #

toRep (BlockfrostAPI route) x → BlockfrostAPI route Source #

Generic (BlockfrostV0API route) 
Instance details

Defined in Blockfrost.API

Associated Types

type Rep (BlockfrostV0API route) ∷ TypeType Source #

Methods

from ∷ BlockfrostV0API route → Rep (BlockfrostV0API route) x Source #

toRep (BlockfrostV0API route) x → BlockfrostV0API route Source #

Generic (CardanoAPI route) 
Instance details

Defined in Blockfrost.API

Associated Types

type Rep (CardanoAPI route) ∷ TypeType Source #

Methods

from ∷ CardanoAPI route → Rep (CardanoAPI route) x Source #

toRep (CardanoAPI route) x → CardanoAPI route Source #

Generic (AccountsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Accounts

Associated Types

type Rep (AccountsAPI route) ∷ TypeType Source #

Methods

from ∷ AccountsAPI route → Rep (AccountsAPI route) x Source #

toRep (AccountsAPI route) x → AccountsAPI route Source #

Generic (AddressesAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Addresses

Associated Types

type Rep (AddressesAPI route) ∷ TypeType Source #

Methods

from ∷ AddressesAPI route → Rep (AddressesAPI route) x Source #

toRep (AddressesAPI route) x → AddressesAPI route Source #

Generic (AssetsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Assets

Associated Types

type Rep (AssetsAPI route) ∷ TypeType Source #

Methods

from ∷ AssetsAPI route → Rep (AssetsAPI route) x Source #

toRep (AssetsAPI route) x → AssetsAPI route Source #

Generic (BlocksAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Blocks

Associated Types

type Rep (BlocksAPI route) ∷ TypeType Source #

Methods

from ∷ BlocksAPI route → Rep (BlocksAPI route) x Source #

toRep (BlocksAPI route) x → BlocksAPI route Source #

Generic (EpochsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Epochs

Associated Types

type Rep (EpochsAPI route) ∷ TypeType Source #

Methods

from ∷ EpochsAPI route → Rep (EpochsAPI route) x Source #

toRep (EpochsAPI route) x → EpochsAPI route Source #

Generic (LedgerAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Ledger

Associated Types

type Rep (LedgerAPI route) ∷ TypeType Source #

Methods

from ∷ LedgerAPI route → Rep (LedgerAPI route) x Source #

toRep (LedgerAPI route) x → LedgerAPI route Source #

Generic (MetadataAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Metadata

Associated Types

type Rep (MetadataAPI route) ∷ TypeType Source #

Methods

from ∷ MetadataAPI route → Rep (MetadataAPI route) x Source #

toRep (MetadataAPI route) x → MetadataAPI route Source #

Generic (NetworkAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Network

Associated Types

type Rep (NetworkAPI route) ∷ TypeType Source #

Methods

from ∷ NetworkAPI route → Rep (NetworkAPI route) x Source #

toRep (NetworkAPI route) x → NetworkAPI route Source #

Generic (PoolsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Pools

Associated Types

type Rep (PoolsAPI route) ∷ TypeType Source #

Methods

from ∷ PoolsAPI route → Rep (PoolsAPI route) x Source #

toRep (PoolsAPI route) x → PoolsAPI route Source #

Generic (ScriptsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Scripts

Associated Types

type Rep (ScriptsAPI route) ∷ TypeType Source #

Methods

from ∷ ScriptsAPI route → Rep (ScriptsAPI route) x Source #

toRep (ScriptsAPI route) x → ScriptsAPI route Source #

Generic (TransactionsAPI route) 
Instance details

Defined in Blockfrost.API.Cardano.Transactions

Associated Types

type Rep (TransactionsAPI route) ∷ TypeType Source #

Methods

from ∷ TransactionsAPI route → Rep (TransactionsAPI route) x Source #

toRep (TransactionsAPI route) x → TransactionsAPI route Source #

Generic (CommonAPI route) 
Instance details

Defined in Blockfrost.API.Common

Associated Types

type Rep (CommonAPI route) ∷ TypeType Source #

Methods

from ∷ CommonAPI route → Rep (CommonAPI route) x Source #

toRep (CommonAPI route) x → CommonAPI route Source #

Generic (IPFSAPI route) 
Instance details

Defined in Blockfrost.API.IPFS

Associated Types

type Rep (IPFSAPI route) ∷ TypeType Source #

Methods

from ∷ IPFSAPI route → Rep (IPFSAPI route) x Source #

toRep (IPFSAPI route) x → IPFSAPI route Source #

Generic (NutLinkAPI route) 
Instance details

Defined in Blockfrost.API.NutLink

Associated Types

type Rep (NutLinkAPI route) ∷ TypeType Source #

Methods

from ∷ NutLinkAPI route → Rep (NutLinkAPI route) x Source #

toRep (NutLinkAPI route) x → NutLinkAPI route Source #

Generic (Script elem) 
Instance details

Defined in Cardano.Address.Script

Associated Types

type Rep (Script elem) ∷ TypeType Source #

Methods

fromScript elem → Rep (Script elem) x Source #

toRep (Script elem) x → Script elem Source #

Generic (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

Associated Types

type Rep (TxOutValue era) ∷ TypeType Source #

Methods

fromTxOutValue era → Rep (TxOutValue era) x Source #

toRep (TxOutValue era) x → TxOutValue era Source #

Generic (SelectionOf change) 
Instance details

Defined in Cardano.Tx.Balance.Internal.CoinSelection

Associated Types

type Rep (SelectionOf change) ∷ TypeType Source #

Methods

fromSelectionOf change → Rep (SelectionOf change) x Source #

toRep (SelectionOf change) x → SelectionOf change Source #

Generic (Selection ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (Selection ctx) ∷ TypeType Source #

Methods

fromSelection ctx → Rep (Selection ctx) x Source #

toRep (Selection ctx) x → Selection ctx Source #

Generic (SelectionCollateralError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionCollateralError ctx) ∷ TypeType Source #

Generic (SelectionConstraints ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionConstraints ctx) ∷ TypeType Source #

Generic (SelectionOutputCoinInsufficientError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputCoinInsufficientError ctx) ∷ TypeType Source #

Generic (SelectionOutputErrorInfo ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputErrorInfo ctx) ∷ TypeType Source #

Generic (SelectionOutputSizeExceedsLimitError ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionOutputSizeExceedsLimitError ctx) ∷ TypeType Source #

Generic (SelectionOutputTokenQuantityExceedsLimitError ctx) 
Instance details

Defined in Cardano.CoinSelection

Generic (SelectionParams ctx) 
Instance details

Defined in Cardano.CoinSelection

Associated Types

type Rep (SelectionParams ctx) ∷ TypeType Source #

Generic (RunSelectionParams u) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (RunSelectionParams u) ∷ TypeType Source #

Generic (SelectionBalanceError ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionBalanceError ctx) ∷ TypeType Source #

Generic (SelectionConstraints ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionConstraints ctx) ∷ TypeType Source #

Generic (SelectionSkeleton ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionSkeleton ctx) ∷ TypeType Source #

Generic (SelectionCollateralError u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionCollateralError u) ∷ TypeType Source #

Generic (SelectionParams u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionParams u) ∷ TypeType Source #

Generic (SelectionResult u) 
Instance details

Defined in Cardano.CoinSelection.Collateral

Associated Types

type Rep (SelectionResult u) ∷ TypeType Source #

Generic (SigDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (SigDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType Source #

Generic (SigDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (SigDSIGN Ed25519DSIGN) ∷ TypeType Source #

Generic (SigDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (SigDSIGN Ed448DSIGN) ∷ TypeType Source #

Generic (SigDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (SigDSIGN MockDSIGN) ∷ TypeType Source #

Generic (SigDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (SigDSIGN NeverDSIGN) ∷ TypeType Source #

Generic (SigDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (SigDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType Source #

Generic (SigDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (SigDSIGN ByronDSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (SignKeyDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (SignKeyDSIGN Ed25519DSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (SignKeyDSIGN Ed448DSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (SignKeyDSIGN MockDSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (SignKeyDSIGN NeverDSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (SignKeyDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType Source #

Generic (SignKeyDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (SignKeyDSIGN ByronDSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN EcdsaSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.EcdsaSecp256k1

Associated Types

type Rep (VerKeyDSIGN EcdsaSecp256k1DSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN Ed25519DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed25519

Associated Types

type Rep (VerKeyDSIGN Ed25519DSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN Ed448DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Ed448

Associated Types

type Rep (VerKeyDSIGN Ed448DSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN MockDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.Mock

Associated Types

type Rep (VerKeyDSIGN MockDSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN NeverDSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.NeverUsed

Associated Types

type Rep (VerKeyDSIGN NeverDSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN SchnorrSecp256k1DSIGN) 
Instance details

Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1

Associated Types

type Rep (VerKeyDSIGN SchnorrSecp256k1DSIGN) ∷ TypeType Source #

Generic (VerKeyDSIGN ByronDSIGN) 
Instance details

Defined in Ouroboros.Consensus.Byron.Crypto.DSIGN

Associated Types

type Rep (VerKeyDSIGN ByronDSIGN) ∷ TypeType Source #

Generic (SigKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

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

Generic (SigKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

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

Methods

fromSigKES (CompactSumKES h d) → Rep (SigKES (CompactSumKES h d)) x Source #

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

Generic (SigKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

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

Methods

fromSigKES (MockKES t) → Rep (SigKES (MockKES t)) x Source #

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

Generic (SigKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SigKES NeverKES) ∷ TypeType Source #

Generic (SigKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

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

Methods

fromSigKES (SimpleKES d t) → Rep (SigKES (SimpleKES d t)) x Source #

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

Generic (SigKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

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

Methods

fromSigKES (SingleKES d) → Rep (SigKES (SingleKES d)) x Source #

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

Generic (SigKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

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

Methods

fromSigKES (SumKES h d) → Rep (SigKES (SumKES h d)) x Source #

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

Generic (SignKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

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

Generic (SignKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

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

Generic (SignKeyKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

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

Generic (SignKeyKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SignKeyKES NeverKES) ∷ TypeType Source #

Generic (SignKeyKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

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

Methods

fromSignKeyKES (SimpleKES d t) → Rep (SignKeyKES (SimpleKES d t)) x Source #

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

Generic (SignKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

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

Generic (SignKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

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

Methods

fromSignKeyKES (SumKES h d) → Rep (SignKeyKES (SumKES h d)) x Source #

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

Generic (VerKeyKES (CompactSingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSingle

Associated Types

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

Generic (VerKeyKES (CompactSumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.CompactSum

Associated Types

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

Generic (VerKeyKES (MockKES t)) 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

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

Methods

fromVerKeyKES (MockKES t) → Rep (VerKeyKES (MockKES t)) x Source #

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

Generic (VerKeyKES NeverKES) 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (VerKeyKES NeverKES) ∷ TypeType Source #

Generic (VerKeyKES (SimpleKES d t)) 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

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

Methods

fromVerKeyKES (SimpleKES d t) → Rep (VerKeyKES (SimpleKES d t)) x Source #

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

Generic (VerKeyKES (SingleKES d)) 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

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

Generic (VerKeyKES (SumKES h d)) 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

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

Methods

fromVerKeyKES (SumKES h d) → Rep (VerKeyKES (SumKES h d)) x Source #

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

Generic (CertVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (CertVRF MockVRF) ∷ TypeType Source #

Generic (CertVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (CertVRF NeverVRF) ∷ TypeType Source #

Generic (CertVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (CertVRF SimpleVRF) ∷ TypeType Source #

Generic (CertVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (CertVRF PraosVRF) ∷ TypeType Source #

Generic (CertVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep (CertVRF PraosBatchCompatVRF) ∷ TypeType Source #

Generic (SignKeyVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (SignKeyVRF MockVRF) ∷ TypeType Source #

Generic (SignKeyVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (SignKeyVRF NeverVRF) ∷ TypeType Source #

Generic (SignKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (SignKeyVRF SimpleVRF) ∷ TypeType Source #

Generic (SignKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (SignKeyVRF PraosVRF) ∷ TypeType Source #

Generic (SignKeyVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep (SignKeyVRF PraosBatchCompatVRF) ∷ TypeType Source #

Generic (VerKeyVRF MockVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Mock

Associated Types

type Rep (VerKeyVRF MockVRF) ∷ TypeType Source #

Generic (VerKeyVRF NeverVRF) 
Instance details

Defined in Cardano.Crypto.VRF.NeverUsed

Associated Types

type Rep (VerKeyVRF NeverVRF) ∷ TypeType Source #

Generic (VerKeyVRF SimpleVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Simple

Associated Types

type Rep (VerKeyVRF SimpleVRF) ∷ TypeType Source #

Generic (VerKeyVRF PraosVRF) 
Instance details

Defined in Cardano.Crypto.VRF.Praos

Associated Types

type Rep (VerKeyVRF PraosVRF) ∷ TypeType Source #

Generic (VerKeyVRF PraosBatchCompatVRF) 
Instance details

Defined in Cardano.Crypto.VRF.PraosBatchCompat

Associated Types

type Rep (VerKeyVRF PraosBatchCompatVRF) ∷ TypeType Source #

Generic (AProtocolMagic a) 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

Associated Types

type Rep (AProtocolMagic a) ∷ TypeType Source #

Generic (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

Associated Types

type Rep (RedeemSignature a) ∷ TypeType Source #

Generic (Signature a) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Associated Types

type Rep (Signature a) ∷ TypeType Source #

Methods

fromSignature a → Rep (Signature a) x Source #

toRep (Signature a) x → Signature a Source #

Generic (AllegraUtxoPredFailure era) 
Instance details

Defined in Cardano.Ledger.Allegra.Rules.Utxo

Associated Types

type Rep (AllegraUtxoPredFailure era) ∷ TypeType Source #

Generic (Timelock era) 
Instance details

Defined in Cardano.Ledger.Allegra.Scripts

Associated Types

type Rep (Timelock era) ∷ TypeType Source #

Methods

fromTimelock era → Rep (Timelock era) x Source #

toRep (Timelock era) x → Timelock era Source #

Generic (TimelockRaw era) 
Instance details

Defined in Cardano.Ledger.Allegra.Scripts

Associated Types

type Rep (TimelockRaw era) ∷ TypeType Source #

Methods

from ∷ TimelockRaw era → Rep (TimelockRaw era) x Source #

toRep (TimelockRaw era) x → TimelockRaw era Source #

Generic (AllegraTxAuxData era) 
Instance details

Defined in Cardano.Ledger.Allegra.TxAuxData

Associated Types

type Rep (AllegraTxAuxData era) ∷ TypeType Source #

Generic (AllegraTxAuxDataRaw era) 
Instance details

Defined in Cardano.Ledger.Allegra.TxAuxData

Associated Types

type Rep (AllegraTxAuxDataRaw era) ∷ TypeType Source #

Methods

from ∷ AllegraTxAuxDataRaw era → Rep (AllegraTxAuxDataRaw era) x Source #

toRep (AllegraTxAuxDataRaw era) x → AllegraTxAuxDataRaw era Source #

Generic (AllegraTxBody era) 
Instance details

Defined in Cardano.Ledger.Allegra.TxBody

Associated Types

type Rep (AllegraTxBody era) ∷ TypeType Source #

Methods

fromAllegraTxBody era → Rep (AllegraTxBody era) x Source #

toRep (AllegraTxBody era) x → AllegraTxBody era Source #

Generic (DowngradeAlonzoPParams f) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep (DowngradeAlonzoPParams f) ∷ TypeType Source #

Generic (UpgradeAlonzoPParams f) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep (UpgradeAlonzoPParams f) ∷ TypeType Source #

Generic (CollectError c) 
Instance details

Defined in Cardano.Ledger.Alonzo.PlutusScriptApi

Associated Types

type Rep (CollectError c) ∷ TypeType Source #

Generic (AlonzoBbodyPredFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Bbody

Associated Types

type Rep (AlonzoBbodyPredFailure era) ∷ TypeType Source #

Generic (AlonzoUtxoPredFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxo

Associated Types

type Rep (AlonzoUtxoPredFailure era) ∷ TypeType Source #

Generic (AlonzoUtxosPredFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxos

Associated Types

type Rep (AlonzoUtxosPredFailure era) ∷ TypeType Source #

Generic (AlonzoUtxowPredFailure era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Rules.Utxow

Associated Types

type Rep (AlonzoUtxowPredFailure era) ∷ TypeType Source #

Generic (AlonzoScript era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep (AlonzoScript era) ∷ TypeType Source #

Methods

fromAlonzoScript era → Rep (AlonzoScript era) x Source #

toRep (AlonzoScript era) x → AlonzoScript era Source #

Generic (ExUnits' a) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Associated Types

type Rep (ExUnits' a) ∷ TypeType Source #

Methods

fromExUnits' a → Rep (ExUnits' a) x Source #

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

Generic (BinaryData era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts.Data

Associated Types

type Rep (BinaryData era) ∷ TypeType Source #

Methods

fromBinaryData era → Rep (BinaryData era) x Source #

toRep (BinaryData era) x → BinaryData era Source #

Generic (Data era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts.Data

Associated Types

type Rep (Data era) ∷ TypeType Source #

Methods

fromData era → Rep (Data era) x Source #

toRep (Data era) x → Data era Source #

Generic (Datum era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts.Data

Associated Types

type Rep (Datum era) ∷ TypeType Source #

Methods

fromDatum era → Rep (Datum era) x Source #

toRep (Datum era) x → Datum era Source #

Generic (PlutusData era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts.Data

Associated Types

type Rep (PlutusData era) ∷ TypeType Source #

Methods

from ∷ PlutusData era → Rep (PlutusData era) x Source #

toRep (PlutusData era) x → PlutusData era Source #

Generic (AlonzoTx era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (AlonzoTx era) ∷ TypeType Source #

Methods

fromAlonzoTx era → Rep (AlonzoTx era) x Source #

toRep (AlonzoTx era) x → AlonzoTx era Source #

Generic (ScriptIntegrity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (ScriptIntegrity era) ∷ TypeType Source #

Generic (ScriptPurpose c) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Associated Types

type Rep (ScriptPurpose c) ∷ TypeType Source #

Generic (AlonzoTxAuxDataRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxAuxData

Associated Types

type Rep (AlonzoTxAuxDataRaw era) ∷ TypeType Source #

Methods

from ∷ AlonzoTxAuxDataRaw era → Rep (AlonzoTxAuxDataRaw era) x Source #

toRep (AlonzoTxAuxDataRaw era) x → AlonzoTxAuxDataRaw era Source #

Generic (AlonzoTxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxBody

Associated Types

type Rep (AlonzoTxBodyRaw era) ∷ TypeType Source #

Methods

from ∷ AlonzoTxBodyRaw era → Rep (AlonzoTxBodyRaw era) x Source #

toRep (AlonzoTxBodyRaw era) x → AlonzoTxBodyRaw era Source #

Generic (PlutusDebugLang l) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep (PlutusDebugLang l) ∷ TypeType Source #

Generic (TranslationError c) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep (TranslationError c) ∷ TypeType Source #

Generic (TxOutSource c) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxInfo

Associated Types

type Rep (TxOutSource c) ∷ TypeType Source #

Methods

fromTxOutSource c → Rep (TxOutSource c) x Source #

toRep (TxOutSource c) x → TxOutSource c Source #

Generic (AlonzoTxOut era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxOut

Associated Types

type Rep (AlonzoTxOut era) ∷ TypeType Source #

Methods

fromAlonzoTxOut era → Rep (AlonzoTxOut era) x Source #

toRep (AlonzoTxOut era) x → AlonzoTxOut era Source #

Generic (AlonzoTxSeq era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxSeq

Associated Types

type Rep (AlonzoTxSeq era) ∷ TypeType Source #

Methods

fromAlonzoTxSeq era → Rep (AlonzoTxSeq era) x Source #

toRep (AlonzoTxSeq era) x → AlonzoTxSeq era Source #

Generic (AlonzoTxWitsRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWits

Associated Types

type Rep (AlonzoTxWitsRaw era) ∷ TypeType Source #

Methods

from ∷ AlonzoTxWitsRaw era → Rep (AlonzoTxWitsRaw era) x Source #

toRep (AlonzoTxWitsRaw era) x → AlonzoTxWitsRaw era Source #

Generic (RedeemersRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWits

Associated Types

type Rep (RedeemersRaw era) ∷ TypeType Source #

Methods

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

toRep (RedeemersRaw era) x → RedeemersRaw era Source #

Generic (TxDatsRaw era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxWits

Associated Types

type Rep (TxDatsRaw era) ∷ TypeType Source #

Methods

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

toRep (TxDatsRaw era) x → TxDatsRaw era Source #

Generic (BabbageTxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Babbage.TxBody

Associated Types

type Rep (BabbageTxBodyRaw era) ∷ TypeType Source #

Methods

from ∷ BabbageTxBodyRaw era → Rep (BabbageTxBodyRaw era) x Source #

toRep (BabbageTxBodyRaw era) x → BabbageTxBodyRaw era Source #

Generic (BabbageTxOut era) 
Instance details

Defined in Cardano.Ledger.Babbage.TxOut

Associated Types

type Rep (BabbageTxOut era) ∷ TypeType Source #

Methods

fromBabbageTxOut era → Rep (BabbageTxOut era) x Source #

toRep (BabbageTxOut era) x → BabbageTxOut era Source #

Generic (Sized a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Sized

Associated Types

type Rep (Sized a) ∷ TypeType Source #

Methods

fromSized a → Rep (Sized a) x Source #

toRep (Sized a) x → Sized a Source #

Generic (ABlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlock a) ∷ TypeType Source #

Methods

fromABlock a → Rep (ABlock a) x Source #

toRep (ABlock a) x → ABlock a Source #

Generic (ABlockOrBoundary a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlockOrBoundary a) ∷ TypeType Source #

Generic (ABlockOrBoundaryHdr a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABlockOrBoundaryHdr a) ∷ TypeType Source #

Generic (ABoundaryBlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABoundaryBlock a) ∷ TypeType Source #

Generic (ABoundaryBody a) 
Instance details

Defined in Cardano.Chain.Block.Block

Associated Types

type Rep (ABoundaryBody a) ∷ TypeType Source #

Generic (ABody a) 
Instance details

Defined in Cardano.Chain.Block.Body

Associated Types

type Rep (ABody a) ∷ TypeType Source #

Methods

fromABody a → Rep (ABody a) x Source #

toRep (ABody a) x → ABody a Source #

Generic (ABlockSignature a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (ABlockSignature a) ∷ TypeType Source #

Generic (ABoundaryHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (ABoundaryHeader a) ∷ TypeType Source #

Generic (AHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

Associated Types

type Rep (AHeader a) ∷ TypeType Source #

Methods

fromAHeader a → Rep (AHeader a) x Source #

toRep (AHeader a) x → AHeader a Source #

Generic (Attributes h) 
Instance details

Defined in Cardano.Chain.Common.Attributes

Associated Types

type Rep (Attributes h) ∷ TypeType Source #

Methods

fromAttributes h → Rep (Attributes h) x Source #

toRep (Attributes h) x → Attributes h Source #

Generic (MerkleNode a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleNode a) ∷ TypeType Source #

Methods

fromMerkleNode a → Rep (MerkleNode a) x Source #

toRep (MerkleNode a) x → MerkleNode a Source #

Generic (MerkleRoot a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleRoot a) ∷ TypeType Source #

Methods

fromMerkleRoot a → Rep (MerkleRoot a) x Source #

toRep (MerkleRoot a) x → MerkleRoot a Source #

Generic (MerkleTree a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

Associated Types

type Rep (MerkleTree a) ∷ TypeType Source #

Methods

fromMerkleTree a → Rep (MerkleTree a) x Source #

toRep (MerkleTree a) x → MerkleTree a Source #

Generic (ACertificate a) 
Instance details

Defined in Cardano.Chain.Delegation.Certificate

Associated Types

type Rep (ACertificate a) ∷ TypeType Source #

Generic (APayload a) 
Instance details

Defined in Cardano.Chain.Delegation.Payload

Associated Types

type Rep (APayload a) ∷ TypeType Source #

Methods

fromAPayload a → Rep (APayload a) x Source #

toRep (APayload a) x → APayload a Source #

Generic (ATxAux a) 
Instance details

Defined in Cardano.Chain.UTxO.TxAux

Associated Types

type Rep (ATxAux a) ∷ TypeType Source #

Methods

fromATxAux a → Rep (ATxAux a) x Source #

toRep (ATxAux a) x → ATxAux a Source #

Generic (ATxPayload a) 
Instance details

Defined in Cardano.Chain.UTxO.TxPayload

Associated Types

type Rep (ATxPayload a) ∷ TypeType Source #

Methods

fromATxPayload a → Rep (ATxPayload a) x Source #

toRep (ATxPayload a) x → ATxPayload a Source #

Generic (APayload a) 
Instance details

Defined in Cardano.Chain.Update.Payload

Associated Types

type Rep (APayload a) ∷ TypeType Source #

Methods

fromAPayload a → Rep (APayload a) x Source #

toRep (APayload a) x → APayload a Source #

Generic (AProposal a) 
Instance details

Defined in Cardano.Chain.Update.Proposal

Associated Types

type Rep (AProposal a) ∷ TypeType Source #

Methods

fromAProposal a → Rep (AProposal a) x Source #

toRep (AProposal a) x → AProposal a Source #

Generic (AVote a) 
Instance details

Defined in Cardano.Chain.Update.Vote

Associated Types

type Rep (AVote a) ∷ TypeType Source #

Methods

fromAVote a → Rep (AVote a) x Source #

toRep (AVote a) x → AVote a Source #

Generic (ConwayDCert c) 
Instance details

Defined in Cardano.Ledger.Conway.Delegation.Certificates

Associated Types

type Rep (ConwayDCert c) ∷ TypeType Source #

Methods

fromConwayDCert c → Rep (ConwayDCert c) x Source #

toRep (ConwayDCert c) x → ConwayDCert c Source #

Generic (ConwayDelegCert c) 
Instance details

Defined in Cardano.Ledger.Conway.Delegation.Certificates

Associated Types

type Rep (ConwayDelegCert c) ∷ TypeType Source #

Generic (Delegatee c) 
Instance details

Defined in Cardano.Ledger.Conway.Delegation.Certificates

Associated Types

type Rep (Delegatee c) ∷ TypeType Source #

Methods

fromDelegatee c → Rep (Delegatee c) x Source #

toRep (Delegatee c) x → Delegatee c Source #

Generic (ConwayGenesis c) 
Instance details

Defined in Cardano.Ledger.Conway.Genesis

Associated Types

type Rep (ConwayGenesis c) ∷ TypeType Source #

Generic (Anchor c) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (Anchor c) ∷ TypeType Source #

Methods

fromAnchor c → Rep (Anchor c) x Source #

toRep (Anchor c) x → Anchor c Source #

Generic (ConwayGovernance era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (ConwayGovernance era) ∷ TypeType Source #

Generic (ConwayTallyState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (ConwayTallyState era) ∷ TypeType Source #

Generic (EnactState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (EnactState era) ∷ TypeType Source #

Methods

fromEnactState era → Rep (EnactState era) x Source #

toRep (EnactState era) x → EnactState era Source #

Generic (GovernanceAction era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (GovernanceAction era) ∷ TypeType Source #

Generic (GovernanceActionId c) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (GovernanceActionId c) ∷ TypeType Source #

Generic (GovernanceActionState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (GovernanceActionState era) ∷ TypeType Source #

Generic (GovernanceProcedure era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (GovernanceProcedure era) ∷ TypeType Source #

Generic (ProposalProcedure era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (ProposalProcedure era) ∷ TypeType Source #

Generic (RatifyState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (RatifyState era) ∷ TypeType Source #

Methods

fromRatifyState era → Rep (RatifyState era) x Source #

toRep (RatifyState era) x → RatifyState era Source #

Generic (VotingProcedure era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Associated Types

type Rep (VotingProcedure era) ∷ TypeType Source #

Generic (ConwayDelegsPredFailure era) 
Instance details

Defined in Cardano.Ledger.Conway.Rules.Delegs

Associated Types

type Rep (ConwayDelegsPredFailure era) ∷ TypeType Source #

Generic (ConwayLedgerPredFailure era) 
Instance details

Defined in Cardano.Ledger.Conway.Rules.Ledger

Associated Types

type Rep (ConwayLedgerPredFailure era) ∷ TypeType Source #

Generic (ConwayTallyPredFailure era) 
Instance details

Defined in Cardano.Ledger.Conway.Rules.Tally

Associated Types

type Rep (ConwayTallyPredFailure era) ∷ TypeType Source #

Generic (ConwayTickfPredFailure era) 
Instance details

Defined in Cardano.Ledger.Conway.Rules.Tickf

Associated Types

type Rep (ConwayTickfPredFailure era) ∷ TypeType Source #

Generic (ConwayTxBody era) 
Instance details

Defined in Cardano.Ledger.Conway.TxBody

Associated Types

type Rep (ConwayTxBody era) ∷ TypeType Source #

Methods

fromConwayTxBody era → Rep (ConwayTxBody era) x Source #

toRep (ConwayTxBody era) x → ConwayTxBody era Source #

Generic (ConwayTxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Conway.TxBody

Associated Types

type Rep (ConwayTxBodyRaw era) ∷ TypeType Source #

Methods

from ∷ ConwayTxBodyRaw era → Rep (ConwayTxBodyRaw era) x Source #

toRep (ConwayTxBodyRaw era) x → ConwayTxBodyRaw era Source #

Generic (Addr c) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (Addr c) ∷ TypeType Source #

Methods

fromAddr c → Rep (Addr c) x Source #

toRep (Addr c) x → Addr c Source #

Generic (BootstrapAddress c) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (BootstrapAddress c) ∷ TypeType Source #

Generic (CompactAddr c) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (CompactAddr c) ∷ TypeType Source #

Methods

fromCompactAddr c → Rep (CompactAddr c) x Source #

toRep (CompactAddr c) x → CompactAddr c Source #

Generic (RewardAcnt c) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (RewardAcnt c) ∷ TypeType Source #

Methods

fromRewardAcnt c → Rep (RewardAcnt c) x Source #

toRep (RewardAcnt c) x → RewardAcnt c Source #

Generic (Withdrawals c) 
Instance details

Defined in Cardano.Ledger.Address

Associated Types

type Rep (Withdrawals c) ∷ TypeType Source #

Methods

fromWithdrawals c → Rep (Withdrawals c) x Source #

toRep (Withdrawals c) x → Withdrawals c Source #

Generic (BlocksMade c) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep (BlocksMade c) ∷ TypeType Source #

Methods

fromBlocksMade c → Rep (BlocksMade c) x Source #

toRep (BlocksMade c) x → BlocksMade c Source #

Generic (CertState era) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (CertState era) ∷ TypeType Source #

Methods

fromCertState era → Rep (CertState era) x Source #

toRep (CertState era) x → CertState era Source #

Generic (DState era) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (DState era) ∷ TypeType Source #

Methods

fromDState era → Rep (DState era) x Source #

toRep (DState era) x → DState era Source #

Generic (FutureGenDeleg c) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (FutureGenDeleg c) ∷ TypeType Source #

Generic (InstantaneousRewards c) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (InstantaneousRewards c) ∷ TypeType Source #

Generic (PState era) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (PState era) ∷ TypeType Source #

Methods

fromPState era → Rep (PState era) x Source #

toRep (PState era) x → PState era Source #

Generic (VState era) 
Instance details

Defined in Cardano.Ledger.CertState

Associated Types

type Rep (VState era) ∷ TypeType Source #

Methods

fromVState era → Rep (VState era) x Source #

toRep (VState era) x → VState era Source #

Generic (PParams era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Associated Types

type Rep (PParams era) ∷ TypeType Source #

Methods

fromPParams era → Rep (PParams era) x Source #

toRep (PParams era) x → PParams era Source #

Generic (PParamsUpdate era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Associated Types

type Rep (PParamsUpdate era) ∷ TypeType Source #

Methods

fromPParamsUpdate era → Rep (PParamsUpdate era) x Source #

toRep (PParamsUpdate era) x → PParamsUpdate era Source #

Generic (GenesisCredential c) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (GenesisCredential c) ∷ TypeType Source #

Generic (StakeReference c) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (StakeReference c) ∷ TypeType Source #

Generic (SnapShot c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Associated Types

type Rep (SnapShot c) ∷ TypeType Source #

Methods

fromSnapShot c → Rep (SnapShot c) x Source #

toRep (SnapShot c) x → SnapShot c Source #

Generic (SnapShots c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Associated Types

type Rep (SnapShots c) ∷ TypeType Source #

Methods

fromSnapShots c → Rep (SnapShots c) x Source #

toRep (SnapShots c) x → SnapShots c Source #

Generic (Stake c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Associated Types

type Rep (Stake c) ∷ TypeType Source #

Methods

fromStake c → Rep (Stake c) x Source #

toRep (Stake c) x → Stake c Source #

Generic (ScriptHash c) 
Instance details

Defined in Cardano.Ledger.Hashes

Associated Types

type Rep (ScriptHash c) ∷ TypeType Source #

Methods

fromScriptHash c → Rep (ScriptHash c) x Source #

toRep (ScriptHash c) x → ScriptHash c Source #

Generic (GKeys c) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GKeys c) ∷ TypeType Source #

Methods

fromGKeys c → Rep (GKeys c) x Source #

toRep (GKeys c) x → GKeys c Source #

Generic (GenDelegPair c) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GenDelegPair c) ∷ TypeType Source #

Generic (GenDelegs c) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (GenDelegs c) ∷ TypeType Source #

Methods

fromGenDelegs c → Rep (GenDelegs c) x Source #

toRep (GenDelegs c) x → GenDelegs c Source #

Generic (BootstrapWitness c) 
Instance details

Defined in Cardano.Ledger.Keys.Bootstrap

Associated Types

type Rep (BootstrapWitness c) ∷ TypeType Source #

Generic (IndividualPoolStake c) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Associated Types

type Rep (IndividualPoolStake c) ∷ TypeType Source #

Generic (PoolDistr c) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Associated Types

type Rep (PoolDistr c) ∷ TypeType Source #

Methods

fromPoolDistr c → Rep (PoolDistr c) x Source #

toRep (PoolDistr c) x → PoolDistr c Source #

Generic (PoolParams c) 
Instance details

Defined in Cardano.Ledger.PoolParams

Associated Types

type Rep (PoolParams c) ∷ TypeType Source #

Methods

fromPoolParams c → Rep (PoolParams c) x Source #

toRep (PoolParams c) x → PoolParams c Source #

Generic (Reward c) 
Instance details

Defined in Cardano.Ledger.Rewards

Associated Types

type Rep (Reward c) ∷ TypeType Source #

Methods

fromReward c → Rep (Reward c) x Source #

toRep (Reward c) x → Reward c Source #

Generic (TxId c) 
Instance details

Defined in Cardano.Ledger.TxIn

Associated Types

type Rep (TxId c) ∷ TypeType Source #

Methods

fromTxId c → Rep (TxId c) x Source #

toRep (TxId c) x → TxId c Source #

Generic (TxIn c) 
Instance details

Defined in Cardano.Ledger.TxIn

Associated Types

type Rep (TxIn c) ∷ TypeType Source #

Methods

fromTxIn c → Rep (TxIn c) x Source #

toRep (TxIn c) x → TxIn c Source #

Generic (Trip c) 
Instance details

Defined in Cardano.Ledger.UMap

Associated Types

type Rep (Trip c) ∷ TypeType Source #

Methods

fromTrip c → Rep (Trip c) x Source #

toRep (Trip c) x → Trip c Source #

Generic (UMap c) 
Instance details

Defined in Cardano.Ledger.UMap

Associated Types

type Rep (UMap c) ∷ TypeType Source #

Methods

fromUMap c → Rep (UMap c) x Source #

toRep (UMap c) x → UMap c Source #

Generic (UTxO era) 
Instance details

Defined in Cardano.Ledger.UTxO

Associated Types

type Rep (UTxO era) ∷ TypeType Source #

Methods

fromUTxO era → Rep (UTxO era) x Source #

toRep (UTxO era) x → UTxO era Source #

Generic (MaryTxBody era) 
Instance details

Defined in Cardano.Ledger.Mary.TxBody

Associated Types

type Rep (MaryTxBody era) ∷ TypeType Source #

Methods

fromMaryTxBody era → Rep (MaryTxBody era) x Source #

toRep (MaryTxBody era) x → MaryTxBody era Source #

Generic (MaryTxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Mary.TxBody

Associated Types

type Rep (MaryTxBodyRaw era) ∷ TypeType Source #

Methods

from ∷ MaryTxBodyRaw era → Rep (MaryTxBodyRaw era) x Source #

toRep (MaryTxBodyRaw era) x → MaryTxBodyRaw era Source #

Generic (MaryValue c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Associated Types

type Rep (MaryValue c) ∷ TypeType Source #

Methods

fromMaryValue c → Rep (MaryValue c) x Source #

toRep (MaryValue c) x → MaryValue c Source #

Generic (MultiAsset c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Associated Types

type Rep (MultiAsset c) ∷ TypeType Source #

Methods

fromMultiAsset c → Rep (MultiAsset c) x Source #

toRep (MultiAsset c) x → MultiAsset c Source #

Generic (PolicyID c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Associated Types

type Rep (PolicyID c) ∷ TypeType Source #

Methods

fromPolicyID c → Rep (PolicyID c) x Source #

toRep (PolicyID c) x → PolicyID c Source #

Generic (BlockTransitionError era) 
Instance details

Defined in Cardano.Ledger.Shelley.API.Validation

Associated Types

type Rep (BlockTransitionError era) ∷ TypeType Source #

Generic (TickTransitionError era) 
Instance details

Defined in Cardano.Ledger.Shelley.API.Validation

Associated Types

type Rep (TickTransitionError era) ∷ TypeType Source #

Generic (ShelleyTxSeq era) 
Instance details

Defined in Cardano.Ledger.Shelley.BlockChain

Associated Types

type Rep (ShelleyTxSeq era) ∷ TypeType Source #

Methods

fromShelleyTxSeq era → Rep (ShelleyTxSeq era) x Source #

toRep (ShelleyTxSeq era) x → ShelleyTxSeq era Source #

Generic (ConstitutionalDelegCert c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (ConstitutionalDelegCert c) ∷ TypeType Source #

Generic (DCert c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (DCert c) ∷ TypeType Source #

Methods

fromDCert c → Rep (DCert c) x Source #

toRep (DCert c) x → DCert c Source #

Generic (DelegCert c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (DelegCert c) ∷ TypeType Source #

Methods

fromDelegCert c → Rep (DelegCert c) x Source #

toRep (DelegCert c) x → DelegCert c Source #

Generic (Delegation c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (Delegation c) ∷ TypeType Source #

Methods

fromDelegation c → Rep (Delegation c) x Source #

toRep (Delegation c) x → Delegation c Source #

Generic (MIRCert c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (MIRCert c) ∷ TypeType Source #

Methods

fromMIRCert c → Rep (MIRCert c) x Source #

toRep (MIRCert c) x → MIRCert c Source #

Generic (MIRTarget c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (MIRTarget c) ∷ TypeType Source #

Methods

fromMIRTarget c → Rep (MIRTarget c) x Source #

toRep (MIRTarget c) x → MIRTarget c Source #

Generic (PoolCert c) 
Instance details

Defined in Cardano.Ledger.Shelley.Delegation.Certificates

Associated Types

type Rep (PoolCert c) ∷ TypeType Source #

Methods

fromPoolCert c → Rep (PoolCert c) x Source #

toRep (PoolCert c) x → PoolCert c Source #

Generic (ShelleyGenesis c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Associated Types

type Rep (ShelleyGenesis c) ∷ TypeType Source #

Generic (ShelleyGenesisStaking c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Associated Types

type Rep (ShelleyGenesisStaking c) ∷ TypeType Source #

Generic (ShelleyPPUPState era) 
Instance details

Defined in Cardano.Ledger.Shelley.Governance

Associated Types

type Rep (ShelleyPPUPState era) ∷ TypeType Source #

Generic (EpochState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep (EpochState era) ∷ TypeType Source #

Methods

fromEpochState era → Rep (EpochState era) x Source #

toRep (EpochState era) x → EpochState era Source #

Generic (IncrementalStake c) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep (IncrementalStake c) ∷ TypeType Source #

Generic (LedgerState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep (LedgerState era) ∷ TypeType Source #

Methods

fromLedgerState era → Rep (LedgerState era) x Source #

toRep (LedgerState era) x → LedgerState era Source #

Generic (NewEpochState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep (NewEpochState era) ∷ TypeType Source #

Methods

fromNewEpochState era → Rep (NewEpochState era) x Source #

toRep (NewEpochState era) x → NewEpochState era Source #

Generic (UTxOState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Associated Types

type Rep (UTxOState era) ∷ TypeType Source #

Methods

fromUTxOState era → Rep (UTxOState era) x Source #

toRep (UTxOState era) x → UTxOState era Source #

Generic (PPUpdateEnv era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (PPUpdateEnv era) ∷ TypeType Source #

Methods

fromPPUpdateEnv era → Rep (PPUpdateEnv era) x Source #

toRep (PPUpdateEnv era) x → PPUpdateEnv era Source #

Generic (ProposedPPUpdates era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (ProposedPPUpdates era) ∷ TypeType Source #

Generic (Update era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (Update era) ∷ TypeType Source #

Methods

fromUpdate era → Rep (Update era) x Source #

toRep (Update era) x → Update era Source #

Generic (NonMyopic c) 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Associated Types

type Rep (NonMyopic c) ∷ TypeType Source #

Methods

fromNonMyopic c → Rep (NonMyopic c) x Source #

toRep (NonMyopic c) x → NonMyopic c Source #

Generic (RewardProvenance c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep (RewardProvenance c) ∷ TypeType Source #

Generic (RewardProvenancePool c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Associated Types

type Rep (RewardProvenancePool c) ∷ TypeType Source #

Generic (FreeVars c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (FreeVars c) ∷ TypeType Source #

Methods

fromFreeVars c → Rep (FreeVars c) x Source #

toRep (FreeVars c) x → FreeVars c Source #

Generic (PulsingRewUpdate c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (PulsingRewUpdate c) ∷ TypeType Source #

Generic (RewardAns c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardAns c) ∷ TypeType Source #

Methods

fromRewardAns c → Rep (RewardAns c) x Source #

toRep (RewardAns c) x → RewardAns c Source #

Generic (RewardSnapShot c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardSnapShot c) ∷ TypeType Source #

Generic (RewardUpdate c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Associated Types

type Rep (RewardUpdate c) ∷ TypeType Source #

Generic (LeaderOnlyReward c) 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep (LeaderOnlyReward c) ∷ TypeType Source #

Generic (PoolRewardInfo c) 
Instance details

Defined in Cardano.Ledger.Shelley.Rewards

Associated Types

type Rep (PoolRewardInfo c) ∷ TypeType Source #

Generic (ShelleyBbodyPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Bbody

Associated Types

type Rep (ShelleyBbodyPredFailure era) ∷ TypeType Source #

Generic (ShelleyDelegPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Deleg

Associated Types

type Rep (ShelleyDelegPredFailure era) ∷ TypeType Source #

Generic (ShelleyDelegsPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Delegs

Associated Types

type Rep (ShelleyDelegsPredFailure era) ∷ TypeType Source #

Generic (ShelleyDelplPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Delpl

Associated Types

type Rep (ShelleyDelplPredFailure era) ∷ TypeType Source #

Generic (ShelleyEpochPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Epoch

Associated Types

type Rep (ShelleyEpochPredFailure era) ∷ TypeType Source #

Generic (ShelleyLedgerPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ledger

Associated Types

type Rep (ShelleyLedgerPredFailure era) ∷ TypeType Source #

Generic (ShelleyLedgersPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ledgers

Associated Types

type Rep (ShelleyLedgersPredFailure era) ∷ TypeType Source #

Generic (ShelleyMirPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Mir

Associated Types

type Rep (ShelleyMirPredFailure era) ∷ TypeType Source #

Generic (ShelleyNewEpochPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.NewEpoch

Associated Types

type Rep (ShelleyNewEpochPredFailure era) ∷ TypeType Source #

Generic (ShelleyNewppPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Newpp

Associated Types

type Rep (ShelleyNewppPredFailure era) ∷ TypeType Source #

Generic (ShelleyPoolPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Pool

Associated Types

type Rep (ShelleyPoolPredFailure era) ∷ TypeType Source #

Generic (ShelleyPoolreapPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.PoolReap

Associated Types

type Rep (ShelleyPoolreapPredFailure era) ∷ TypeType Source #

Generic (ShelleyPpupPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Ppup

Associated Types

type Rep (ShelleyPpupPredFailure era) ∷ TypeType Source #

Generic (ShelleyRupdPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Rupd

Associated Types

type Rep (ShelleyRupdPredFailure era) ∷ TypeType Source #

Generic (ShelleySnapPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Snap

Associated Types

type Rep (ShelleySnapPredFailure era) ∷ TypeType Source #

Generic (ShelleyTickEvent era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (ShelleyTickEvent era) ∷ TypeType Source #

Generic (ShelleyTickPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (ShelleyTickPredFailure era) ∷ TypeType Source #

Generic (ShelleyTickfPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Tick

Associated Types

type Rep (ShelleyTickfPredFailure era) ∷ TypeType Source #

Generic (ShelleyUpecPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Upec

Associated Types

type Rep (ShelleyUpecPredFailure era) ∷ TypeType Source #

Generic (ShelleyUtxoPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Utxo

Associated Types

type Rep (ShelleyUtxoPredFailure era) ∷ TypeType Source #

Generic (ShelleyUtxowPredFailure era) 
Instance details

Defined in Cardano.Ledger.Shelley.Rules.Utxow

Associated Types

type Rep (ShelleyUtxowPredFailure era) ∷ TypeType Source #

Generic (MultiSig era) 
Instance details

Defined in Cardano.Ledger.Shelley.Scripts

Associated Types

type Rep (MultiSig era) ∷ TypeType Source #

Methods

fromMultiSig era → Rep (MultiSig era) x Source #

toRep (MultiSig era) x → MultiSig era Source #

Generic (MultiSigRaw era) 
Instance details

Defined in Cardano.Ledger.Shelley.Scripts

Associated Types

type Rep (MultiSigRaw era) ∷ TypeType Source #

Methods

from ∷ MultiSigRaw era → Rep (MultiSigRaw era) x Source #

toRep (MultiSigRaw era) x → MultiSigRaw era Source #

Generic (FromByronTranslationContext c) 
Instance details

Defined in Cardano.Ledger.Shelley.Translation

Associated Types

type Rep (FromByronTranslationContext c) ∷ TypeType Source #

Generic (ShelleyTxRaw era) 
Instance details

Defined in Cardano.Ledger.Shelley.Tx

Associated Types

type Rep (ShelleyTxRaw era) ∷ TypeType Source #

Methods

from ∷ ShelleyTxRaw era → Rep (ShelleyTxRaw era) x Source #

toRep (ShelleyTxRaw era) x → ShelleyTxRaw era Source #

Generic (ShelleyTxAuxData era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxAuxData

Associated Types

type Rep (ShelleyTxAuxData era) ∷ TypeType Source #

Generic (ShelleyTxBody era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (ShelleyTxBody era) ∷ TypeType Source #

Methods

fromShelleyTxBody era → Rep (ShelleyTxBody era) x Source #

toRep (ShelleyTxBody era) x → ShelleyTxBody era Source #

Generic (ShelleyTxBodyRaw era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxBody

Associated Types

type Rep (ShelleyTxBodyRaw era) ∷ TypeType Source #

Era era ⇒ Generic (ShelleyTxWits era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Associated Types

type Rep (ShelleyTxWits era) ∷ TypeType Source #

Methods

fromShelleyTxWits era → Rep (ShelleyTxWits era) x Source #

toRep (ShelleyTxWits era) x → ShelleyTxWits era Source #

Generic (ChainDepState c) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (ChainDepState c) ∷ TypeType Source #

Generic (ChainTransitionError c) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (ChainTransitionError c) ∷ TypeType Source #

Generic (LedgerView c) 
Instance details

Defined in Cardano.Protocol.TPraos.API

Associated Types

type Rep (LedgerView c) ∷ TypeType Source #

Methods

fromLedgerView c → Rep (LedgerView c) x Source #

toRep (LedgerView c) x → LedgerView c Source #

Generic (BHBody c) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (BHBody c) ∷ TypeType Source #

Methods

fromBHBody c → Rep (BHBody c) x Source #

toRep (BHBody c) x → BHBody c Source #

Generic (BHeader c) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (BHeader c) ∷ TypeType Source #

Methods

fromBHeader c → Rep (BHeader c) x Source #

toRep (BHeader c) x → BHeader c Source #

Generic (HashHeader c) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (HashHeader c) ∷ TypeType Source #

Methods

fromHashHeader c → Rep (HashHeader c) x Source #

toRep (HashHeader c) x → HashHeader c Source #

Generic (LastAppliedBlock c) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (LastAppliedBlock c) ∷ TypeType Source #

Generic (PrevHash c) 
Instance details

Defined in Cardano.Protocol.TPraos.BHeader

Associated Types

type Rep (PrevHash c) ∷ TypeType Source #

Methods

fromPrevHash c → Rep (PrevHash c) x Source #

toRep (PrevHash c) x → PrevHash c Source #

Generic (OCert c) 
Instance details

Defined in Cardano.Protocol.TPraos.OCert

Associated Types

type Rep (OCert c) ∷ TypeType Source #

Methods

fromOCert c → Rep (OCert c) x Source #

toRep (OCert c) x → OCert c Source #

Generic (OcertPredicateFailure c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.OCert

Associated Types

type Rep (OcertPredicateFailure c) ∷ TypeType Source #

Generic (OBftSlot c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OBftSlot c) ∷ TypeType Source #

Methods

fromOBftSlot c → Rep (OBftSlot c) x Source #

toRep (OBftSlot c) x → OBftSlot c Source #

Generic (OverlayEnv c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OverlayEnv c) ∷ TypeType Source #

Methods

fromOverlayEnv c → Rep (OverlayEnv c) x Source #

toRep (OverlayEnv c) x → OverlayEnv c Source #

Generic (OverlayPredicateFailure c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Overlay

Associated Types

type Rep (OverlayPredicateFailure c) ∷ TypeType Source #

Generic (PrtclEnv c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclEnv c) ∷ TypeType Source #

Methods

fromPrtclEnv c → Rep (PrtclEnv c) x Source #

toRep (PrtclEnv c) x → PrtclEnv c Source #

Generic (PrtclPredicateFailure c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclPredicateFailure c) ∷ TypeType Source #

Generic (PrtclState c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtclState c) ∷ TypeType Source #

Methods

fromPrtclState c → Rep (PrtclState c) x Source #

toRep (PrtclState c) x → PrtclState c Source #

Generic (PrtlSeqFailure c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Prtcl

Associated Types

type Rep (PrtlSeqFailure c) ∷ TypeType Source #

Generic (UpdnPredicateFailure c) 
Instance details

Defined in Cardano.Protocol.TPraos.Rules.Updn

Associated Types

type Rep (UpdnPredicateFailure c) ∷ TypeType Source #

Generic (Versioned a) 
Instance details

Defined in Cardano.Simple.Ledger.Scripts

Associated Types

type Rep (Versioned a) ∷ TypeType Source #

Methods

fromVersioned a → Rep (Versioned a) x Source #

toRep (Versioned a) x → Versioned a Source #

Generic (WithOrigin t) 
Instance details

Defined in Cardano.Slotting.Slot

Associated Types

type Rep (WithOrigin t) ∷ TypeType Source #

Methods

fromWithOrigin t → Rep (WithOrigin t) x Source #

toRep (WithOrigin t) x → WithOrigin t Source #

Generic (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

Associated Types

type Rep (StrictMaybe a) ∷ TypeType Source #

Methods

fromStrictMaybe a → Rep (StrictMaybe a) x Source #

toRep (StrictMaybe a) x → StrictMaybe a Source #

Generic (Hash tag) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.Hash

Associated Types

type Rep (Hash tag) ∷ TypeType Source #

Methods

fromHash tag → Rep (Hash tag) x Source #

toRep (Hash tag) x → Hash tag Source #

Generic (Flat a) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep (Flat a) ∷ TypeType Source #

Methods

fromFlat a → Rep (Flat a) x Source #

toRep (Flat a) x → Flat a Source #

Generic (Nested a) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Associated Types

type Rep (Nested a) ∷ TypeType Source #

Methods

fromNested a → Rep (Nested a) x Source #

toRep (Nested a) x → Nested a Source #

Generic (UTxOIndex u) 
Instance details

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

Associated Types

type Rep (UTxOIndex u) ∷ TypeType Source #

Methods

fromUTxOIndex u → Rep (UTxOIndex u) x Source #

toRep (UTxOIndex u) x → UTxOIndex u Source #

Generic (State u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (State u) ∷ TypeType Source #

Methods

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

toRep (State u) x → State u Source #

Generic (UTxOSelection u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (UTxOSelection u) ∷ TypeType Source #

Generic (UTxOSelectionNonEmpty u) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.UTxOSelection

Associated Types

type Rep (UTxOSelectionNonEmpty u) ∷ TypeType Source #

Generic (ShowFmt a) 
Instance details

Defined in Cardano.Wallet.Util

Associated Types

type Rep (ShowFmt a) ∷ TypeType Source #

Methods

fromShowFmt a → Rep (ShowFmt a) x Source #

toRep (ShowFmt a) x → ShowFmt a Source #

Generic (NonRandom a) 
Instance details

Defined in Control.Monad.Random.NonRandom

Associated Types

type Rep (NonRandom a) ∷ TypeType Source #

Methods

fromNonRandom a → Rep (NonRandom a) x Source #

toRep (NonRandom a) x → NonRandom a Source #

Generic (SCC vertex) 
Instance details

Defined in Data.Graph

Associated Types

type Rep (SCC vertex) ∷ TypeType Source #

Methods

fromSCC vertex → Rep (SCC vertex) x Source #

toRep (SCC vertex) x → SCC vertex Source #

Generic (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) ∷ TypeType Source #

Methods

fromDigit a → Rep (Digit a) x Source #

toRep (Digit a) x → Digit a Source #

Generic (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) ∷ TypeType Source #

Methods

fromElem a → Rep (Elem a) x Source #

toRep (Elem a) x → Elem a Source #

Generic (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) ∷ TypeType Source #

Methods

fromFingerTree a → Rep (FingerTree a) x Source #

toRep (FingerTree a) x → FingerTree a Source #

Generic (Node a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) ∷ TypeType Source #

Methods

fromNode a → Rep (Node a) x Source #

toRep (Node a) x → Node a Source #

Generic (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) ∷ TypeType Source #

Methods

fromViewL a → Rep (ViewL a) x Source #

toRep (ViewL a) x → ViewL a Source #

Generic (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) ∷ TypeType Source #

Methods

fromViewR a → Rep (ViewR a) x Source #

toRep (ViewR a) x → ViewR a Source #

Generic (Tree a) 
Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) ∷ TypeType Source #

Methods

fromTree a → Rep (Tree a) x Source #

toRep (Tree a) x → Tree a Source #

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) ∷ TypeType Source #

Methods

fromFix f → Rep (Fix f) x Source #

toRep (Fix f) x → Fix f Source #

Generic (Digit a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (Digit a) ∷ TypeType Source #

Methods

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

toRep (Digit a) x → Digit a Source #

Generic (PostAligned a) 
Instance details

Defined in Flat.Filler

Associated Types

type Rep (PostAligned a) ∷ TypeType Source #

Methods

fromPostAligned a → Rep (PostAligned a) x Source #

toRep (PostAligned a) x → PostAligned a Source #

Generic (PreAligned a) 
Instance details

Defined in Flat.Filler

Associated Types

type Rep (PreAligned a) ∷ TypeType Source #

Methods

fromPreAligned a → Rep (PreAligned a) x Source #

toRep (PreAligned a) x → PreAligned a Source #

Generic (Handle h) 
Instance details

Defined in System.FS.API.Types

Associated Types

type Rep (Handle h) ∷ TypeType Source #

Methods

fromHandle h → Rep (Handle h) x Source #

toRep (Handle h) x → Handle h Source #

Generic (GenClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep (GenClosure b) ∷ TypeType Source #

Methods

fromGenClosure b → Rep (GenClosure b) x Source #

toRep (GenClosure b) x → GenClosure b Source #

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) ∷ TypeType Source #

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) ∷ TypeType Source #

Methods

fromAddrRange a → Rep (AddrRange a) x Source #

toRep (AddrRange a) x → AddrRange a Source #

Generic (Item a) 
Instance details

Defined in Katip.Core

Associated Types

type Rep (Item a) ∷ TypeType Source #

Methods

fromItem a → Rep (Item a) x Source #

toRep (Item a) x → Item a Source #

Generic (MaestroApiV1 route) 
Instance details

Defined in Maestro.API.V1

Associated Types

type Rep (MaestroApiV1 route) ∷ TypeType Source #

Methods

fromMaestroApiV1 route → Rep (MaestroApiV1 route) x Source #

toRep (MaestroApiV1 route) x → MaestroApiV1 route Source #

Generic (MaestroApiV1Auth route) 
Instance details

Defined in Maestro.API.V1

Associated Types

type Rep (MaestroApiV1Auth route) ∷ TypeType Source #

Methods

fromMaestroApiV1Auth route → Rep (MaestroApiV1Auth route) x Source #

toRep (MaestroApiV1Auth route) x → MaestroApiV1Auth route Source #

Generic (AccountsAPI route) 
Instance details

Defined in Maestro.API.V1.Accounts

Associated Types

type Rep (AccountsAPI route) ∷ TypeType Source #

Methods

fromAccountsAPI route → Rep (AccountsAPI route) x Source #

toRep (AccountsAPI route) x → AccountsAPI route Source #

Generic (AddressesAPI route) 
Instance details

Defined in Maestro.API.V1.Addresses

Associated Types

type Rep (AddressesAPI route) ∷ TypeType Source #

Methods

fromAddressesAPI route → Rep (AddressesAPI route) x Source #

toRep (AddressesAPI route) x → AddressesAPI route Source #

Generic (AssetsAPI route) 
Instance details

Defined in Maestro.API.V1.Assets

Associated Types

type Rep (AssetsAPI route) ∷ TypeType Source #

Methods

fromAssetsAPI route → Rep (AssetsAPI route) x Source #

toRep (AssetsAPI route) x → AssetsAPI route Source #

Generic (BlocksAPI route) 
Instance details

Defined in Maestro.API.V1.Blocks

Associated Types

type Rep (BlocksAPI route) ∷ TypeType Source #

Methods

fromBlocksAPI route → Rep (BlocksAPI route) x Source #

toRep (BlocksAPI route) x → BlocksAPI route Source #

Generic (DatumAPI route) 
Instance details

Defined in Maestro.API.V1.Datum

Associated Types

type Rep (DatumAPI route) ∷ TypeType Source #

Methods

fromDatumAPI route → Rep (DatumAPI route) x Source #

toRep (DatumAPI route) x → DatumAPI route Source #

Generic (DefiMarketsAPI route) 
Instance details

Defined in Maestro.API.V1.DefiMarkets

Associated Types

type Rep (DefiMarketsAPI route) ∷ TypeType Source #

Methods

fromDefiMarketsAPI route → Rep (DefiMarketsAPI route) x Source #

toRep (DefiMarketsAPI route) x → DefiMarketsAPI route Source #

Generic (GeneralAPI route) 
Instance details

Defined in Maestro.API.V1.General

Associated Types

type Rep (GeneralAPI route) ∷ TypeType Source #

Methods

fromGeneralAPI route → Rep (GeneralAPI route) x Source #

toRep (GeneralAPI route) x → GeneralAPI route Source #

Generic (PoolsAPI route) 
Instance details

Defined in Maestro.API.V1.Pools

Associated Types

type Rep (PoolsAPI route) ∷ TypeType Source #

Methods

fromPoolsAPI route → Rep (PoolsAPI route) x Source #

toRep (PoolsAPI route) x → PoolsAPI route Source #

Generic (TransactionsAPI route) 
Instance details

Defined in Maestro.API.V1.Transactions

Associated Types

type Rep (TransactionsAPI route) ∷ TypeType Source #

Methods

fromTransactionsAPI route → Rep (TransactionsAPI route) x Source #

toRep (TransactionsAPI route) x → TransactionsAPI route Source #

Generic (TxManagerAPI route) 
Instance details

Defined in Maestro.API.V1.TxManager

Associated Types

type Rep (TxManagerAPI route) ∷ TypeType Source #

Methods

fromTxManagerAPI route → Rep (TxManagerAPI route) x Source #

toRep (TxManagerAPI route) x → TxManagerAPI route Source #

Generic (Bech32StringOf a) 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep (Bech32StringOf a) ∷ TypeType Source #

Generic (HashStringOf a) 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep (HashStringOf a) ∷ TypeType Source #

Generic (HexStringOf a) 
Instance details

Defined in Maestro.Types.Common

Associated Types

type Rep (HexStringOf a) ∷ TypeType Source #

Methods

fromHexStringOf a → Rep (HexStringOf a) x Source #

toRep (HexStringOf a) x → HexStringOf a Source #

Generic (TaggedText description) 
Instance details

Defined in Maestro.Types.V1.Common

Associated Types

type Rep (TaggedText description) ∷ TypeType Source #

Methods

fromTaggedText description → Rep (TaggedText description) x Source #

toRep (TaggedText description) x → TaggedText description Source #

Generic (MemoryStepsWith i) 
Instance details

Defined in Maestro.Types.V1.General

Associated Types

type Rep (MemoryStepsWith i) ∷ TypeType Source #

Generic (Root a) 
Instance details

Defined in Numeric.RootFinding

Associated Types

type Rep (Root a) ∷ TypeType Source #

Methods

fromRoot a → Rep (Root a) x Source #

toRep (Root a) x → Root a Source #

Generic (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorFancy e) ∷ TypeType Source #

Methods

fromErrorFancy e → Rep (ErrorFancy e) x Source #

toRep (ErrorFancy e) x → ErrorFancy e Source #

Generic (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorItem t) ∷ TypeType Source #

Methods

fromErrorItem t → Rep (ErrorItem t) x Source #

toRep (ErrorItem t) x → ErrorItem t Source #

Generic (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (PosState s) ∷ TypeType Source #

Methods

fromPosState s → Rep (PosState s) x Source #

toRep (PosState s) x → PosState s Source #

Generic (Header ByronBlock) 
Instance details

Defined in Ouroboros.Consensus.Byron.Ledger.Block

Associated Types

type Rep (Header ByronBlock) ∷ TypeType Source #

Generic (Header (ShelleyBlock proto era)) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Block

Associated Types

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

Methods

fromHeader (ShelleyBlock proto era) → Rep (Header (ShelleyBlock proto era)) x Source #

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

Generic (RealPoint blk) 
Instance details

Defined in Ouroboros.Consensus.Block.RealPoint

Associated Types

type Rep (RealPoint blk) ∷ TypeType Source #

Methods

fromRealPoint blk → Rep (RealPoint blk) x Source #

toRep (RealPoint blk) x → RealPoint blk Source #

Generic (TopLevelConfig blk) 
Instance details

Defined in Ouroboros.Consensus.Config

Associated Types

type Rep (TopLevelConfig blk) ∷ TypeType Source #

Methods

fromTopLevelConfig blk → Rep (TopLevelConfig blk) x Source #

toRep (TopLevelConfig blk) x → TopLevelConfig blk Source #

Generic (HardForkLedgerConfig xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Basics

Associated Types

type Rep (HardForkLedgerConfig xs) ∷ TypeType Source #

Generic (SingleEraInfo blk) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Info

Associated Types

type Rep (SingleEraInfo blk) ∷ TypeType Source #

Methods

fromSingleEraInfo blk → Rep (SingleEraInfo blk) x Source #

toRep (SingleEraInfo blk) x → SingleEraInfo blk Source #

Generic (HardForkEnvelopeErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Ledger

Associated Types

type Rep (HardForkEnvelopeErr xs) ∷ TypeType Source #

Generic (HardForkLedgerError xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Ledger

Associated Types

type Rep (HardForkLedgerError xs) ∷ TypeType Source #

Generic (HardForkApplyTxErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Mempool

Associated Types

type Rep (HardForkApplyTxErr xs) ∷ TypeType Source #

Generic (HardForkValidationErr xs) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Protocol

Associated Types

type Rep (HardForkValidationErr xs) ∷ TypeType Source #

Generic (HeaderStateHistory blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderStateHistory

Associated Types

type Rep (HeaderStateHistory blk) ∷ TypeType Source #

Generic (AnnTip blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (AnnTip blk) ∷ TypeType Source #

Methods

fromAnnTip blk → Rep (AnnTip blk) x Source #

toRep (AnnTip blk) x → AnnTip blk Source #

Generic (HeaderEnvelopeError blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderEnvelopeError blk) ∷ TypeType Source #

Generic (HeaderError blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderError blk) ∷ TypeType Source #

Methods

fromHeaderError blk → Rep (HeaderError blk) x Source #

toRep (HeaderError blk) x → HeaderError blk Source #

Generic (HeaderState blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (HeaderState blk) ∷ TypeType Source #

Methods

fromHeaderState blk → Rep (HeaderState blk) x Source #

toRep (HeaderState blk) x → HeaderState blk Source #

Generic (TipInfoIsEBB blk) 
Instance details

Defined in Ouroboros.Consensus.HeaderValidation

Associated Types

type Rep (TipInfoIsEBB blk) ∷ TypeType Source #

Methods

fromTipInfoIsEBB blk → Rep (TipInfoIsEBB blk) x Source #

toRep (TipInfoIsEBB blk) x → TipInfoIsEBB blk Source #

Generic (ExtLedgerCfg blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtLedgerCfg blk) ∷ TypeType Source #

Methods

fromExtLedgerCfg blk → Rep (ExtLedgerCfg blk) x Source #

toRep (ExtLedgerCfg blk) x → ExtLedgerCfg blk Source #

Generic (ExtLedgerState blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtLedgerState blk) ∷ TypeType Source #

Methods

fromExtLedgerState blk → Rep (ExtLedgerState blk) x Source #

toRep (ExtLedgerState blk) x → ExtLedgerState blk Source #

Generic (ExtValidationError blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Extended

Associated Types

type Rep (ExtValidationError blk) ∷ TypeType Source #

Generic (InternalState blk) 
Instance details

Defined in Ouroboros.Consensus.Mempool.Impl.Common

Associated Types

type Rep (InternalState blk) ∷ TypeType Source #

Methods

fromInternalState blk → Rep (InternalState blk) x Source #

toRep (InternalState blk) x → InternalState blk Source #

Generic (TxTicket tx) 
Instance details

Defined in Ouroboros.Consensus.Mempool.TxSeq

Associated Types

type Rep (TxTicket tx) ∷ TypeType Source #

Methods

fromTxTicket tx → Rep (TxTicket tx) x Source #

toRep (TxTicket tx) x → TxTicket tx Source #

Generic (KnownIntersectionState blk) 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Associated Types

type Rep (KnownIntersectionState blk) ∷ TypeType Source #

Methods

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

toRep (KnownIntersectionState blk) x → KnownIntersectionState blk Source #

Generic (UnknownIntersectionState blk) 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Associated Types

type Rep (UnknownIntersectionState blk) ∷ TypeType Source #

Methods

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

toRep (UnknownIntersectionState blk) x → UnknownIntersectionState blk Source #

Generic (ConsensusConfig (HardForkProtocol xs)) 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Basics

Associated Types

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

Generic (ConsensusConfig (PBft c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

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

Generic (ConsensusConfig (Praos c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

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

Generic (ConsensusConfig (TPraos c)) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

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

Generic (PBftCanBeLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftCanBeLeader c) ∷ TypeType Source #

Generic (PBftCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftCannotForge c) ∷ TypeType Source #

Generic (PBftIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftIsLeader c) ∷ TypeType Source #

Generic (PBftLedgerView c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftLedgerView c) ∷ TypeType Source #

Generic (PBftValidationErr c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftValidationErr c) ∷ TypeType Source #

Generic (PBftSigner c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.State

Associated Types

type Rep (PBftSigner c) ∷ TypeType Source #

Methods

fromPBftSigner c → Rep (PBftSigner c) x Source #

toRep (PBftSigner c) x → PBftSigner c Source #

Generic (PBftState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT.State

Associated Types

type Rep (PBftState c) ∷ TypeType Source #

Methods

fromPBftState c → Rep (PBftState c) x Source #

toRep (PBftState c) x → PBftState c Source #

Generic (InvalidBlockReason blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

Associated Types

type Rep (InvalidBlockReason blk) ∷ TypeType Source #

Generic (InImmutableDBEnd blk) 
Instance details

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

Associated Types

type Rep (InImmutableDBEnd blk) ∷ TypeType Source #

Methods

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

toRep (InImmutableDBEnd blk) x → InImmutableDBEnd blk Source #

Generic (FollowerRollState blk) 
Instance details

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

Associated Types

type Rep (FollowerRollState blk) ∷ TypeType Source #

Generic (InvalidBlockInfo blk) 
Instance details

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

Associated Types

type Rep (InvalidBlockInfo blk) ∷ TypeType Source #

Generic (NewTipInfo blk) 
Instance details

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

Associated Types

type Rep (NewTipInfo blk) ∷ TypeType Source #

Methods

fromNewTipInfo blk → Rep (NewTipInfo blk) x Source #

toRep (NewTipInfo blk) x → NewTipInfo blk Source #

Generic (TraceAddBlockEvent blk) 
Instance details

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

Associated Types

type Rep (TraceAddBlockEvent blk) ∷ TypeType Source #

Generic (TraceCopyToImmutableDBEvent blk) 
Instance details

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

Associated Types

type Rep (TraceCopyToImmutableDBEvent blk) ∷ TypeType Source #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType Source #

Methods

fromTraceEvent blk → Rep (TraceEvent blk) x Source #

toRep (TraceEvent blk) x → TraceEvent blk Source #

Generic (TraceFollowerEvent blk) 
Instance details

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

Associated Types

type Rep (TraceFollowerEvent blk) ∷ TypeType Source #

Generic (TraceGCEvent blk) 
Instance details

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

Associated Types

type Rep (TraceGCEvent blk) ∷ TypeType Source #

Methods

fromTraceGCEvent blk → Rep (TraceGCEvent blk) x Source #

toRep (TraceGCEvent blk) x → TraceGCEvent blk Source #

Generic (TraceInitChainSelEvent blk) 
Instance details

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

Associated Types

type Rep (TraceInitChainSelEvent blk) ∷ TypeType Source #

Generic (TraceIteratorEvent blk) 
Instance details

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

Associated Types

type Rep (TraceIteratorEvent blk) ∷ TypeType Source #

Generic (TraceOpenEvent blk) 
Instance details

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

Associated Types

type Rep (TraceOpenEvent blk) ∷ TypeType Source #

Methods

fromTraceOpenEvent blk → Rep (TraceOpenEvent blk) x Source #

toRep (TraceOpenEvent blk) x → TraceOpenEvent blk Source #

Generic (TraceValidationEvent blk) 
Instance details

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

Associated Types

type Rep (TraceValidationEvent blk) ∷ TypeType Source #

Generic (StreamFrom blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep (StreamFrom blk) ∷ TypeType Source #

Methods

fromStreamFrom blk → Rep (StreamFrom blk) x Source #

toRep (StreamFrom blk) x → StreamFrom blk Source #

Generic (StreamTo blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.Common

Associated Types

type Rep (StreamTo blk) ∷ TypeType Source #

Methods

fromStreamTo blk → Rep (StreamTo blk) x Source #

toRep (StreamTo blk) x → StreamTo blk Source #

Generic (ImmutableDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (ImmutableDBError blk) ∷ TypeType Source #

Generic (IteratorResult b) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (IteratorResult b) ∷ TypeType Source #

Generic (MissingBlock blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (MissingBlock blk) ∷ TypeType Source #

Methods

fromMissingBlock blk → Rep (MissingBlock blk) x Source #

toRep (MissingBlock blk) x → MissingBlock blk Source #

Generic (Tip blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

Associated Types

type Rep (Tip blk) ∷ TypeType Source #

Methods

fromTip blk → Rep (Tip blk) x Source #

toRep (Tip blk) x → Tip blk Source #

Generic (Cached blk) 
Instance details

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

Associated Types

type Rep (Cached blk) ∷ TypeType Source #

Methods

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

toRep (Cached blk) x → Cached blk Source #

Generic (CurrentChunkInfo blk) 
Instance details

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

Associated Types

type Rep (CurrentChunkInfo blk) ∷ TypeType Source #

Methods

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

toRep (CurrentChunkInfo blk) x → CurrentChunkInfo blk Source #

Generic (PastChunkInfo blk) 
Instance details

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

Associated Types

type Rep (PastChunkInfo blk) ∷ TypeType Source #

Methods

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

toRep (PastChunkInfo blk) x → PastChunkInfo blk Source #

Generic (Entry blk) 
Instance details

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

Associated Types

type Rep (Entry blk) ∷ TypeType Source #

Methods

fromEntry blk → Rep (Entry blk) x Source #

toRep (Entry blk) x → Entry blk Source #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType Source #

Methods

fromTraceEvent blk → Rep (TraceEvent blk) x Source #

toRep (TraceEvent blk) x → TraceEvent blk Source #

Generic (WithBlockSize a) 
Instance details

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

Associated Types

type Rep (WithBlockSize a) ∷ TypeType Source #

Generic (InitLog blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Init

Associated Types

type Rep (InitLog blk) ∷ TypeType Source #

Methods

fromInitLog blk → Rep (InitLog blk) x Source #

toRep (InitLog blk) x → InitLog blk Source #

Generic (TraceReplayEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Init

Associated Types

type Rep (TraceReplayEvent blk) ∷ TypeType Source #

Generic (Checkpoint l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.LedgerDB

Associated Types

type Rep (Checkpoint l) ∷ TypeType Source #

Methods

fromCheckpoint l → Rep (Checkpoint l) x Source #

toRep (Checkpoint l) x → Checkpoint l Source #

Generic (LedgerDB l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.LedgerDB

Associated Types

type Rep (LedgerDB l) ∷ TypeType Source #

Methods

fromLedgerDB l → Rep (LedgerDB l) x Source #

toRep (LedgerDB l) x → LedgerDB l Source #

Generic (LedgerDbCfg l) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.LedgerDB

Associated Types

type Rep (LedgerDbCfg l) ∷ TypeType Source #

Methods

fromLedgerDbCfg l → Rep (LedgerDbCfg l) x Source #

toRep (LedgerDbCfg l) x → LedgerDbCfg l Source #

Generic (SnapshotFailure blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Snapshots

Associated Types

type Rep (SnapshotFailure blk) ∷ TypeType Source #

Generic (TraceSnapshotEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Snapshots

Associated Types

type Rep (TraceSnapshotEvent blk) ∷ TypeType Source #

Generic (UpdateLedgerDbTraceEvent blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.LedgerDB.Update

Associated Types

type Rep (UpdateLedgerDbTraceEvent blk) ∷ TypeType Source #

Generic (BlockInfo blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.API

Associated Types

type Rep (BlockInfo blk) ∷ TypeType Source #

Methods

fromBlockInfo blk → Rep (BlockInfo blk) x Source #

toRep (BlockInfo blk) x → BlockInfo blk Source #

Generic (FileInfo blk) 
Instance details

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

Associated Types

type Rep (FileInfo blk) ∷ TypeType Source #

Methods

fromFileInfo blk → Rep (FileInfo blk) x Source #

toRep (FileInfo blk) x → FileInfo blk Source #

Generic (Index blk) 
Instance details

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

Associated Types

type Rep (Index blk) ∷ TypeType Source #

Methods

fromIndex blk → Rep (Index blk) x Source #

toRep (Index blk) x → Index blk Source #

Generic (InternalBlockInfo blk) 
Instance details

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

Associated Types

type Rep (InternalBlockInfo blk) ∷ TypeType Source #

Generic (TraceEvent blk) 
Instance details

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

Associated Types

type Rep (TraceEvent blk) ∷ TypeType Source #

Methods

fromTraceEvent blk → Rep (TraceEvent blk) x Source #

toRep (TraceEvent blk) x → TraceEvent blk Source #

Generic (RAWState st) 
Instance details

Defined in Ouroboros.Consensus.Util.MonadSTM.RAWLock

Associated Types

type Rep (RAWState st) ∷ TypeType Source #

Methods

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

toRep (RAWState st) x → RAWState st Source #

Generic (RegistryState m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (RegistryState m) ∷ TypeType Source #

Methods

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

toRep (RegistryState m) x → RegistryState m Source #

Generic (Resource m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (Resource m) ∷ TypeType Source #

Methods

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

toRep (Resource m) x → Resource m Source #

Generic (ResourceKey m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (ResourceKey m) ∷ TypeType Source #

Methods

fromResourceKey m → Rep (ResourceKey m) x Source #

toRep (ResourceKey m) x → ResourceKey m Source #

Generic (ResourceRegistry m) 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Associated Types

type Rep (ResourceRegistry m) ∷ TypeType Source #

Generic (WithFingerprint a) 
Instance details

Defined in Ouroboros.Consensus.Util.STM

Associated Types

type Rep (WithFingerprint a) ∷ TypeType Source #

Generic (TentativeState blk) 
Instance details

Defined in Ouroboros.Consensus.Util.TentativeState

Associated Types

type Rep (TentativeState blk) ∷ TypeType Source #

Methods

fromTentativeState blk → Rep (TentativeState blk) x Source #

toRep (TentativeState blk) x → TentativeState blk Source #

Generic (CompactGenesis c) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Config

Associated Types

type Rep (CompactGenesis c) ∷ TypeType Source #

Generic (ShelleyLedgerConfig era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyLedgerConfig era) ∷ TypeType Source #

Generic (ShelleyLedgerError era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyLedgerError era) ∷ TypeType Source #

Generic (WithTop a) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Mempool

Associated Types

type Rep (WithTop a) ∷ TypeType Source #

Methods

fromWithTop a → Rep (WithTop a) x Source #

toRep (WithTop a) x → WithTop a Source #

Generic (StakeSnapshot crypto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Query

Associated Types

type Rep (StakeSnapshot crypto) ∷ TypeType Source #

Methods

fromStakeSnapshot crypto → Rep (StakeSnapshot crypto) x Source #

toRep (StakeSnapshot crypto) x → StakeSnapshot crypto Source #

Generic (StakeSnapshots crypto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Query

Associated Types

type Rep (StakeSnapshots crypto) ∷ TypeType Source #

Methods

fromStakeSnapshots crypto → Rep (StakeSnapshots crypto) x Source #

toRep (StakeSnapshots crypto) x → StakeSnapshots crypto Source #

Generic (ShelleyHash crypto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Protocol.Abstract

Associated Types

type Rep (ShelleyHash crypto) ∷ TypeType Source #

Methods

fromShelleyHash crypto → Rep (ShelleyHash crypto) x Source #

toRep (ShelleyHash crypto) x → ShelleyHash crypto Source #

Generic (ShelleyPartialLedgerConfig era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.ShelleyHFC

Associated Types

type Rep (ShelleyPartialLedgerConfig era) ∷ TypeType Source #

Generic (KESKey c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep (KESKey c) ∷ TypeType Source #

Methods

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

toRep (KESKey c) x → KESKey c Source #

Generic (KESState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Ledger.HotKey

Associated Types

type Rep (KESState c) ∷ TypeType Source #

Methods

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

toRep (KESState c) x → KESState c Source #

Generic (PraosCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosCannotForge c) ∷ TypeType Source #

Generic (PraosIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosIsLeader c) ∷ TypeType Source #

Generic (PraosState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosState c) ∷ TypeType Source #

Methods

fromPraosState c → Rep (PraosState c) x Source #

toRep (PraosState c) x → PraosState c Source #

Generic (PraosToSign c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosToSign c) ∷ TypeType Source #

Methods

fromPraosToSign c → Rep (PraosToSign c) x Source #

toRep (PraosToSign c) x → PraosToSign c Source #

Generic (PraosValidationErr c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosValidationErr c) ∷ TypeType Source #

Generic (PraosCanBeLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep (PraosCanBeLeader c) ∷ TypeType Source #

Generic (PraosChainSelectView c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Common

Associated Types

type Rep (PraosChainSelectView c) ∷ TypeType Source #

Generic (Header crypto) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Header

Associated Types

type Rep (Header crypto) ∷ TypeType Source #

Methods

fromHeader crypto → Rep (Header crypto) x Source #

toRep (Header crypto) x → Header crypto Source #

Generic (HeaderBody crypto) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Header

Associated Types

type Rep (HeaderBody crypto) ∷ TypeType Source #

Methods

fromHeaderBody crypto → Rep (HeaderBody crypto) x Source #

toRep (HeaderBody crypto) x → HeaderBody crypto Source #

Generic (HeaderRaw crypto) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos.Header

Associated Types

type Rep (HeaderRaw crypto) ∷ TypeType Source #

Methods

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

toRep (HeaderRaw crypto) x → HeaderRaw crypto Source #

Generic (TPraosCannotForge c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosCannotForge c) ∷ TypeType Source #

Generic (TPraosIsLeader c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosIsLeader c) ∷ TypeType Source #

Generic (TPraosState c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosState c) ∷ TypeType Source #

Methods

fromTPraosState c → Rep (TPraosState c) x Source #

toRep (TPraosState c) x → TPraosState c Source #

Generic (TPraosToSign c) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosToSign c) ∷ TypeType Source #

Generic (Anchor block) 
Instance details

Defined in Ouroboros.Network.AnchoredFragment

Associated Types

type Rep (Anchor block) ∷ TypeType Source #

Methods

fromAnchor block → Rep (Anchor block) x Source #

toRep (Anchor block) x → Anchor block Source #

Generic (ConnectionId addr) 
Instance details

Defined in Ouroboros.Network.ConnectionId

Associated Types

type Rep (ConnectionId addr) ∷ TypeType Source #

Methods

fromConnectionId addr → Rep (ConnectionId addr) x Source #

toRep (ConnectionId addr) x → ConnectionId addr Source #

Generic (TestAddress addr) 
Instance details

Defined in Ouroboros.Network.Snocket

Associated Types

type Rep (TestAddress addr) ∷ TypeType Source #

Methods

fromTestAddress addr → Rep (TestAddress addr) x Source #

toRep (TestAddress addr) x → TestAddress addr Source #

Generic (Kind ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Kind ann) ∷ TypeType Source #

Methods

fromKind ann → Rep (Kind ann) x Source #

toRep (Kind ann) x → Kind ann Source #

Generic (Normalized a) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Normalized a) ∷ TypeType Source #

Methods

fromNormalized a → Rep (Normalized a) x Source #

toRep (Normalized a) x → Normalized a Source #

Generic (LR a) 
Instance details

Defined in PlutusCore.Eq

Associated Types

type Rep (LR a) ∷ TypeType Source #

Methods

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

toRep (LR a) x → LR a Source #

Generic (RL a) 
Instance details

Defined in PlutusCore.Eq

Associated Types

type Rep (RL a) ∷ TypeType Source #

Methods

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

toRep (RL a) x → RL a Source #

Generic (UniqueError ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (UniqueError ann) ∷ TypeType Source #

Methods

fromUniqueError ann → Rep (UniqueError ann) x Source #

toRep (UniqueError ann) x → UniqueError ann Source #

Generic (BuiltinCostModelBase f) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

Associated Types

type Rep (BuiltinCostModelBase f) ∷ TypeType Source #

Generic (CostingFun model) 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostingFun.Core

Associated Types

type Rep (CostingFun model) ∷ TypeType Source #

Methods

fromCostingFun model → Rep (CostingFun model) x Source #

toRep (CostingFun model) x → CostingFun model Source #

Generic (MachineError fun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (MachineError fun) ∷ TypeType Source #

Methods

fromMachineError fun → Rep (MachineError fun) x Source #

toRep (MachineError fun) x → MachineError fun Source #

Generic (EvaluationResult a) 
Instance details

Defined in PlutusCore.Evaluation.Result

Associated Types

type Rep (EvaluationResult a) ∷ TypeType Source #

Generic (CekExTally fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep (CekExTally fun) ∷ TypeType Source #

Methods

fromCekExTally fun → Rep (CekExTally fun) x Source #

toRep (CekExTally fun) x → CekExTally fun Source #

Generic (TallyingSt fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.ExBudgetMode

Associated Types

type Rep (TallyingSt fun) ∷ TypeType Source #

Methods

fromTallyingSt fun → Rep (TallyingSt fun) x Source #

toRep (TallyingSt fun) x → TallyingSt fun Source #

Generic (ExBudgetCategory fun) 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.Internal

Associated Types

type Rep (ExBudgetCategory fun) ∷ TypeType Source #

Generic (Extended a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Associated Types

type Rep (Extended a) ∷ TypeType Source #

Methods

fromExtended a → Rep (Extended a) x Source #

toRep (Extended a) x → Extended a Source #

Generic (Interval a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Associated Types

type Rep (Interval a) ∷ TypeType Source #

Methods

fromInterval a → Rep (Interval a) x Source #

toRep (Interval a) x → Interval a Source #

Generic (LowerBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Associated Types

type Rep (LowerBound a) ∷ TypeType Source #

Methods

fromLowerBound a → Rep (LowerBound a) x Source #

toRep (LowerBound a) x → LowerBound a Source #

Generic (UpperBound a) 
Instance details

Defined in PlutusLedgerApi.V1.Interval

Associated Types

type Rep (UpperBound a) ∷ TypeType Source #

Methods

fromUpperBound a → Rep (UpperBound a) x Source #

toRep (UpperBound a) x → UpperBound a Source #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) ∷ TypeType Source #

Methods

fromDoc a → Rep (Doc a) x Source #

toRep (Doc a) x → Doc a Source #

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) ∷ TypeType Source #

Methods

fromDoc ann → Rep (Doc ann) x Source #

toRep (Doc ann) x → Doc ann Source #

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) ∷ TypeType Source #

Generic (Dense currency) 
Instance details

Defined in Money.Internal

Associated Types

type Rep (Dense currency) ∷ TypeType Source #

Methods

fromDense currency → Rep (Dense currency) x Source #

toRep (Dense currency) x → Dense currency Source #

Generic (ClientM a) 
Instance details

Defined in Servant.Client.Internal.HttpClient

Associated Types

type Rep (ClientM a) ∷ TypeType Source #

Methods

fromClientM a → Rep (ClientM a) x Source #

toRep (ClientM a) x → ClientM a Source #

Generic (ResponseF a) 
Instance details

Defined in Servant.Client.Core.Response

Associated Types

type Rep (ResponseF a) ∷ TypeType Source #

Methods

fromResponseF a → Rep (ResponseF a) x Source #

toRep (ResponseF a) x → ResponseF a Source #

Generic (I a) 
Instance details

Defined in Data.SOP.BasicFunctors

Associated Types

type Rep (I a) ∷ TypeType Source #

Methods

fromI a → Rep (I a) x Source #

toRep (I a) x → I a Source #

Generic (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

Associated Types

type Rep (LinearTransform d) ∷ TypeType Source #

Generic (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) ∷ TypeType Source #

Methods

fromMaybe a → Rep (Maybe a) x Source #

toRep (Maybe a) x → Maybe a Source #

Generic (ParamSchema t) 
Instance details

Defined in Data.Swagger.Internal

Associated Types

type Rep (ParamSchema t) ∷ TypeType Source #

Methods

fromParamSchema t → Rep (ParamSchema t) x Source #

toRep (ParamSchema t) x → ParamSchema t Source #

Generic (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep (TyVarBndr flag) ∷ TypeType Source #

Methods

fromTyVarBndr flag → Rep (TyVarBndr flag) x Source #

toRep (TyVarBndr flag) x → TyVarBndr flag Source #

Generic (Window a) 
Instance details

Defined in System.Console.Terminal.Common

Associated Types

type Rep (Window a) ∷ TypeType Source #

Methods

fromWindow a → Rep (Window a) x Source #

toRep (Window a) x → Window a Source #

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep (Doc a) ∷ TypeType Source #

Methods

fromDoc a → Rep (Doc a) x Source #

toRep (Doc a) x → Doc a Source #

Generic (SimpleDoc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Associated Types

type Rep (SimpleDoc a) ∷ TypeType Source #

Methods

fromSimpleDoc a → Rep (SimpleDoc a) x Source #

toRep (SimpleDoc a) x → SimpleDoc a Source #

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) ∷ TypeType Source #

Methods

fromNonEmpty a → Rep (NonEmpty a) x Source #

toRep (NonEmpty a) x → NonEmpty a Source #

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) ∷ TypeType Source #

Methods

fromMaybe a → Rep (Maybe a) x Source #

toRep (Maybe a) x → Maybe a Source #

Generic (a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a) ∷ TypeType Source #

Methods

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

toRep (a) x → (a) Source #

Generic [a] 
Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] ∷ TypeType Source #

Methods

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

toRep [a] x → [a] Source #

(Generic a, GSemigroup (Rep a), GMonoid (Rep a)) ⇒ Monoid (InstantiatedAt Generic a) 
Instance details

Defined in Data.DerivingVia

(Generic a, GSemigroup (Rep a)) ⇒ Semigroup (InstantiatedAt Generic a) 
Instance details

Defined in Data.DerivingVia

Generic (Graph e a) 
Instance details

Defined in Algebra.Graph.Labelled

Associated Types

type Rep (Graph e a) ∷ TypeType Source #

Methods

fromGraph e a → Rep (Graph e a) x Source #

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

Generic (AdjacencyMap e a) 
Instance details

Defined in Algebra.Graph.Labelled.AdjacencyMap

Associated Types

type Rep (AdjacencyMap e a) ∷ TypeType Source #

Methods

fromAdjacencyMap e a → Rep (AdjacencyMap e a) x Source #

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

Generic (Container b a) 
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep (Container b a) ∷ TypeType Source #

Methods

fromContainer b a → Rep (Container b a) x Source #

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

Generic (ErrorContainer b e) 
Instance details

Defined in Barbies.Internal.Containers

Associated Types

type Rep (ErrorContainer b e) ∷ TypeType Source #

Methods

fromErrorContainer b e → Rep (ErrorContainer b e) x Source #

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

Generic (Unit f) 
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep (Unit f) ∷ TypeType Source #

Methods

fromUnit f → Rep (Unit f) x Source #

toRep (Unit f) x → Unit f Source #

Generic (Void f) 
Instance details

Defined in Barbies.Internal.Trivial

Associated Types

type Rep (Void f) ∷ TypeType Source #

Methods

fromVoid f → Rep (Void f) x Source #

toRep (Void f) x → Void f Source #

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) ∷ TypeType Source #

Methods

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

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

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) ∷ TypeType Source #

Methods

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

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

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) ∷ TypeType Source #

Methods

fromProxy t → Rep (Proxy t) x Source #

toRep (Proxy t) x → Proxy t Source #

Generic (Arg a b) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) ∷ TypeType Source #

Methods

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

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

Generic (U1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) ∷ TypeType Source #

Methods

fromU1 p → Rep (U1 p) x Source #

toRep (U1 p) x → U1 p Source #

Generic (V1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) ∷ TypeType Source #

Methods

fromV1 p → Rep (V1 p) x Source #

toRep (V1 p) x → V1 p Source #

Generic (ListN n a) 
Instance details

Defined in Basement.Sized.List

Associated Types

type Rep (ListN n a) ∷ TypeType Source #

Methods

fromListN n a → Rep (ListN n a) x Source #

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

Generic (Bimap a b) 
Instance details

Defined in Data.Bimap

Associated Types

type Rep (Bimap a b) ∷ TypeType Source #

Methods

fromBimap a b → Rep (Bimap a b) x Source #

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

Generic (Index derivationType depth) 
Instance details

Defined in Cardano.Address.Derivation

Associated Types

type Rep (Index derivationType depth) ∷ TypeType Source #

Methods

fromIndex derivationType depth → Rep (Index derivationType depth) x Source #

toRep (Index derivationType depth) x → Index derivationType depth Source #

Generic (Byron depth key) 
Instance details

Defined in Cardano.Address.Style.Byron

Associated Types

type Rep (Byron depth key) ∷ TypeType Source #

Methods

fromByron depth key → Rep (Byron depth key) x Source #

toRep (Byron depth key) x → Byron depth key Source #

Generic (Icarus depth key) 
Instance details

Defined in Cardano.Address.Style.Icarus

Associated Types

type Rep (Icarus depth key) ∷ TypeType Source #

Methods

fromIcarus depth key → Rep (Icarus depth key) x Source #

toRep (Icarus depth key) x → Icarus depth key Source #

Generic (Shelley depth key) 
Instance details

Defined in Cardano.Address.Style.Shelley

Associated Types

type Rep (Shelley depth key) ∷ TypeType Source #

Methods

fromShelley depth key → Rep (Shelley depth key) x Source #

toRep (Shelley depth key) x → Shelley depth key Source #

Generic (MakeChangeCriteria minCoinFor bundleSizeAssessor) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (MakeChangeCriteria minCoinFor bundleSizeAssessor) ∷ TypeType Source #

Methods

fromMakeChangeCriteria minCoinFor bundleSizeAssessor → Rep (MakeChangeCriteria minCoinFor bundleSizeAssessor) x Source #

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

Generic (SelectionParamsOf f ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionParamsOf f ctx) ∷ TypeType Source #

Methods

fromSelectionParamsOf f ctx → Rep (SelectionParamsOf f ctx) x Source #

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

Generic (SelectionResultOf f ctx) 
Instance details

Defined in Cardano.CoinSelection.Balance

Associated Types

type Rep (SelectionResultOf f ctx) ∷ TypeType Source #

Methods

fromSelectionResultOf f ctx → Rep (SelectionResultOf f ctx) x Source #

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

Generic (SignedDSIGN v a) 
Instance details

Defined in Cardano.Crypto.DSIGN.Class

Associated Types

type Rep (SignedDSIGN v a) ∷ TypeType Source #

Methods

fromSignedDSIGN v a → Rep (SignedDSIGN v a) x Source #

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

Generic (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Associated Types

type Rep (Hash h a) ∷ TypeType Source #

Methods

fromHash h a → Rep (Hash h a) x Source #

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

Generic (SignedKES v a) 
Instance details

Defined in Cardano.Crypto.KES.Class

Associated Types

type Rep (SignedKES v a) ∷ TypeType Source #

Methods

fromSignedKES v a → Rep (SignedKES v a) x Source #

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

Generic (CertifiedVRF v a) 
Instance details

Defined in Cardano.Crypto.VRF.Class

Associated Types

type Rep (CertifiedVRF v a) ∷ TypeType Source #

Methods

fromCertifiedVRF v a → Rep (CertifiedVRF v a) x Source #

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

Generic (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

Associated Types

type Rep (AbstractHash algo a) ∷ TypeType Source #

Methods

fromAbstractHash algo a → Rep (AbstractHash algo a) x Source #

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

Generic (ListMap k v) 
Instance details

Defined in Data.ListMap

Associated Types

type Rep (ListMap k v) ∷ TypeType Source #

Methods

fromListMap k v → Rep (ListMap k v) x Source #

toRep (ListMap k v) x → ListMap k v Source #

Generic (AllegraTxBodyRaw ma era) 
Instance details

Defined in Cardano.Ledger.Allegra.TxBody

Associated Types

type Rep (AllegraTxBodyRaw ma era) ∷ TypeType Source #

Methods

fromAllegraTxBodyRaw ma era → Rep (AllegraTxBodyRaw ma era) x Source #

toRep (AllegraTxBodyRaw ma era) x → AllegraTxBodyRaw ma era Source #

Generic (AlonzoPParams f era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Associated Types

type Rep (AlonzoPParams f era) ∷ TypeType Source #

Methods

fromAlonzoPParams f era → Rep (AlonzoPParams f era) x Source #

toRep (AlonzoPParams f era) x → AlonzoPParams f era Source #

Generic (BabbagePParams f era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Associated Types

type Rep (BabbagePParams f era) ∷ TypeType Source #

Methods

fromBabbagePParams f era → Rep (BabbagePParams f era) x Source #

toRep (BabbagePParams f era) x → BabbagePParams f era Source #

Generic (Annotated b a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

Associated Types

type Rep (Annotated b a) ∷ TypeType Source #

Methods

fromAnnotated b a → Rep (Annotated b a) x Source #

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

Generic (BoundedRatio b a) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Associated Types

type Rep (BoundedRatio b a) ∷ TypeType Source #

Methods

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

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

Generic (Block h era) 
Instance details

Defined in Cardano.Ledger.Block

Associated Types

type Rep (Block h era) ∷ TypeType Source #

Methods

fromBlock h era → Rep (Block h era) x Source #

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

Generic (Credential kr c) 
Instance details

Defined in Cardano.Ledger.Credential

Associated Types

type Rep (Credential kr c) ∷ TypeType Source #

Methods

fromCredential kr c → Rep (Credential kr c) x Source #

toRep (Credential kr c) x → Credential kr c Source #

Generic (KeyHash discriminator c) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (KeyHash discriminator c) ∷ TypeType Source #

Methods

fromKeyHash discriminator c → Rep (KeyHash discriminator c) x Source #

toRep (KeyHash discriminator c) x → KeyHash discriminator c Source #

Generic (VKey kd c) 
Instance details

Defined in Cardano.Ledger.Keys

Associated Types

type Rep (VKey kd c) ∷ TypeType Source #

Methods

fromVKey kd c → Rep (VKey kd c) x Source #

toRep (VKey kd c) x → VKey kd c Source #

Generic (WitVKey kr c) 
Instance details

Defined in Cardano.Ledger.Keys.WitVKey

Associated Types

type Rep (WitVKey kr c) ∷ TypeType Source #

Methods

fromWitVKey kr c → Rep (WitVKey kr c) x Source #

toRep (WitVKey kr c) x → WitVKey kr c Source #

Generic (MemoBytes t era) 
Instance details

Defined in Cardano.Ledger.MemoBytes

Associated Types

type Rep (MemoBytes t era) ∷ TypeType Source #

Methods

fromMemoBytes t era → Rep (MemoBytes t era) x Source #

toRep (MemoBytes t era) x → MemoBytes t era Source #

Generic (KeyPair kd c) 
Instance details

Defined in Test.Cardano.Ledger.Core.KeyPair

Associated Types

type Rep (KeyPair kd c) ∷ TypeType Source #

Methods

from ∷ KeyPair kd c → Rep (KeyPair kd c) x Source #

toRep (KeyPair kd c) x → KeyPair kd c Source #

Generic (ShelleyPParams f era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Associated Types

type Rep (ShelleyPParams f era) ∷ TypeType Source #

Methods

fromShelleyPParams f era → Rep (ShelleyPParams f era) x Source #

toRep (ShelleyPParams f era) x → ShelleyPParams f era Source #

Era era ⇒ Generic (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Associated Types

type Rep (WitnessSetHKD Identity era) ∷ TypeType Source #

Generic (SearchResult v a) 
Instance details

Defined in Data.FingerTree.Strict

Associated Types

type Rep (SearchResult v a) ∷ TypeType Source #

Methods

fromSearchResult v a → Rep (SearchResult v a) x Source #

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

Generic (Quantity unit a) 
Instance details

Defined in Data.Quantity

Associated Types

type Rep (Quantity unit a) ∷ TypeType Source #

Methods

fromQuantity unit a → Rep (Quantity unit a) x Source #

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

Generic (FingerTree v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (FingerTree v a) ∷ TypeType Source #

Methods

fromFingerTree v a → Rep (FingerTree v a) x Source #

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

Generic (Node v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (Node v a) ∷ TypeType Source #

Methods

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

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

Generic (SearchResult v a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (SearchResult v a) ∷ TypeType Source #

Methods

fromSearchResult v a → Rep (SearchResult v a) x Source #

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

Generic (ViewL s a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (ViewL s a) ∷ TypeType Source #

Methods

fromViewL s a → Rep (ViewL s a) x Source #

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

Generic (ViewR s a) 
Instance details

Defined in Data.FingerTree

Associated Types

type Rep (ViewR s a) ∷ TypeType Source #

Methods

fromViewR s a → Rep (ViewR s a) x Source #

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

Generic (Tuple2 a b) 
Instance details

Defined in Foundation.Tuple

Associated Types

type Rep (Tuple2 a b) ∷ TypeType Source #

Methods

fromTuple2 a b → Rep (Tuple2 a b) x Source #

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

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) ∷ TypeType Source #

Methods

fromCofree f a → Rep (Cofree f a) x Source #

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

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) ∷ TypeType Source #

Methods

fromFree f a → Rep (Free f a) x Source #

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

Generic (ListT m a) 
Instance details

Defined in ListT

Associated Types

type Rep (ListT m a) ∷ TypeType Source #

Methods

fromListT m a → Rep (ListT m a) x Source #

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

Generic (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseError s e) ∷ TypeType Source #

Methods

fromParseError s e → Rep (ParseError s e) x Source #

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

Generic (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseErrorBundle s e) ∷ TypeType Source #

Generic (State s e) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (State s e) ∷ TypeType Source #

Methods

fromState s e → Rep (State s e) x Source #

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

Generic (FirstToFinish m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (FirstToFinish m a) ∷ TypeType Source #

Methods

fromFirstToFinish m a → Rep (FirstToFinish m a) x Source #

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

Generic (LastToFinish m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (LastToFinish m a) ∷ TypeType Source #

Methods

fromLastToFinish m a → Rep (LastToFinish m a) x Source #

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

Generic (LastToFinishM m a) 
Instance details

Defined in Data.Monoid.Synchronisation

Associated Types

type Rep (LastToFinishM m a) ∷ TypeType Source #

Methods

fromLastToFinishM m a → Rep (LastToFinishM m a) x Source #

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

Generic (WithMuxBearer peerid a) 
Instance details

Defined in Network.Mux.Trace

Associated Types

type Rep (WithMuxBearer peerid a) ∷ TypeType Source #

Methods

fromWithMuxBearer peerid a → Rep (WithMuxBearer peerid a) x Source #

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

Generic (Current f blk) 
Instance details

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

Associated Types

type Rep (Current f blk) ∷ TypeType Source #

Methods

fromCurrent f blk → Rep (Current f blk) x Source #

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

Generic (PBftFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.PBFT

Associated Types

type Rep (PBftFields c toSign) ∷ TypeType Source #

Methods

fromPBftFields c toSign → Rep (PBftFields c toSign) x Source #

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

Generic (LgrDB m blk) 
Instance details

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

Associated Types

type Rep (LgrDB m blk) ∷ TypeType Source #

Methods

fromLgrDB m blk → Rep (LgrDB m blk) x Source #

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

Generic (ChainDbEnv m blk) 
Instance details

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

Associated Types

type Rep (ChainDbEnv m blk) ∷ TypeType Source #

Methods

fromChainDbEnv m blk → Rep (ChainDbEnv m blk) x Source #

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

Generic (ChainDbState m blk) 
Instance details

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

Associated Types

type Rep (ChainDbState m blk) ∷ TypeType Source #

Methods

fromChainDbState m blk → Rep (ChainDbState m blk) x Source #

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

Generic (TraceChunkValidation blk validateTo) 
Instance details

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

Associated Types

type Rep (TraceChunkValidation blk validateTo) ∷ TypeType Source #

Methods

fromTraceChunkValidation blk validateTo → Rep (TraceChunkValidation blk validateTo) x Source #

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

Generic (InternalState blk h) 
Instance details

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

Associated Types

type Rep (InternalState blk h) ∷ TypeType Source #

Methods

fromInternalState blk h → Rep (InternalState blk h) x Source #

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

Generic (OpenState blk h) 
Instance details

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

Associated Types

type Rep (OpenState blk h) ∷ TypeType Source #

Methods

fromOpenState blk h → Rep (OpenState blk h) x Source #

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

Generic (ShelleyTip proto era) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Associated Types

type Rep (ShelleyTip proto era) ∷ TypeType Source #

Methods

fromShelleyTip proto era → Rep (ShelleyTip proto era) x Source #

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

Generic (PraosFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.Praos

Associated Types

type Rep (PraosFields c toSign) ∷ TypeType Source #

Methods

fromPraosFields c toSign → Rep (PraosFields c toSign) x Source #

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

Generic (TPraosFields c toSign) 
Instance details

Defined in Ouroboros.Consensus.Protocol.TPraos

Associated Types

type Rep (TPraosFields c toSign) ∷ TypeType Source #

Methods

fromTPraosFields c toSign → Rep (TPraosFields c toSign) x Source #

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

Generic (ServerState txid tx) 
Instance details

Defined in Ouroboros.Network.TxSubmission.Inbound

Associated Types

type Rep (ServerState txid tx) ∷ TypeType Source #

Methods

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

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

Generic (ChainHash b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (ChainHash b) ∷ TypeType Source #

Methods

fromChainHash b → Rep (ChainHash b) x Source #

toRep (ChainHash b) x → ChainHash b Source #

Generic (HeaderFields b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (HeaderFields b) ∷ TypeType Source #

Generic (Point block) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (Point block) ∷ TypeType Source #

Methods

fromPoint block → Rep (Point block) x Source #

toRep (Point block) x → Point block Source #

Generic (Tip b) 
Instance details

Defined in Ouroboros.Network.Block

Associated Types

type Rep (Tip b) ∷ TypeType Source #

Methods

fromTip b → Rep (Tip b) x Source #

toRep (Tip b) x → Tip b Source #

Generic (Block slot hash) 
Instance details

Defined in Ouroboros.Network.Point

Associated Types

type Rep (Block slot hash) ∷ TypeType Source #

Methods

fromBlock slot hash → Rep (Block slot hash) x Source #

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

Generic (TyVarDecl tyname ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (TyVarDecl tyname ann) ∷ TypeType Source #

Methods

fromTyVarDecl tyname ann → Rep (TyVarDecl tyname ann) x Source #

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

Generic (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (ErrorWithCause err cause) ∷ TypeType Source #

Methods

fromErrorWithCause err cause → Rep (ErrorWithCause err cause) x Source #

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

Generic (EvaluationError user internal) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

Associated Types

type Rep (EvaluationError user internal) ∷ TypeType Source #

Methods

fromEvaluationError user internal → Rep (EvaluationError user internal) x Source #

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

Generic (Def var val) 
Instance details

Defined in PlutusCore.MkPlc

Associated Types

type Rep (Def var val) ∷ TypeType Source #

Methods

fromDef var val → Rep (Def var val) x Source #

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

Generic (UVarDecl name ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

type Rep (UVarDecl name ann) ∷ TypeType Source #

Methods

fromUVarDecl name ann → Rep (UVarDecl name ann) x Source #

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

Generic (TypeErrorExt uni ann) 
Instance details

Defined in PlutusIR.Error

Associated Types

type Rep (TypeErrorExt uni ann) ∷ TypeType Source #

Methods

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

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

Generic (Map k v) 
Instance details

Defined in PlutusTx.AssocMap

Associated Types

type Rep (Map k v) ∷ TypeType Source #

Methods

fromMap k v → Rep (Map k v) x Source #

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

Generic (ListF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (ListF a b) ∷ TypeType Source #

Methods

fromListF a b → Rep (ListF a b) x Source #

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

Generic (NonEmptyF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (NonEmptyF a b) ∷ TypeType Source #

Methods

fromNonEmptyF a b → Rep (NonEmptyF a b) x Source #

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

Generic (TreeF a b) 
Instance details

Defined in Data.Functor.Base

Associated Types

type Rep (TreeF a b) ∷ TypeType Source #

Methods

fromTreeF a b → Rep (TreeF a b) x Source #

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

GoodScale scale ⇒ Generic (Discrete' currency scale) 
Instance details

Defined in Money.Internal

Associated Types

type Rep (Discrete' currency scale) ∷ TypeType Source #

Methods

fromDiscrete' currency scale → Rep (Discrete' currency scale) x Source #

toRep (Discrete' currency scale) x → Discrete' currency scale Source #

Generic (ExchangeRate src dst) 
Instance details

Defined in Money.Internal

Associated Types

type Rep (ExchangeRate src dst) ∷ TypeType Source #

Methods

fromExchangeRate src dst → Rep (ExchangeRate src dst) x Source #

toRep (ExchangeRate src dst) x → ExchangeRate src dst Source #

Generic (NoContentVerb method) 
Instance details

Defined in Servant.API.Verbs

Associated Types

type Rep (NoContentVerb method) ∷ TypeType Source #

Methods

fromNoContentVerb method → Rep (NoContentVerb method) x Source #

toRep (NoContentVerb method) x → NoContentVerb method Source #

Generic (RequestF body path) 
Instance details

Defined in Servant.Client.Core.Request

Associated Types

type Rep (RequestF body path) ∷ TypeType Source #

Methods

fromRequestF body path → Rep (RequestF body path) x Source #

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

Generic (Of a b) 
Instance details

Defined in Data.Functor.Of

Associated Types

type Rep (Of a b) ∷ TypeType Source #

Methods

fromOf a b → Rep (Of a b) x Source #

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

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) ∷ TypeType Source #

Methods

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

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

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) ∷ TypeType Source #

Methods

fromThese a b → Rep (These a b) x Source #

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

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) ∷ TypeType Source #

Methods

fromPair a b → Rep (Pair a b) x Source #

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

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) ∷ TypeType Source #

Methods

fromThese a b → Rep (These a b) x Source #

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

Generic (Validation e a) 
Instance details

Defined in Validation

Associated Types

type Rep (Validation e a) ∷ TypeType Source #

Methods

fromValidation e a → Rep (Validation e a) x Source #

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

Generic (a, b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) ∷ TypeType Source #

Methods

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

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

(Eq a, Generic a, GBoundedMeasure (Rep a), GMeasure (Rep a)) ⇒ BoundedMeasure (InstantiatedAt Generic a) 
Instance details

Defined in Data.Measure.Class

(Eq a, Generic a, GMeasure (Rep a)) ⇒ Measure (InstantiatedAt Generic a) 
Instance details

Defined in Data.Measure.Class

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) ∷ TypeType Source #

Methods

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

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

Generic (Kleisli m a b) 
Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) ∷ TypeType Source #

Methods

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

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

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) ∷ TypeType Source #

Methods

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

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

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) ∷ TypeType Source #

Methods

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

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

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) ∷ TypeType Source #

Methods

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

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

Generic (Rec1 f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) ∷ TypeType Source #

Methods

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

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

Generic (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) ∷ TypeType Source #

Methods

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

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

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) ∷ TypeType Source #

Methods

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

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

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) ∷ TypeType Source #

Methods

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

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

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) ∷ TypeType Source #

Methods

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

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

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) ∷ TypeType Source #

Methods

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

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

Generic (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Associated Types

type Rep (Fix p a) ∷ TypeType Source #

Methods

fromFix p a → Rep (Fix p a) x Source #

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

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) ∷ TypeType Source #

Methods

fromJoin p a → Rep (Join p a) x Source #

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

Generic (Tuple3 a b c) 
Instance details

Defined in Foundation.Tuple

Associated Types

type Rep (Tuple3 a b c) ∷ TypeType Source #

Methods

fromTuple3 a b c → Rep (Tuple3 a b c) x Source #

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

Generic (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Associated Types

type Rep (CofreeF f a b) ∷ TypeType Source #

Methods

fromCofreeF f a b → Rep (CofreeF f a b) x Source #

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

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) ∷ TypeType Source #

Methods

fromFreeF f a b → Rep (FreeF f a b) x Source #

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

Generic (WithBlockNo f a) 
Instance details

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

Associated Types

type Rep (WithBlockNo f a) ∷ TypeType Source #

Methods

fromWithBlockNo f a → Rep (WithBlockNo f a) x Source #

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

Generic (IteratorState m blk b) 
Instance details

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

Associated Types

type Rep (IteratorState m blk b) ∷ TypeType Source #

Methods

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

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

Generic (FollowerState m blk b) 
Instance details

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

Associated Types

type Rep (FollowerState m blk b) ∷ TypeType Source #

Methods

fromFollowerState m blk b → Rep (FollowerState m blk b) x Source #

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

Generic (IteratorState m blk h) 
Instance details

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

Associated Types

type Rep (IteratorState m blk h) ∷ TypeType Source #

Methods

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

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

Generic (IteratorStateOrExhausted m hash h) 
Instance details

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

Associated Types

type Rep (IteratorStateOrExhausted m hash h) ∷ TypeType Source #

Methods

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

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

Generic (InternalState m blk h) 
Instance details

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

Associated Types

type Rep (InternalState m blk h) ∷ TypeType Source #

Methods

fromInternalState m blk h → Rep (InternalState m blk h) x Source #

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

Generic (OpenState m blk h) 
Instance details

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

Associated Types

type Rep (OpenState m blk h) ∷ TypeType Source #

Methods

fromOpenState m blk h → Rep (OpenState m blk h) x Source #

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

Generic (AnchoredSeq v a b) 
Instance details

Defined in Ouroboros.Network.AnchoredSeq

Associated Types

type Rep (AnchoredSeq v a b) ∷ TypeType Source #

Methods

fromAnchoredSeq v a b → Rep (AnchoredSeq v a b) x Source #

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

Generic (MeasuredWith v a b) 
Instance details

Defined in Ouroboros.Network.AnchoredSeq

Associated Types

type Rep (MeasuredWith v a b) ∷ TypeType Source #

Methods

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

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

Generic (TyDecl tyname uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (TyDecl tyname uni ann) ∷ TypeType Source #

Methods

fromTyDecl tyname uni ann → Rep (TyDecl tyname uni ann) x Source #

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

Generic (Type tyname uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (Type tyname uni ann) ∷ TypeType Source #

Methods

fromType tyname uni ann → Rep (Type tyname uni ann) x Source #

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

Generic (Error uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

type Rep (Error uni fun ann) ∷ TypeType Source #

Methods

fromError uni fun ann → Rep (Error uni fun ann) x Source #

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

Generic (MachineParameters machinecosts fun val) 
Instance details

Defined in PlutusCore.Evaluation.Machine.MachineParameters

Associated Types

type Rep (MachineParameters machinecosts fun val) ∷ TypeType Source #

Methods

fromMachineParameters machinecosts fun val → Rep (MachineParameters machinecosts fun val) x Source #

toRep (MachineParameters machinecosts fun val) x → MachineParameters machinecosts fun val Source #

Generic (K a b) 
Instance details

Defined in Data.SOP.BasicFunctors

Associated Types

type Rep (K a b) ∷ TypeType Source #

Methods

fromK a b → Rep (K a b) x Source #

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

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) ∷ TypeType Source #

Methods

fromTagged s b → Rep (Tagged s b) x Source #

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

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) ∷ TypeType Source #

Methods

fromThese1 f g a → Rep (These1 f g a) x Source #

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

Generic (KVVector kv vv a) 
Instance details

Defined in Data.VMap.KVVector

Associated Types

type Rep (KVVector kv vv a) ∷ TypeType Source #

Methods

fromKVVector kv vv a → Rep (KVVector kv vv a) x Source #

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

Generic (a, b, c) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (Product f g a) 
Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) ∷ TypeType Source #

Methods

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

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

Generic (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) ∷ TypeType Source #

Methods

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

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

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

Defined in GHC.Generics

Associated Types

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

Methods

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

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

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

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (K1 i c p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) ∷ TypeType Source #

Methods

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

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

Generic (Tuple4 a b c d) 
Instance details

Defined in Foundation.Tuple

Associated Types

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

Methods

fromTuple4 a b c d → Rep (Tuple4 a b c d) x Source #

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

Generic (Product2 f g x y) 
Instance details

Defined in Data.SOP.Functors

Associated Types

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

Methods

fromProduct2 f g x y → Rep (Product2 f g x y) x0 Source #

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

Generic (VarDecl tyname name uni ann) 
Instance details

Defined in PlutusCore.Core.Type

Associated Types

type Rep (VarDecl tyname name uni ann) ∷ TypeType Source #

Methods

fromVarDecl tyname name uni ann → Rep (VarDecl tyname name uni ann) x Source #

toRep (VarDecl tyname name uni ann) x → VarDecl tyname name uni ann Source #

Generic (TypeError term uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

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

Methods

fromTypeError term uni fun ann → Rep (TypeError term uni fun ann) x Source #

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

Generic (Program name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

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

Methods

fromProgram name uni fun ann → Rep (Program name uni fun ann) x Source #

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

Generic (Term name uni fun ann) 
Instance details

Defined in UntypedPlutusCore.Core.Type

Associated Types

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

Methods

fromTerm name uni fun ann → Rep (Term name uni fun ann) x Source #

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

Generic (Subst name uni fun a) 
Instance details

Defined in UntypedPlutusCore.Transform.Inline

Associated Types

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

Methods

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

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

Generic (Datatype tyname name uni a) 
Instance details

Defined in PlutusIR.Core.Type

Associated Types

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

Methods

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

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

Generic (StreamBody' mods framing contentType a) 
Instance details

Defined in Servant.API.Stream

Associated Types

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

Methods

fromStreamBody' mods framing contentType a → Rep (StreamBody' mods framing contentType a) x Source #

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

Generic (VMap kv vv k v) 
Instance details

Defined in Data.VMap

Associated Types

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

Methods

fromVMap kv vv k v → Rep (VMap kv vv k v) x Source #

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

Generic (a, b, c, d) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) ∷ TypeType Source #

Methods

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

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

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

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (M1 i c f p) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) ∷ TypeType Source #

Methods

fromClown f a b → Rep (Clown f a b) x Source #

toRep (Clown f a b) x → Clown f a b Source #

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) ∷ TypeType Source #

Methods

fromFlip p a b → Rep (Flip p a b) x Source #

toRep (Flip p a b) x → Flip p a b Source #

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) ∷ TypeType Source #

Methods

fromJoker g a b → Rep (Joker g a b) x Source #

toRep (Joker g a b) x → Joker g a b Source #

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) ∷ TypeType Source #

Methods

fromWrappedBifunctor p a b → Rep (WrappedBifunctor p a b) x Source #

toRep (WrappedBifunctor p a b) x → WrappedBifunctor p a b Source #

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

Methods

fromProgram tyname name uni fun ann → Rep (Program tyname name uni fun ann) x Source #

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

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

Methods

fromTerm tyname name uni fun ann → Rep (Term tyname name uni fun ann) x Source #

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

Generic (NormCheckError tyname name uni fun ann) 
Instance details

Defined in PlutusCore.Error

Associated Types

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

Methods

fromNormCheckError tyname name uni fun ann → Rep (NormCheckError tyname name uni fun ann) x Source #

toRep (NormCheckError tyname name uni fun ann) x → NormCheckError tyname name uni fun ann Source #

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

Methods

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

toRep (Binding tyname name uni fun a) x → Binding tyname name uni fun a Source #

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

Methods

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

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

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

Methods

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

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

Generic (InlinerContext tyname name uni fun ann) 
Instance details

Defined in PlutusIR.Transform.Inline.Utils

Associated Types

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

Methods

from ∷ InlinerContext tyname name uni fun ann → Rep (InlinerContext tyname name uni fun ann) x Source #

toRep (InlinerContext tyname name uni fun ann) x → InlinerContext tyname name uni fun ann Source #

Generic (BindingGrp tyname name uni fun a) 
Instance details

Defined in PlutusIR.Transform.LetFloatOut

Associated Types

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

Methods

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

toRep (BindingGrp tyname name uni fun a) x → BindingGrp tyname name uni fun a Source #

Generic (Verb method statusCode contentTypes a) 
Instance details

Defined in Servant.API.Verbs

Associated Types

type Rep (Verb method statusCode contentTypes a) ∷ TypeType Source #

Methods

fromVerb method statusCode contentTypes a → Rep (Verb method statusCode contentTypes a) x Source #

toRep (Verb method statusCode contentTypes a) x → Verb method statusCode contentTypes a Source #

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

Defined in Data.SOP.BasicFunctors

Associated Types

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

Methods

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

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

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

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) ∷ TypeType Source #

Methods

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

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

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) ∷ TypeType Source #

Methods

fromSum p q a b → Rep (Sum p q a b) x Source #

toRep (Sum p q a b) x → Sum p q a b Source #

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

Methods

fromStream method status framing contentType a → Rep (Stream method status framing contentType a) x Source #

toRep (Stream method status framing contentType a) x → Stream method status framing contentType a Source #

Generic (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) ∷ TypeType Source #

Methods

fromTannen f p a b → Rep (Tannen f p a b) x Source #

toRep (Tannen f p a b) x → Tannen f p a b Source #

Generic (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

Associated Types

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

Methods

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

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

Generic (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h) → Rep (a, b, c, d, e, f, g, h) x Source #

toRep (a, b, c, d, e, f, g, h) x → (a, b, c, d, e, f, g, h) Source #

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

Methods

fromBiff p f g a b → Rep (Biff p f g a b) x Source #

toRep (Biff p f g a b) x → Biff p f g a b Source #

Generic (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i) → Rep (a, b, c, d, e, f, g, h, i) x Source #

toRep (a, b, c, d, e, f, g, h, i) x → (a, b, c, d, e, f, g, h, i) Source #

Generic (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j) → Rep (a, b, c, d, e, f, g, h, i, j) x Source #

toRep (a, b, c, d, e, f, g, h, i, j) x → (a, b, c, d, e, f, g, h, i, j) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j, k) → Rep (a, b, c, d, e, f, g, h, i, j, k) x Source #

toRep (a, b, c, d, e, f, g, h, i, j, k) x → (a, b, c, d, e, f, g, h, i, j, k) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Rep (a, b, c, d, e, f, g, h, i, j, k, l) x Source #

toRep (a, b, c, d, e, f, g, h, i, j, k, l) x → (a, b, c, d, e, f, g, h, i, j, k, l) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x Source #

toRep (a, b, c, d, e, f, g, h, i, j, k, l, m) x → (a, b, c, d, e, f, g, h, i, j, k, l, m) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x Source #

toRep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x → (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source #

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) ∷ TypeType Source #

Methods

from ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x Source #

toRep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x → (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source #

data Natural Source #

Natural number

Invariant: numbers <= 0xffffffffffffffff use the NS constructor

Instances

Instances details
FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Natural

Since: base-4.8.0.0

Instance details

Defined in Data.Data

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Natural → c Natural Source #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c Natural Source #

toConstrNaturalConstr Source #

dataTypeOfNaturalDataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c Natural) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c Natural) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → NaturalNatural Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Natural → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Natural → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Natural → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Natural → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Natural → m Natural Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Natural → m Natural Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Natural → m Natural Source #

Bits Natural

Since: base-4.8.0

Instance details

Defined in GHC.Bits

Enum Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Enum

Ix Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Ix

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

Read Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Read

Integral Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Real Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Real

Show Natural

Since: base-4.8.0.0

Instance details

Defined in GHC.Show

PrintfArg Natural

Since: base-4.8.0.0

Instance details

Defined in Text.Printf

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural Source #

FromCBOR Natural 
Instance details

Defined in Cardano.Binary.FromCBOR

ToCBOR Natural 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORNaturalEncoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy NaturalSize Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Natural] → Size Source #

DecCBOR Natural 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.DecCBOR

EncCBOR Natural 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

Methods

encCBORNaturalEncoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy NaturalSize Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Natural] → Size Source #

FromField Natural

Accepts an unsigned decimal number. Ignores whitespace.

Since: cassava-0.5.1.0

Instance details

Defined in Data.Csv.Conversion

ToField Natural

Uses decimal encoding.

Since: cassava-0.5.1.0

Instance details

Defined in Data.Csv.Conversion

Methods

toFieldNaturalField Source #

NFData Natural

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfNatural → () Source #

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

(==)NaturalNaturalBool Source #

(/=)NaturalNaturalBool Source #

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntNaturalInt Source #

hashNaturalInt Source #

FromFormKey Natural 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Natural 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyNaturalText Source #

FromHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

Measure Natural 
Instance details

Defined in Data.Measure.Class

NoThunks Natural 
Instance details

Defined in NoThunks.Class

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyNaturalDoc ann Source #

prettyList ∷ [Natural] → Doc ann Source #

UniformRange Natural 
Instance details

Defined in System.Random.Internal

Methods

uniformRMStatefulGen g m ⇒ (Natural, Natural) → g → m Natural Source #

Corecursive Natural 
Instance details

Defined in Data.Functor.Foldable

Methods

embedBase Natural NaturalNatural Source #

ana ∷ (a → Base Natural a) → a → Natural Source #

apo ∷ (a → Base Natural (Either Natural a)) → a → Natural Source #

postproRecursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (a → Base Natural a) → a → Natural Source #

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

Recursive Natural 
Instance details

Defined in Data.Functor.Foldable

Methods

projectNaturalBase Natural Natural Source #

cata ∷ (Base Natural a → a) → Natural → a Source #

para ∷ (Base Natural (Natural, a) → a) → Natural → a Source #

gpara ∷ (Corecursive Natural, Comonad w) ⇒ (∀ b. Base Natural (w b) → w (Base Natural b)) → (Base Natural (EnvT Natural w a) → a) → Natural → a Source #

preproCorecursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (Base Natural a → a) → Natural → a Source #

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

Serialise Natural

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

ToParamSchema Natural 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

ToSchema Natural 
Instance details

Defined in Data.Swagger.Internal.Schema

FromText Natural 
Instance details

Defined in Data.Text.Class

ToText Natural 
Instance details

Defined in Data.Text.Class

Methods

toTextNaturalText Source #

Pretty Natural 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

prettyNaturalDoc b Source #

prettyList ∷ [Natural] → Doc b Source #

KnownNat n ⇒ HasResolution (n ∷ Nat)

For example, Fixed 1000 will give you a Fixed with a resolution of 1000.

Instance details

Defined in Data.Fixed

Methods

resolution ∷ p n → Integer Source #

DefaultPrettyBy config Natural 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → NaturalDoc ann Source #

defaultPrettyListBy ∷ config → [Natural] → Doc ann Source #

PrettyDefaultBy config NaturalPrettyBy config Natural
>>> prettyBy () (123 :: Natural)
123
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → NaturalDoc ann Source #

prettyListBy ∷ config → [Natural] → Doc ann Source #

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftQuote m ⇒ Natural → m Exp Source #

liftTyped ∷ ∀ (m ∷ TypeType). Quote m ⇒ NaturalCode m Natural Source #

KnownNat n ⇒ Reifies (n ∷ Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect ∷ proxy n → Integer Source #

NatVals ('[] ∷ [Nat]) 
Instance details

Defined in Cardano.Mnemonic

Methods

natValsProxy '[] → [Integer] Source #

Buildable (Range Natural) 
Instance details

Defined in Cardano.Binary.ToCBOR

Buildable (Range Natural) 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

PositiveMonoid (Product Natural) 
Instance details

Defined in Data.Monoid.Null

PositiveMonoid (Sum Natural) 
Instance details

Defined in Data.Monoid.Null

(n ~ EntropySize mw, csz ~ CheckSumBits n, ConsistentEntropy n mw csz) ⇒ MkSomeMnemonic '[mw] 
Instance details

Defined in Cardano.Mnemonic

(n ~ EntropySize mw, csz ~ CheckSumBits n, ConsistentEntropy n mw csz, MkSomeMnemonic rest, NatVals rest) ⇒ MkSomeMnemonic (mw ': rest) 
Instance details

Defined in Cardano.Mnemonic

(KnownNat n, NatVals rest) ⇒ NatVals (n ': rest) 
Instance details

Defined in Cardano.Mnemonic

Methods

natValsProxy (n ': rest) → [Integer] Source #

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type IntBaseType Natural 
Instance details

Defined in Data.IntCast

type Base Natural 
Instance details

Defined in Data.Functor.Foldable

type Compare (a ∷ Natural) (b ∷ Natural) 
Instance details

Defined in Data.Type.Ord

type Compare (a ∷ Natural) (b ∷ Natural) = CmpNat a b

type Type = TYPE LiftedRep Source #

The kind of types with lifted values. For example Int :: Type.

data Constraint Source #

The kind of constraints, like Show a

data CallStack Source #

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>:... in interactive:Ghci...

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

Show CallStack

Since: base-4.9.0.0

Instance details

Defined in GHC.Show

NFData CallStack

Since: deepseq-1.4.2.0

Instance details

Defined in Control.DeepSeq

Methods

rnfCallStack → () Source #

NoThunks CallStack

Since CallStacks can't retain application data, we don't want to check them for thunks at all

Instance details

Defined in NoThunks.Class

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

forM_ ∷ (Foldable t, Monad m) ⇒ t a → (a → m b) → m () Source #

forM_ is mapM_ with its arguments flipped. For a version that doesn't ignore the results see forM.

forM_ is just like for_, but specialised to monadic actions.

data Set a Source #

A set of values a.

Instances

Instances details
ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Set a → Value Source #

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Set a] → Value Source #

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Set a → Encoding Source #

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Set a] → Encoding Source #

Foldable Set

Folds in order of increasing key.

Instance details

Defined in Data.Set.Internal

Methods

foldMonoid m ⇒ Set m → m Source #

foldMapMonoid m ⇒ (a → m) → Set a → m Source #

foldMap'Monoid m ⇒ (a → m) → Set a → m Source #

foldr ∷ (a → b → b) → b → Set a → b Source #

foldr' ∷ (a → b → b) → b → Set a → b Source #

foldl ∷ (b → a → b) → b → Set a → b Source #

foldl' ∷ (b → a → b) → b → Set a → b Source #

foldr1 ∷ (a → a → a) → Set a → a Source #

foldl1 ∷ (a → a → a) → Set a → a Source #

toListSet a → [a] Source #

nullSet a → Bool Source #

lengthSet a → Int Source #

elemEq a ⇒ a → Set a → Bool Source #

maximumOrd a ⇒ Set a → a Source #

minimumOrd a ⇒ Set a → a Source #

sumNum a ⇒ Set a → a Source #

productNum a ⇒ Set a → a Source #

Eq1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftEq ∷ (a → b → Bool) → Set a → Set b → Bool Source #

Ord1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftCompare ∷ (a → b → Ordering) → Set a → Set b → Ordering Source #

Show1 Set

Since: containers-0.5.9

Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntSet a → ShowS Source #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Set a] → ShowS Source #

Hashable1 Set

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntSet a → Int Source #

Ord k ⇒ Indexable k (Set k) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

indexOf ∷ k → Set k → StrictMaybe Word64 Source #

fromIndexWord64Set k → StrictMaybe k Source #

Structured k ⇒ Structured (Set k) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structureProxy (Set k) → Structure Source #

structureHash' ∷ Tagged (Set k) MD5

(Ord a, FromJSON a) ⇒ FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a ⇒ ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(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) Source #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Set a) Source #

toConstrSet a → Constr Source #

dataTypeOfSet a → DataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Set a)) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Set a)) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Set a → Set a Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Set a → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Set a → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) Source #

Ord a ⇒ Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

memptySet a Source #

mappendSet a → Set a → Set a Source #

mconcat ∷ [Set a] → Set a Source #

Ord a ⇒ Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>)Set a → Set a → Set a Source #

sconcatNonEmpty (Set a) → Set a Source #

stimesIntegral b ⇒ b → Set a → Set a Source #

Ord a ⇒ IsList (Set a)

Since: containers-0.5.6.2

Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) Source #

Methods

fromList ∷ [Item (Set a)] → Set a Source #

fromListNInt → [Item (Set a)] → Set a Source #

toListSet a → [Item (Set a)] Source #

(Read a, Ord a) ⇒ Read (Set a) 
Instance details

Defined in Data.Set.Internal

Show a ⇒ Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrecIntSet a → ShowS Source #

showSet a → String Source #

showList ∷ [Set a] → ShowS Source #

(Ord a, FromCBOR a) ⇒ FromCBOR (Set a) 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBORDecoder s (Set a) Source #

labelProxy (Set a) → Text Source #

(Ord a, ToCBOR a) ⇒ ToCBOR (Set a) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORSet a → Encoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Set a) → Size Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Set a] → Size Source #

(Ord a, DecCBOR a) ⇒ DecCBOR (Set a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.DecCBOR

Methods

decCBORDecoder s (Set a) Source #

dropCBORProxy (Set a) → Decoder s () Source #

labelProxy (Set a) → Text Source #

(Ord a, EncCBOR a) ⇒ EncCBOR (Set a) 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

Methods

encCBORSet a → Encoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy (Set a) → Size Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Set a] → Size Source #

NFData a ⇒ NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnfSet a → () Source #

Eq a ⇒ Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==)Set a → Set a → Bool Source #

(/=)Set a → Set a → Bool Source #

Ord a ⇒ Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compareSet a → Set a → Ordering Source #

(<)Set a → Set a → Bool Source #

(<=)Set a → Set a → Bool Source #

(>)Set a → Set a → Bool Source #

(>=)Set a → Set a → Bool Source #

maxSet a → Set a → Set a Source #

minSet a → Set a → Set a Source #

Hashable v ⇒ Hashable (Set v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntSet v → Int Source #

hashSet v → Int Source #

Ord k ⇒ At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

atIndex (Set k) → Lens' (Set k) (Maybe (IxValue (Set k))) Source #

Ord a ⇒ Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

containsIndex (Set a) → Lens' (Set a) Bool Source #

Ord k ⇒ Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ixIndex (Set k) → Traversal' (Set k) (IxValue (Set k)) Source #

Ord a ⇒ Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a) Source #

Methods

_Wrapped'Iso' (Set a) (Unwrapped (Set a)) Source #

Ord element ⇒ IsSet (Set element) 
Instance details

Defined in Data.Containers

Methods

insertSetElement (Set element) → Set element → Set element Source #

deleteSetElement (Set element) → Set element → Set element Source #

singletonSetElement (Set element) → Set element Source #

setFromList ∷ [Element (Set element)] → Set element Source #

setToListSet element → [Element (Set element)] Source #

filterSet ∷ (Element (Set element) → Bool) → Set element → Set element Source #

Ord element ⇒ SetContainer (Set element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Set element) Source #

Methods

memberContainerKey (Set element) → Set element → Bool Source #

notMemberContainerKey (Set element) → Set element → Bool Source #

unionSet element → Set element → Set element Source #

unions ∷ (MonoFoldable mono, Element mono ~ Set element) ⇒ mono → Set element Source #

differenceSet element → Set element → Set element Source #

intersectionSet element → Set element → Set element Source #

keysSet element → [ContainerKey (Set element)] Source #

Ord v ⇒ GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

Ord e ⇒ MonoFoldable (Set e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Set e) → m) → Set e → m Source #

ofoldr ∷ (Element (Set e) → b → b) → b → Set e → b Source #

ofoldl' ∷ (a → Element (Set e) → a) → a → Set e → a Source #

otoListSet e → [Element (Set e)] Source #

oall ∷ (Element (Set e) → Bool) → Set e → Bool Source #

oany ∷ (Element (Set e) → Bool) → Set e → Bool Source #

onullSet e → Bool Source #

olengthSet e → Int Source #

olength64Set e → Int64 Source #

ocompareLengthIntegral i ⇒ Set e → i → Ordering Source #

otraverse_Applicative f ⇒ (Element (Set e) → f b) → Set e → f () Source #

ofor_Applicative f ⇒ Set e → (Element (Set e) → f b) → f () Source #

omapM_Applicative m ⇒ (Element (Set e) → m ()) → Set e → m () Source #

oforM_Applicative m ⇒ Set e → (Element (Set e) → m ()) → m () Source #

ofoldlMMonad m ⇒ (a → Element (Set e) → m a) → a → Set e → m a Source #

ofoldMap1ExSemigroup m ⇒ (Element (Set e) → m) → Set e → m Source #

ofoldr1Ex ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e) Source #

ofoldl1Ex' ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e) Source #

headExSet e → Element (Set e) Source #

lastExSet e → Element (Set e) Source #

unsafeHeadSet e → Element (Set e) Source #

unsafeLastSet e → Element (Set e) Source #

maximumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e) Source #

minimumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e) Source #

oelemElement (Set e) → Set e → Bool Source #

onotElemElement (Set e) → Set e → Bool Source #

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opointElement (Set a) → Set a Source #

Ord a ⇒ MonoidNull (Set a) 
Instance details

Defined in Data.Monoid.Null

Methods

nullSet a → Bool Source #

Ord a ⇒ PositiveMonoid (Set a) 
Instance details

Defined in Data.Monoid.Null

NoThunks a ⇒ NoThunks (Set a) 
Instance details

Defined in NoThunks.Class

Ord k ⇒ At (Set k) 
Instance details

Defined in Optics.At.Core

Methods

atIndex (Set k) → Lens' (Set k) (Maybe (IxValue (Set k))) Source #

Ord a ⇒ Contains (Set a) 
Instance details

Defined in Optics.At.Core

Methods

containsIndex (Set a) → Lens' (Set a) Bool Source #

Ord k ⇒ Ixed (Set k) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Set k) Source #

Methods

ixIndex (Set k) → Optic' (IxKind (Set k)) NoIx (Set k) (IxValue (Set k)) Source #

(Ord a, Serialise a) ⇒ Serialise (Set a)

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

ToParamSchema a ⇒ ToParamSchema (Set a) 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Set a) → ParamSchema t Source #

ToSchema a ⇒ ToSchema (Set a) 
Instance details

Defined in Data.Swagger.Internal.Schema

(t ~ Set a', Ord a) ⇒ Rewrapped (Set a) t

Use wrapping fromList. unwrapping returns a sorted list.

Instance details

Defined in Control.Lens.Wrapped

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
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 ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type Index (Set a) 
Instance details

Defined in Optics.At.Core

type Index (Set a) = a
type IxKind (Set k) 
Instance details

Defined in Optics.At.Core

type IxValue (Set k) 
Instance details

Defined in Optics.At.Core

type IxValue (Set k) = ()

data Map k a Source #

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

bifoldMapMonoid m ⇒ (a → m) → (b → m) → Map a b → m Source #

bifoldr ∷ (a → c → c) → (b → c → c) → c → Map a b → c Source #

bifoldl ∷ (c → a → c) → (c → b → c) → c → Map a b → c Source #

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

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

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

liftShowList2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → [Map a b] → ShowS Source #

Hashable2 Map

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 ∷ (Int → a → Int) → (Int → b → Int) → IntMap a b → Int Source #

BiPolyMap Map 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint Map key Source #

Methods

mapKeysWith ∷ (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) ⇒ (v → v → v) → (k1 → k2) → Map k1 v → Map k2 v Source #

FoldableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (k → a → m) → Map k a → m Source #

ifoldMap'Monoid m ⇒ (k → a → m) → Map k a → m Source #

ifoldr ∷ (k → a → b → b) → b → Map k a → b Source #

ifoldl ∷ (k → b → a → b) → b → Map k a → b Source #

ifoldr' ∷ (k → a → b → b) → b → Map k a → b Source #

ifoldl' ∷ (k → b → a → b) → b → Map k a → b Source #

FunctorWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

imap ∷ (k → a → b) → Map k a → Map k b Source #

TraversableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (k → a → f b) → Map k a → f (Map k b) Source #

FilterableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (k → a → Maybe b) → Map k a → Map k b Source #

ifilter ∷ (k → a → Bool) → Map k a → Map k a Source #

WitherableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (k → a → f (Maybe b)) → Map k a → f (Map k b) Source #

iwitherMMonad m ⇒ (k → a → m (Maybe b)) → Map k a → m (Map k b) Source #

ifilterAApplicative f ⇒ (k → a → f Bool) → Map k a → f (Map k a) Source #

Ord k ⇒ Indexable k (Map k v) 
Instance details

Defined in Cardano.Ledger.Alonzo.Tx

Methods

indexOf ∷ k → Map k v → StrictMaybe Word64 Source #

fromIndexWord64Map k v → StrictMaybe k Source #

(FromJSONKey k, Ord k) ⇒ FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (ValueParser a) → (ValueParser [a]) → ValueParser (Map k a) Source #

liftParseJSONList ∷ (ValueParser a) → (ValueParser [a]) → ValueParser [Map k a] Source #

ToJSONKey k ⇒ ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Map k a → Value Source #

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Map k a] → Value Source #

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Map k a → Encoding Source #

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Map k a] → Encoding Source #

Foldable (Map k)

Folds in order of increasing key.

Instance details

Defined in Data.Map.Internal

Methods

foldMonoid m ⇒ Map k m → m Source #

foldMapMonoid m ⇒ (a → m) → Map k a → m Source #

foldMap'Monoid m ⇒ (a → m) → Map k a → m Source #

foldr ∷ (a → b → b) → b → Map k a → b Source #

foldr' ∷ (a → b → b) → b → Map k a → b Source #

foldl ∷ (b → a → b) → b → Map k a → b Source #

foldl' ∷ (b → a → b) → b → Map k a → b Source #

foldr1 ∷ (a → a → a) → Map k a → a Source #

foldl1 ∷ (a → a → a) → Map k a → a Source #

toListMap k a → [a] Source #

nullMap k a → Bool Source #

lengthMap k a → Int Source #

elemEq a ⇒ a → Map k a → Bool Source #

maximumOrd a ⇒ Map k a → a Source #

minimumOrd a ⇒ Map k a → a Source #

sumNum a ⇒ Map k a → a Source #

productNum a ⇒ Map k a → a Source #

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

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

(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) Source #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Map k a] Source #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Map k a) Source #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Map k a] Source #

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

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Map k a] → ShowS Source #

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) Source #

sequenceAApplicative f ⇒ Map k (f a) → f (Map k a) Source #

mapMMonad m ⇒ (a → m b) → Map k a → m (Map k b) Source #

sequenceMonad m ⇒ Map k (m a) → m (Map k a) Source #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap ∷ (a → b) → Map k a → Map k b Source #

(<$) ∷ a → Map k b → Map k a Source #

Hashable k ⇒ Hashable1 (Map k)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntMap k a → Int Source #

Ord key ⇒ PolyMap (Map key)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Methods

differenceMapMap key value1 → Map key value2 → Map key value1 Source #

intersectionMapMap key value1 → Map key value2 → Map key value1 Source #

intersectionWithMap ∷ (value1 → value2 → value3) → Map key value1 → Map key value2 → Map key value3 Source #

Filterable (Map k) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Map k a → Map k b Source #

catMaybesMap k (Maybe a) → Map k a Source #

filter ∷ (a → Bool) → Map k a → Map k a Source #

Witherable (Map k) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Map k a → f (Map k b) Source #

witherMMonad m ⇒ (a → m (Maybe b)) → Map k a → m (Map k b) Source #

filterAApplicative f ⇒ (a → f Bool) → Map k a → f (Map k a) Source #

witherMapApplicative m ⇒ (Map k b → r) → (a → m (Maybe b)) → Map k a → m r Source #

Embed (PoolDistr c) (Map (KeyHash 'StakePool c) (IndividualPoolStake c))

We can Embed a Newtype around a Map (or other Iterable type) and then use it in a set expression.

Instance details

Defined in Cardano.Ledger.PoolDistr

HasExp (PoolDistr c) (Map (KeyHash 'StakePool c) (IndividualPoolStake c)) 
Instance details

Defined in Cardano.Ledger.PoolDistr

(Structured k, Structured v) ⇒ Structured (Map k v) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structureProxy (Map k v) → Structure Source #

structureHash' ∷ Tagged (Map k v) MD5

(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Map k v) Source #

parseJSONListValueParser [Map k v] Source #

(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMap k v → Value Source #

toEncodingMap k v → Encoding Source #

toJSONList ∷ [Map k v] → Value Source #

toEncodingList ∷ [Map k v] → Encoding Source #

(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) Source #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Map k a) Source #

toConstrMap k a → Constr Source #

dataTypeOfMap k a → DataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Map k a)) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Map k a)) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Map k a → Map k a Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Map k a → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Map k a → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) Source #

Ord k ⇒ Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

memptyMap k v Source #

mappendMap k v → Map k v → Map k v Source #

mconcat ∷ [Map k v] → Map k v Source #

Ord k ⇒ Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>)Map k v → Map k v → Map k v Source #

sconcatNonEmpty (Map k v) → Map k v Source #

stimesIntegral b ⇒ b → Map k v → Map k v Source #

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) Source #

Methods

fromList ∷ [Item (Map k v)] → Map k v Source #

fromListNInt → [Item (Map k v)] → Map k v Source #

toListMap k v → [Item (Map k v)] Source #

(Ord k, Read k, Read e) ⇒ Read (Map k e) 
Instance details

Defined in Data.Map.Internal

(Show k, Show a) ⇒ Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrecIntMap k a → ShowS Source #

showMap k a → String Source #

showList ∷ [Map k a] → ShowS Source #

(Ord k, FromCBOR k, FromCBOR v) ⇒ FromCBOR (Map k v) 
Instance details

Defined in Cardano.Binary.FromCBOR

Methods

fromCBORDecoder s (Map k v) Source #

labelProxy (Map k v) → Text Source #

(Ord k, ToCBOR k, ToCBOR v) ⇒ ToCBOR (Map k v) 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORMap k v → Encoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Map k v) → Size Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Map k v] → Size Source #

(Ord k, DecCBOR k, DecCBOR v) ⇒ DecCBOR (Map k v) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.DecCBOR

Methods

decCBORDecoder s (Map k v) Source #

dropCBORProxy (Map k v) → Decoder s () Source #

labelProxy (Map k v) → Text Source #

(Ord k, DecCBOR k, DecCBOR v) ⇒ DecShareCBOR (Map k v) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Sharing

Associated Types

type Share (Map k v) Source #

Methods

getShareMap k v → Share (Map k v) Source #

decShareCBORShare (Map k v) → Decoder s (Map k v) Source #

decSharePlusCBORStateT (Share (Map k v)) (Decoder s) (Map k v) Source #

(Ord k, EncCBOR k, EncCBOR v) ⇒ EncCBOR (Map k v) 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

Methods

encCBORMap k v → Encoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy (Map k v) → Size Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Map k v] → Size Source #

(FromField a, FromField b, Ord a) ⇒ FromNamedRecord (Map a b) 
Instance details

Defined in Data.Csv.Conversion

(ToField a, ToField b, Ord a) ⇒ ToNamedRecord (Map a b) 
Instance details

Defined in Data.Csv.Conversion

Methods

toNamedRecordMap a b → NamedRecord Source #

(NFData k, NFData a) ⇒ NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnfMap k a → () Source #

(Eq k, Eq a) ⇒ Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==)Map k a → Map k a → Bool Source #

(/=)Map k a → Map k a → Bool Source #

(Ord k, Ord v) ⇒ Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compareMap k v → Map k v → Ordering Source #

(<)Map k v → Map k v → Bool Source #

(<=)Map k v → Map k v → Bool Source #

(>)Map k v → Map k v → Bool Source #

(>=)Map k v → Map k v → Bool Source #

maxMap k v → Map k v → Map k v Source #

minMap k v → Map k v → Map k v Source #

(Hashable k, Hashable v) ⇒ Hashable (Map k v)

Since: hashable-1.3.4.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntMap k v → Int Source #

hashMap k v → Int Source #

(Ord k, FromFormKey k, FromHttpApiData v) ⇒ FromForm (Map k [v]) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

fromFormFormEither Text (Map k [v]) Source #

(ToFormKey k, ToHttpApiData v) ⇒ ToForm (Map k [v]) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormMap k [v] → Form Source #

Ord k ⇒ At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

atIndex (Map k a) → Lens' (Map k a) (Maybe (IxValue (Map k a))) Source #

Ord k ⇒ Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ixIndex (Map k a) → Traversal' (Map k a) (IxValue (Map k a)) Source #

Ord k ⇒ Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a) Source #

Methods

_Wrapped'Iso' (Map k a) (Unwrapped (Map k a)) Source #

Ord k ⇒ HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v) Source #

Methods

keysSetMap k v → KeySet (Map k v) Source #

Ord key ⇒ IsMap (Map key value)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Associated Types

type MapValue (Map key value) Source #

Methods

lookupContainerKey (Map key value) → Map key value → Maybe (MapValue (Map key value)) Source #

insertMapContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value Source #

deleteMapContainerKey (Map key value) → Map key value → Map key value Source #

singletonMapContainerKey (Map key value) → MapValue (Map key value) → Map key value Source #

mapFromList ∷ [(ContainerKey (Map key value), MapValue (Map key value))] → Map key value Source #

mapToListMap key value → [(ContainerKey (Map key value), MapValue (Map key value))] Source #

findWithDefaultMapValue (Map key value) → ContainerKey (Map key value) → Map key value → MapValue (Map key value) Source #

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

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

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) Source #

adjustMap ∷ (MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value Source #

adjustWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value Source #

updateMap ∷ (MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value Source #

updateWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value Source #

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) Source #

alterMap ∷ (Maybe (MapValue (Map key value)) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value Source #

unionWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value → Map key value Source #

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

unionsWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → [Map key value] → Map key value Source #

mapWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value Source #

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

filterMap ∷ (MapValue (Map key value) → Bool) → Map key value → Map key value Source #

Ord k ⇒ SetContainer (Map k v)

This instance uses the functions from Data.Map.Strict.

Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Map k v) Source #

Methods

memberContainerKey (Map k v) → Map k v → Bool Source #

notMemberContainerKey (Map k v) → Map k v → Bool Source #

unionMap k v → Map k v → Map k v Source #

unions ∷ (MonoFoldable mono, Element mono ~ Map k v) ⇒ mono → Map k v Source #

differenceMap k v → Map k v → Map k v Source #

intersectionMap k v → Map k v → Map k v Source #

keysMap k v → [ContainerKey (Map k v)] Source #

Ord k ⇒ GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Map k v) → m) → Map k v → m Source #

ofoldr ∷ (Element (Map k v) → b → b) → b → Map k v → b Source #

ofoldl' ∷ (a → Element (Map k v) → a) → a → Map k v → a Source #

otoListMap k v → [Element (Map k v)] Source #

oall ∷ (Element (Map k v) → Bool) → Map k v → Bool Source #

oany ∷ (Element (Map k v) → Bool) → Map k v → Bool Source #

onullMap k v → Bool Source #

olengthMap k v → Int Source #

olength64Map k v → Int64 Source #

ocompareLengthIntegral i ⇒ Map k v → i → Ordering Source #

otraverse_Applicative f ⇒ (Element (Map k v) → f b) → Map k v → f () Source #

ofor_Applicative f ⇒ Map k v → (Element (Map k v) → f b) → f () Source #

omapM_Applicative m ⇒ (Element (Map k v) → m ()) → Map k v → m () Source #

oforM_Applicative m ⇒ Map k v → (Element (Map k v) → m ()) → m () Source #

ofoldlMMonad m ⇒ (a → Element (Map k v) → m a) → a → Map k v → m a Source #

ofoldMap1ExSemigroup m ⇒ (Element (Map k v) → m) → Map k v → m Source #

ofoldr1Ex ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v) Source #

ofoldl1Ex' ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v) Source #

headExMap k v → Element (Map k v) Source #

lastExMap k v → Element (Map k v) Source #

unsafeHeadMap k v → Element (Map k v) Source #

unsafeLastMap k v → Element (Map k v) Source #

maximumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v) Source #

minimumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v) Source #

oelemElement (Map k v) → Map k v → Bool Source #

onotElemElement (Map k v) → Map k v → Bool Source #

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

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) Source #

omapMApplicative m ⇒ (Element (Map k v) → m (Element (Map k v))) → Map k v → m (Map k v) Source #

Ord k ⇒ MonoidNull (Map k v) 
Instance details

Defined in Data.Monoid.Null

Methods

nullMap k v → Bool Source #

Ord k ⇒ PositiveMonoid (Map k v) 
Instance details

Defined in Data.Monoid.Null

(NoThunks k, NoThunks v) ⇒ NoThunks (Map k v) 
Instance details

Defined in NoThunks.Class

Methods

noThunksContextMap k v → IO (Maybe ThunkInfo) Source #

wNoThunksContextMap k v → IO (Maybe ThunkInfo) Source #

showTypeOfProxy (Map k v) → String Source #

Ord k ⇒ At (Map k a) 
Instance details

Defined in Optics.At.Core

Methods

atIndex (Map k a) → Lens' (Map k a) (Maybe (IxValue (Map k a))) Source #

Ord k ⇒ Ixed (Map k a) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Map k a) Source #

Methods

ixIndex (Map k a) → Optic' (IxKind (Map k a)) NoIx (Map k a) (IxValue (Map k a)) Source #

(Ord k, Serialise k, Serialise v) ⇒ Serialise (Map k v)

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

Methods

encodeMap k v → Encoding Source #

decodeDecoder s (Map k v) Source #

encodeList ∷ [Map k v] → Encoding Source #

decodeListDecoder s [Map k v] Source #

(ToJSONKey k, ToSchema k, ToSchema v) ⇒ ToSchema (Map k v) 
Instance details

Defined in Data.Swagger.Internal.Schema

(t ~ Map k' a', Ord k) ⇒ Rewrapped (Map k a) t

Use wrapping fromList. unwrapping returns a sorted list.

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

unpackMonoidalMap k a → Map k a Source #

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 Cardano.Ledger.Binary.Decoding.Sharing

type Share (Map k v) = (Interns k, Interns v)
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 ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type Index (Map k a) 
Instance details

Defined in Optics.At.Core

type Index (Map k a) = k
type IxKind (Map k a) 
Instance details

Defined in Optics.At.Core

type IxValue (Map k a) 
Instance details

Defined in Optics.At.Core

type IxValue (Map k a) = a

apMonad m ⇒ m (a → b) → m a → m b Source #

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 () Source #

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.

voidFunctor f ⇒ f a → f () Source #

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

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

on ∷ (b → b → c) → (a → b) → a → a → c infixl 0 Source #

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

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

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

Algebraic properties:

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

fromMaybe ∷ a → Maybe a → a Source #

The fromMaybe function takes a default value and a Maybe value. If the Maybe is Nothing, it returns the default value; 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 Source #

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

Examples

Expand

Basic usage:

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

Only the outer constructor is taken into consideration:

>>> isJust (Just Nothing)
True

isAlphaNumCharBool Source #

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.

data Proxy (t ∷ k) Source #

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
ApplicativeB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ApplicativeB

Methods

bpure ∷ (∀ (a ∷ k0). f a) → Proxy f Source #

bprod ∷ ∀ (f ∷ k0 → Type) (g ∷ k0 → Type). Proxy f → Proxy g → Proxy (Product f g) Source #

ConstraintsB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

Associated Types

type AllB c Proxy Source #

Methods

baddDicts ∷ ∀ (c ∷ k0 → Constraint) (f ∷ k0 → Type). AllB c ProxyProxy f → Proxy (Product (Dict c) f) Source #

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) Source #

FunctorB (Proxy ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.FunctorB

Methods

bmap ∷ (∀ (a ∷ k0). f a → g a) → Proxy f → Proxy g Source #

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) Source #

Generic1 (Proxy ∷ k → Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Proxy ∷ k → Type Source #

Methods

from1 ∷ ∀ (a ∷ k0). Proxy a → Rep1 Proxy a Source #

to1 ∷ ∀ (a ∷ k0). Rep1 Proxy a → Proxy a Source #

FoldableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Proxy a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → Proxy a → m Source #

ifoldr ∷ (Void → a → b → b) → b → Proxy a → b Source #

ifoldl ∷ (Void → b → a → b) → b → Proxy a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → Proxy a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → Proxy a → b Source #

FunctorWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Proxy a → Proxy b Source #

TraversableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Proxy a → f (Proxy b) Source #

FilterableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (Void → a → Maybe b) → Proxy a → Proxy b Source #

ifilter ∷ (Void → a → Bool) → Proxy a → Proxy a Source #

WitherableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (Void → a → f (Maybe b)) → Proxy a → f (Proxy b) Source #

iwitherMMonad m ⇒ (Void → a → m (Maybe b)) → Proxy a → m (Proxy b) Source #

ifilterAApplicative f ⇒ (Void → a → f Bool) → Proxy a → f (Proxy a) Source #

Representable (ProxyTypeType) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Proxy Source #

Methods

tabulate ∷ (Rep Proxy → a) → Proxy a Source #

indexProxy a → Rep Proxy → a Source #

FromJSON1 (ProxyTypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (ValueParser a) → (ValueParser [a]) → ValueParser (Proxy a) Source #

liftParseJSONList ∷ (ValueParser a) → (ValueParser [a]) → ValueParser [Proxy a] Source #

ToJSON1 (ProxyTYPE LiftedRepType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Proxy a → Value Source #

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Proxy a] → Value Source #

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Proxy a → Encoding Source #

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Proxy a] → Encoding Source #

Foldable (ProxyTYPE LiftedRepType)

Since: base-4.7.0.0

Instance details

Defined in Data.Foldable

Methods

foldMonoid m ⇒ Proxy m → m Source #

foldMapMonoid m ⇒ (a → m) → Proxy a → m Source #

foldMap'Monoid m ⇒ (a → m) → Proxy a → m Source #

foldr ∷ (a → b → b) → b → Proxy a → b Source #

foldr' ∷ (a → b → b) → b → Proxy a → b Source #

foldl ∷ (b → a → b) → b → Proxy a → b Source #

foldl' ∷ (b → a → b) → b → Proxy a → b Source #

foldr1 ∷ (a → a → a) → Proxy a → a Source #

foldl1 ∷ (a → a → a) → Proxy a → a Source #

toListProxy a → [a] Source #

nullProxy a → Bool Source #

lengthProxy a → Int Source #

elemEq a ⇒ a → Proxy a → Bool Source #

maximumOrd a ⇒ Proxy a → a Source #

minimumOrd a ⇒ Proxy a → a Source #

sumNum a ⇒ Proxy a → a Source #

productNum a ⇒ Proxy a → a Source #

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

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

Read1 (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec ∷ (IntReadS a) → ReadS [a] → IntReadS (Proxy a) Source #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Proxy a] Source #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Proxy a) Source #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Proxy a] Source #

Show1 (ProxyTYPE LiftedRepType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec ∷ (Int → a → ShowS) → ([a] → ShowS) → IntProxy a → ShowS Source #

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Proxy a] → ShowS Source #

Contravariant (ProxyTypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Proxy a → Proxy a' Source #

(>$) ∷ b → Proxy b → Proxy a Source #

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) Source #

sequenceAApplicative f ⇒ Proxy (f a) → f (Proxy a) Source #

mapMMonad m ⇒ (a → m b) → Proxy a → m (Proxy b) Source #

sequenceMonad m ⇒ Proxy (m a) → m (Proxy a) Source #

Alternative (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

emptyProxy a Source #

(<|>)Proxy a → Proxy a → Proxy a Source #

someProxy a → Proxy [a] Source #

manyProxy a → Proxy [a] Source #

Applicative (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

pure ∷ a → Proxy a Source #

(<*>)Proxy (a → b) → Proxy a → Proxy b Source #

liftA2 ∷ (a → b → c) → Proxy a → Proxy b → Proxy c Source #

(*>)Proxy a → Proxy b → Proxy b Source #

(<*)Proxy a → Proxy b → Proxy a Source #

Functor (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

fmap ∷ (a → b) → Proxy a → Proxy b Source #

(<$) ∷ a → Proxy b → Proxy a Source #

Monad (ProxyTypeType)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(>>=)Proxy a → (a → Proxy b) → Proxy b Source #

(>>)Proxy a → Proxy b → Proxy b Source #

return ∷ a → Proxy a Source #

MonadPlus (ProxyTypeType)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

mzeroProxy a Source #

mplusProxy a → Proxy a → Proxy a Source #

NFData1 (ProxyTYPE LiftedRepType)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf ∷ (a → ()) → Proxy a → () Source #

Distributive (ProxyTypeType) 
Instance details

Defined in Data.Distributive

Methods

distributeFunctor f ⇒ f (Proxy a) → Proxy (f a) Source #

collectFunctor f ⇒ (a → Proxy b) → f a → Proxy (f b) Source #

distributeMMonad m ⇒ m (Proxy a) → Proxy (m a) Source #

collectMMonad m ⇒ (a → Proxy b) → m a → Proxy (m b) Source #

Hashable1 (ProxyTypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntProxy a → Int Source #

Filterable (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Proxy a → Proxy b Source #

catMaybesProxy (Maybe a) → Proxy a Source #

filter ∷ (a → Bool) → Proxy a → Proxy a Source #

Witherable (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Proxy a → f (Proxy b) Source #

witherMMonad m ⇒ (a → m (Maybe b)) → Proxy a → m (Proxy b) Source #

filterAApplicative f ⇒ (a → f Bool) → Proxy a → f (Proxy a) Source #

witherMapApplicative m ⇒ (Proxy b → r) → (a → m (Maybe b)) → Proxy a → m r Source #

Vector (ProxyTypeType) a 
Instance details

Defined in Data.Vector.Fixed.Cont

Methods

constructFun (Peano (Dim Proxy)) a (Proxy a) Source #

inspectProxy a → Fun (Peano (Dim Proxy)) a b → b Source #

basicIndexProxy a → Int → a Source #

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data t ⇒ Data (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Proxy t → c (Proxy t) Source #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Proxy t) Source #

toConstrProxy t → Constr Source #

dataTypeOfProxy t → DataType Source #

dataCast1Typeable t0 ⇒ (∀ d. Data d ⇒ c (t0 d)) → Maybe (c (Proxy t)) Source #

dataCast2Typeable t0 ⇒ (∀ d e. (Data d, Data e) ⇒ c (t0 d e)) → Maybe (c (Proxy t)) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Proxy t → Proxy t Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Proxy t → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Proxy t → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Proxy t → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Proxy t → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Proxy t → m (Proxy t) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Proxy t → m (Proxy t) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Proxy t → m (Proxy t) Source #

Monoid (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

memptyProxy s Source #

mappendProxy s → Proxy s → Proxy s Source #

mconcat ∷ [Proxy s] → Proxy s Source #

Semigroup (Proxy s)

Since: base-4.9.0.0

Instance details

Defined in Data.Proxy

Methods

(<>)Proxy s → Proxy s → Proxy s Source #

sconcatNonEmpty (Proxy s) → Proxy s Source #

stimesIntegral b ⇒ b → Proxy s → Proxy s Source #

Bounded (Proxy t)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Enum (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

succProxy s → Proxy s Source #

predProxy s → Proxy s Source #

toEnumIntProxy s Source #

fromEnumProxy s → Int Source #

enumFromProxy s → [Proxy s] Source #

enumFromThenProxy s → Proxy s → [Proxy s] Source #

enumFromToProxy s → Proxy s → [Proxy s] Source #

enumFromThenToProxy s → Proxy s → Proxy s → [Proxy s] Source #

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) ∷ TypeType Source #

Methods

fromProxy t → Rep (Proxy t) x Source #

toRep (Proxy t) x → Proxy t Source #

Ix (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

range ∷ (Proxy s, Proxy s) → [Proxy s] Source #

index ∷ (Proxy s, Proxy s) → Proxy s → Int Source #

unsafeIndex ∷ (Proxy s, Proxy s) → Proxy s → Int Source #

inRange ∷ (Proxy s, Proxy s) → Proxy s → Bool Source #

rangeSize ∷ (Proxy s, Proxy s) → Int Source #

unsafeRangeSize ∷ (Proxy s, Proxy s) → Int Source #

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

showProxy s → String Source #

showList ∷ [Proxy s] → ShowS Source #

NFData (Proxy a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfProxy a → () Source #

Eq (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

(==)Proxy s → Proxy s → Bool Source #

(/=)Proxy s → Proxy s → Bool Source #

Ord (Proxy s)

Since: base-4.7.0.0

Instance details

Defined in Data.Proxy

Methods

compareProxy s → Proxy s → Ordering Source #

(<)Proxy s → Proxy s → Bool Source #

(<=)Proxy s → Proxy s → Bool Source #

(>)Proxy s → Proxy s → Bool Source #

(>=)Proxy s → Proxy s → Bool Source #

maxProxy s → Proxy s → Proxy s Source #

minProxy s → Proxy s → Proxy s Source #

Abelian (Proxy x) 
Instance details

Defined in Data.Group

Cyclic (Proxy x) 
Instance details

Defined in Data.Group

Methods

generatorProxy x Source #

Group (Proxy x)

Trivial group, Functor style.

Instance details

Defined in Data.Group

Methods

invertProxy x → Proxy x Source #

(~~)Proxy x → Proxy x → Proxy x Source #

powIntegral x0 ⇒ Proxy x → x0 → Proxy x Source #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntProxy a → Int Source #

hashProxy a → Int Source #

MonoFoldable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Proxy a) → m) → Proxy a → m Source #

ofoldr ∷ (Element (Proxy a) → b → b) → b → Proxy a → b Source #

ofoldl' ∷ (a0 → Element (Proxy a) → a0) → a0 → Proxy a → a0 Source #

otoListProxy a → [Element (Proxy a)] Source #

oall ∷ (Element (Proxy a) → Bool) → Proxy a → Bool Source #

oany ∷ (Element (Proxy a) → Bool) → Proxy a → Bool Source #

onullProxy a → Bool Source #

olengthProxy a → Int Source #

olength64Proxy a → Int64 Source #

ocompareLengthIntegral i ⇒ Proxy a → i → Ordering Source #

otraverse_Applicative f ⇒ (Element (Proxy a) → f b) → Proxy a → f () Source #

ofor_Applicative f ⇒ Proxy a → (Element (Proxy a) → f b) → f () Source #

omapM_Applicative m ⇒ (Element (Proxy a) → m ()) → Proxy a → m () Source #

oforM_Applicative m ⇒ Proxy a → (Element (Proxy a) → m ()) → m () Source #

ofoldlMMonad m ⇒ (a0 → Element (Proxy a) → m a0) → a0 → Proxy a → m a0 Source #

ofoldMap1ExSemigroup m ⇒ (Element (Proxy a) → m) → Proxy a → m Source #

ofoldr1Ex ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a) Source #

ofoldl1Ex' ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a) Source #

headExProxy a → Element (Proxy a) Source #

lastExProxy a → Element (Proxy a) Source #

unsafeHeadProxy a → Element (Proxy a) Source #

unsafeLastProxy a → Element (Proxy a) Source #

maximumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a) Source #

minimumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a) Source #

oelemElement (Proxy a) → Proxy a → Bool Source #

onotElemElement (Proxy a) → Proxy a → Bool Source #

MonoFunctor (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Proxy a) → Element (Proxy a)) → Proxy a → Proxy a Source #

MonoPointed (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

opointElement (Proxy a) → Proxy a Source #

MonoTraversable (Proxy a)

Since: mono-traversable-1.0.11.0

Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Proxy a) → f (Element (Proxy a))) → Proxy a → f (Proxy a) Source #

omapMApplicative m ⇒ (Element (Proxy a) → m (Element (Proxy a))) → Proxy a → m (Proxy a) Source #

Serialise (Proxy a)

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

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)

Since: base-4.6.0.0

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 Dim (ProxyTypeType) 
Instance details

Defined in Data.Vector.Fixed.Cont

type Dim (ProxyTypeType) = 0
type Rep (Proxy t)

Since: base-4.6.0.0

Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1TypeType))
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]]
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a

sortBy ∷ (a → a → Ordering) → [a] → [a] Source #

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,"!")]

findFoldable t ⇒ (a → Bool) → t a → Maybe a Source #

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.

Examples

Expand

Basic usage:

>>> find (> 42) [0, 5..]
Just 45
>>> find (> 12) [1..7]
Nothing

newtype Const a (b ∷ k) Source #

The Const functor.

Constructors

Const 

Fields

Instances

Instances details
Monoid a ⇒ ApplicativeB (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ApplicativeB

Methods

bpure ∷ (∀ (a0 ∷ k0). f a0) → Const a f Source #

bprod ∷ ∀ (f ∷ k0 → Type) (g ∷ k0 → Type). Const a f → Const a g → Const a (Product f g) Source #

ConstraintsB (Const a ∷ (k → Type) → Type) 
Instance details

Defined in Barbies.Internal.ConstraintsB

Associated Types

type AllB c (Const a) Source #

Methods

baddDicts ∷ ∀ (c ∷ k0 → Constraint) (f ∷ k0 → Type). AllB c (Const a) ⇒ Const a f → Const a (Product (Dict c) f) Source #

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

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) Source #

Generic1 (Const a ∷ k → Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a) ∷ k → Type Source #

Methods

from1 ∷ ∀ (a0 ∷ k0). Const a a0 → Rep1 (Const a) a0 Source #

to1 ∷ ∀ (a0 ∷ k0). Rep1 (Const a) a0 → Const a a0 Source #

FoldableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Const e a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → Const e a → m Source #

ifoldr ∷ (Void → a → b → b) → b → Const e a → b Source #

ifoldl ∷ (Void → b → a → b) → b → Const e a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → Const e a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → Const e a → b Source #

FunctorWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Const e a → Const e b Source #

TraversableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Const e a → f (Const e b) Source #

PrettyBy config a ⇒ DefaultPrettyBy config (Const a b) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Const a b → Doc ann Source #

defaultPrettyListBy ∷ config → [Const a b] → Doc ann Source #

PrettyDefaultBy config (Const a b) ⇒ PrettyBy config (Const a b)

Non-polykinded, because Pretty (Const a b) is not polykinded either.

>>> prettyBy () (Const 1 :: Const Integer Bool)
1
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Const a b → Doc ann Source #

prettyListBy ∷ config → [Const a b] → Doc ann Source #

Unbox a ⇒ Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreezePrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → m (Vector (Const a b)) Source #

basicUnsafeThawPrimMonad m ⇒ Vector (Const a b) → m (Mutable Vector (PrimState m) (Const a b)) Source #

basicLengthVector (Const a b) → Int Source #

basicUnsafeSliceIntIntVector (Const a b) → Vector (Const a b) Source #

basicUnsafeIndexMMonad m ⇒ Vector (Const a b) → Int → m (Const a b) Source #

basicUnsafeCopyPrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → Vector (Const a b) → m () Source #

elemseqVector (Const a b) → Const a b → b0 → b0 Source #

Unbox a ⇒ MVector MVector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLengthMVector s (Const a b) → Int Source #

basicUnsafeSliceIntIntMVector s (Const a b) → MVector s (Const a b) Source #

basicOverlapsMVector s (Const a b) → MVector s (Const a b) → Bool Source #

basicUnsafeNewPrimMonad m ⇒ Int → m (MVector (PrimState m) (Const a b)) Source #

basicInitializePrimMonad m ⇒ MVector (PrimState m) (Const a b) → m () Source #

basicUnsafeReplicatePrimMonad m ⇒ IntConst a b → m (MVector (PrimState m) (Const a b)) Source #

basicUnsafeReadPrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (Const a b) Source #

basicUnsafeWritePrimMonad m ⇒ MVector (PrimState m) (Const a b) → IntConst a b → m () Source #

basicClearPrimMonad m ⇒ MVector (PrimState m) (Const a b) → m () Source #

basicSetPrimMonad m ⇒ MVector (PrimState m) (Const a b) → Const a b → m () Source #

basicUnsafeCopyPrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m () Source #

basicUnsafeMovePrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m () Source #

basicUnsafeGrowPrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (MVector (PrimState m) (Const a b)) Source #

FromJSON2 (ConstTypeTypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 ∷ (ValueParser a) → (ValueParser [a]) → (ValueParser b) → (ValueParser [b]) → ValueParser (Const a b) Source #

liftParseJSONList2 ∷ (ValueParser a) → (ValueParser [a]) → (ValueParser b) → (ValueParser [b]) → ValueParser [Const a b] Source #

ToJSON2 (ConstTypeTYPE LiftedRepType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → Const a b → Value Source #

liftToJSONList2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → [Const a b] → Value Source #

liftToEncoding2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → Const a b → Encoding Source #

liftToEncodingList2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → [Const a b] → Encoding Source #

Bifoldable (ConstTypeTYPE LiftedRepType)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifoldMonoid m ⇒ Const m m → m Source #

bifoldMapMonoid m ⇒ (a → m) → (b → m) → Const a b → m Source #

bifoldr ∷ (a → c → c) → (b → c → c) → c → Const a b → c Source #

bifoldl ∷ (c → a → c) → (c → b → c) → c → Const a b → c Source #

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

first ∷ (a → b) → Const a c → Const b c Source #

second ∷ (b → c) → Const a b → Const a c Source #

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

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

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) Source #

liftReadList2 ∷ (IntReadS a) → ReadS [a] → (IntReadS b) → ReadS [b] → ReadS [Const a b] Source #

liftReadPrec2ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec (Const a b) Source #

liftReadListPrec2ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec [Const a b] Source #

Show2 (ConstTypeTYPE LiftedRepType)

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

liftShowList2 ∷ (Int → a → ShowS) → ([a] → ShowS) → (Int → b → ShowS) → ([b] → ShowS) → [Const a b] → ShowS Source #

Biapplicative (ConstTypeTypeType) 
Instance details

Defined in Data.Biapplicative

Methods

bipure ∷ a → b → Const a b Source #

(<<*>>)Const (a → b) (c → d) → Const a c → Const b d Source #

biliftA2 ∷ (a → b → c) → (d → e → f) → Const a d → Const b e → Const c f Source #

(*>>)Const a b → Const c d → Const c d Source #

(<<*)Const a b → Const c d → Const a b Source #

NFData2 (ConstTypeTypeType)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 ∷ (a → ()) → (b → ()) → Const a b → () Source #

Hashable2 (ConstTypeTypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 ∷ (Int → a → Int) → (Int → b → Int) → IntConst a b → Int Source #

FromJSON a ⇒ FromJSON1 (Const a ∷ TypeType) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (ValueParser a0) → (ValueParser [a0]) → ValueParser (Const a a0) Source #

liftParseJSONList ∷ (ValueParser a0) → (ValueParser [a0]) → ValueParser [Const a a0] Source #

ToJSON a ⇒ ToJSON1 (Const a ∷ TYPE LiftedRepType) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a0 → Value) → ([a0] → Value) → Const a a0 → Value Source #

liftToJSONList ∷ (a0 → Value) → ([a0] → Value) → [Const a a0] → Value Source #

liftToEncoding ∷ (a0 → Encoding) → ([a0] → Encoding) → Const a a0 → Encoding Source #

liftToEncodingList ∷ (a0 → Encoding) → ([a0] → Encoding) → [Const a a0] → Encoding Source #

Foldable (Const m ∷ TYPE LiftedRepType)

Since: base-4.7.0.0

Instance details

Defined in Data.Functor.Const

Methods

foldMonoid m0 ⇒ Const m m0 → m0 Source #

foldMapMonoid m0 ⇒ (a → m0) → Const m a → m0 Source #

foldMap'Monoid m0 ⇒ (a → m0) → Const m a → m0 Source #

foldr ∷ (a → b → b) → b → Const m a → b Source #

foldr' ∷ (a → b → b) → b → Const m a → b Source #

foldl ∷ (b → a → b) → b → Const m a → b Source #

foldl' ∷ (b → a → b) → b → Const m a → b Source #

foldr1 ∷ (a → a → a) → Const m a → a Source #

foldl1 ∷ (a → a → a) → Const m a → a Source #

toListConst m a → [a] Source #

nullConst m a → Bool Source #

lengthConst m a → Int Source #

elemEq a ⇒ a → Const m a → Bool Source #

maximumOrd a ⇒ Const m a → a Source #

minimumOrd a ⇒ Const m a → a Source #

sumNum a ⇒ Const m a → a Source #

productNum a ⇒ Const m a → a Source #

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

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

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) Source #

liftReadList ∷ (IntReadS a0) → ReadS [a0] → ReadS [Const a a0] Source #

liftReadPrecReadPrec a0 → ReadPrec [a0] → ReadPrec (Const a a0) Source #

liftReadListPrecReadPrec a0 → ReadPrec [a0] → ReadPrec [Const a a0] Source #

Show a ⇒ Show1 (Const a ∷ TYPE LiftedRepType)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec ∷ (Int → a0 → ShowS) → ([a0] → ShowS) → IntConst a a0 → ShowS Source #

liftShowList ∷ (Int → a0 → ShowS) → ([a0] → ShowS) → [Const a a0] → ShowS Source #

Contravariant (Const a ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a0) → Const a a0 → Const a a' Source #

(>$) ∷ b → Const a b → Const a a0 Source #

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) Source #

sequenceAApplicative f ⇒ Const m (f a) → f (Const m a) Source #

mapMMonad m0 ⇒ (a → m0 b) → Const m a → m0 (Const m b) Source #

sequenceMonad m0 ⇒ Const m (m0 a) → m0 (Const m a) Source #

Monoid m ⇒ Applicative (Const m ∷ TypeType)

Since: base-2.0.1

Instance details

Defined in Data.Functor.Const

Methods

pure ∷ a → Const m a Source #

(<*>)Const m (a → b) → Const m a → Const m b Source #

liftA2 ∷ (a → b → c) → Const m a → Const m b → Const m c Source #

(*>)Const m a → Const m b → Const m b Source #

(<*)Const m a → Const m b → Const m a Source #

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

(<$) ∷ a → Const m b → Const m a Source #

NFData a ⇒ NFData1 (Const a ∷ TYPE LiftedRepType)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf ∷ (a0 → ()) → Const a a0 → () Source #

Hashable a ⇒ Hashable1 (Const a ∷ TypeType) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a0 → Int) → IntConst a a0 → Int Source #

Filterable (Const r ∷ TypeType) 
Instance details

Defined in Witherable

Methods

mapMaybe ∷ (a → Maybe b) → Const r a → Const r b Source #

catMaybesConst r (Maybe a) → Const r a Source #

filter ∷ (a → Bool) → Const r a → Const r a Source #

Witherable (Const r ∷ TypeType) 
Instance details

Defined in Witherable

Methods

witherApplicative f ⇒ (a → f (Maybe b)) → Const r a → f (Const r b) Source #

witherMMonad m ⇒ (a → m (Maybe b)) → Const r a → m (Const r b) Source #

filterAApplicative f ⇒ (a → f Bool) → Const r a → f (Const r a) Source #

witherMapApplicative m ⇒ (Const r b → r0) → (a → m (Maybe b)) → Const r a → m r0 Source #

FromJSON a ⇒ FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSONKey a) ⇒ FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a ⇒ ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSONKey a) ⇒ ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Typeable k, Data a, Typeable b) ⇒ Data (Const a b)

Since: base-4.10.0.0

Instance details

Defined in Data.Data

Methods

gfoldl ∷ (∀ d b0. Data d ⇒ c (d → b0) → d → c b0) → (∀ g. g → c g) → Const a b → c (Const a b) Source #

gunfold ∷ (∀ b0 r. Data b0 ⇒ c (b0 → r) → c r) → (∀ r. r → c r) → Constr → c (Const a b) Source #

toConstrConst a b → Constr Source #

dataTypeOfConst a b → DataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Const a b)) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Const a b)) Source #

gmapT ∷ (∀ b0. Data b0 ⇒ b0 → b0) → Const a b → Const a b Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Const a b → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Const a b → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Const a b → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Const a b → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Const a b → m (Const a b) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Const a b → m (Const a b) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Const a b → m (Const a b) Source #

IsString a ⇒ IsString (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringConst a b Source #

Storable a ⇒ Storable (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

sizeOfConst a b → Int Source #

alignmentConst a b → Int Source #

peekElemOffPtr (Const a b) → IntIO (Const a b) Source #

pokeElemOffPtr (Const a b) → IntConst a b → IO () Source #

peekByteOffPtr b0 → IntIO (Const a b) Source #

pokeByteOffPtr b0 → IntConst a b → IO () Source #

peekPtr (Const a b) → IO (Const a b) Source #

pokePtr (Const a b) → Const a b → IO () Source #

Monoid a ⇒ Monoid (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

memptyConst a b Source #

mappendConst a b → Const a b → Const a b Source #

mconcat ∷ [Const a b] → Const a b Source #

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

sconcatNonEmpty (Const a b) → Const a b Source #

stimesIntegral b0 ⇒ b0 → Const a b → Const a b Source #

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

(.|.)Const a b → Const a b → Const a b Source #

xorConst a b → Const a b → Const a b Source #

complementConst a b → Const a b Source #

shiftConst a b → IntConst a b Source #

rotateConst a b → IntConst a b Source #

zeroBitsConst a b Source #

bitIntConst a b Source #

setBitConst a b → IntConst a b Source #

clearBitConst a b → IntConst a b Source #

complementBitConst a b → IntConst a b Source #

testBitConst a b → IntBool Source #

bitSizeMaybeConst a b → Maybe Int Source #

bitSizeConst a b → Int Source #

isSignedConst a b → Bool Source #

shiftLConst a b → IntConst a b Source #

unsafeShiftLConst a b → IntConst a b Source #

shiftRConst a b → IntConst a b Source #

unsafeShiftRConst a b → IntConst a b Source #

rotateLConst a b → IntConst a b Source #

rotateRConst a b → IntConst a b Source #

popCountConst a b → Int Source #

FiniteBits a ⇒ FiniteBits (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Bounded a ⇒ Bounded (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

minBoundConst a b Source #

maxBoundConst a b Source #

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

predConst a b → Const a b Source #

toEnumIntConst a b Source #

fromEnumConst a b → Int Source #

enumFromConst a b → [Const a b] Source #

enumFromThenConst a b → Const a b → [Const a b] Source #

enumFromToConst a b → Const a b → [Const a b] Source #

enumFromThenToConst a b → Const a b → Const a b → [Const a b] Source #

Floating a ⇒ Floating (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

piConst a b Source #

expConst a b → Const a b Source #

logConst a b → Const a b Source #

sqrtConst a b → Const a b Source #

(**)Const a b → Const a b → Const a b Source #

logBaseConst a b → Const a b → Const a b Source #

sinConst a b → Const a b Source #

cosConst a b → Const a b Source #

tanConst a b → Const a b Source #

asinConst a b → Const a b Source #

acosConst a b → Const a b Source #

atanConst a b → Const a b Source #

sinhConst a b → Const a b Source #

coshConst a b → Const a b Source #

tanhConst a b → Const a b Source #

asinhConst a b → Const a b Source #

acoshConst a b → Const a b Source #

atanhConst a b → Const a b Source #

log1pConst a b → Const a b Source #

expm1Const a b → Const a b Source #

log1pexpConst a b → Const a b Source #

log1mexpConst a b → Const a b Source #

RealFloat a ⇒ RealFloat (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

floatRadixConst a b → Integer Source #

floatDigitsConst a b → Int Source #

floatRangeConst a b → (Int, Int) Source #

decodeFloatConst a b → (Integer, Int) Source #

encodeFloatIntegerIntConst a b Source #

exponentConst a b → Int Source #

significandConst a b → Const a b Source #

scaleFloatIntConst a b → Const a b Source #

isNaNConst a b → Bool Source #

isInfiniteConst a b → Bool Source #

isDenormalizedConst a b → Bool Source #

isNegativeZeroConst a b → Bool Source #

isIEEEConst a b → Bool Source #

atan2Const a b → Const a b → Const a b Source #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) ∷ TypeType Source #

Methods

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

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

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] Source #

index ∷ (Const a b, Const a b) → Const a b → Int Source #

unsafeIndex ∷ (Const a b, Const a b) → Const a b → Int Source #

inRange ∷ (Const a b, Const a b) → Const a b → Bool Source #

rangeSize ∷ (Const a b, Const a b) → Int Source #

unsafeRangeSize ∷ (Const a b, Const a b) → Int Source #

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

(-)Const a b → Const a b → Const a b Source #

(*)Const a b → Const a b → Const a b Source #

negateConst a b → Const a b Source #

absConst a b → Const a b Source #

signumConst a b → Const a b Source #

fromIntegerIntegerConst a b Source #

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

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

recipConst a b → Const a b Source #

fromRationalRationalConst a b Source #

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

remConst a b → Const a b → Const a b Source #

divConst a b → Const a b → Const a b Source #

modConst a b → Const a b → Const a b Source #

quotRemConst a b → Const a b → (Const a b, Const a b) Source #

divModConst a b → Const a b → (Const a b, Const a b) Source #

toIntegerConst a b → Integer Source #

Real a ⇒ Real (Const a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Const

Methods

toRationalConst a b → Rational Source #

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) Source #

truncateIntegral b0 ⇒ Const a b → b0 Source #

roundIntegral b0 ⇒ Const a b → b0 Source #

ceilingIntegral b0 ⇒ Const a b → b0 Source #

floorIntegral b0 ⇒ Const a b → b0 Source #

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

showConst a b → String Source #

showList ∷ [Const a b] → ShowS Source #

FromField a ⇒ FromField (Const a b)

Since: cassava-0.5.2.0

Instance details

Defined in Data.Csv.Conversion

Methods

parseFieldFieldParser (Const a b) Source #

ToField a ⇒ ToField (Const a b)

Since: cassava-0.5.2.0

Instance details

Defined in Data.Csv.Conversion

Methods

toFieldConst a b → Field Source #

NFData a ⇒ NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfConst a b → () Source #

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

(/=)Const a b → Const a b → Bool Source #

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

(<)Const a b → Const a b → Bool Source #

(<=)Const a b → Const a b → Bool Source #

(>)Const a b → Const a b → Bool Source #

(>=)Const a b → Const a b → Bool Source #

maxConst a b → Const a b → Const a b Source #

minConst a b → Const a b → Const a b Source #

Abelian a ⇒ Abelian (Const a x) 
Instance details

Defined in Data.Group

Cyclic a ⇒ Cyclic (Const a x) 
Instance details

Defined in Data.Group

Methods

generatorConst a x Source #

Group a ⇒ Group (Const a x)

Const lifts groups into a functor.

Instance details

Defined in Data.Group

Methods

invertConst a x → Const a x Source #

(~~)Const a x → Const a x → Const a x Source #

powIntegral x0 ⇒ Const a x → x0 → Const a x Source #

Hashable a ⇒ Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntConst a b → Int Source #

hashConst a b → Int Source #

FromFormKey a ⇒ FromFormKey (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

parseFormKeyTextEither Text (Const a b) Source #

ToFormKey a ⇒ ToFormKey (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyConst a b → Text Source #

FromHttpApiData a ⇒ FromHttpApiData (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a ⇒ ToHttpApiData (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) Source #

Methods

_Wrapped'Iso' (Const a x) (Unwrapped (Const a x)) Source #

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m0 ⇒ (Element (Const m a) → m0) → Const m a → m0 Source #

ofoldr ∷ (Element (Const m a) → b → b) → b → Const m a → b Source #

ofoldl' ∷ (a0 → Element (Const m a) → a0) → a0 → Const m a → a0 Source #

otoListConst m a → [Element (Const m a)] Source #

oall ∷ (Element (Const m a) → Bool) → Const m a → Bool Source #

oany ∷ (Element (Const m a) → Bool) → Const m a → Bool Source #

onullConst m a → Bool Source #

olengthConst m a → Int Source #

olength64Const m a → Int64 Source #

ocompareLengthIntegral i ⇒ Const m a → i → Ordering Source #

otraverse_Applicative f ⇒ (Element (Const m a) → f b) → Const m a → f () Source #

ofor_Applicative f ⇒ Const m a → (Element (Const m a) → f b) → f () Source #

omapM_Applicative m0 ⇒ (Element (Const m a) → m0 ()) → Const m a → m0 () Source #

oforM_Applicative m0 ⇒ Const m a → (Element (Const m a) → m0 ()) → m0 () Source #

ofoldlMMonad m0 ⇒ (a0 → Element (Const m a) → m0 a0) → a0 → Const m a → m0 a0 Source #

ofoldMap1ExSemigroup m0 ⇒ (Element (Const m a) → m0) → Const m a → m0 Source #

ofoldr1Ex ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a) Source #

ofoldl1Ex' ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a) Source #

headExConst m a → Element (Const m a) Source #

lastExConst m a → Element (Const m a) Source #

unsafeHeadConst m a → Element (Const m a) Source #

unsafeLastConst m a → Element (Const m a) Source #

maximumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a) Source #

minimumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a) Source #

oelemElement (Const m a) → Const m a → Bool Source #

onotElemElement (Const m a) → Const m a → Bool Source #

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

Monoid m ⇒ MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opointElement (Const m a) → Const m a Source #

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) Source #

omapMApplicative m0 ⇒ (Element (Const m a) → m0 (Element (Const m a))) → Const m a → m0 (Const m a) Source #

Newtype (Const a x) 
Instance details

Defined in Control.Newtype.Generics

Associated Types

type O (Const a x) Source #

Methods

packO (Const a x) → Const a x Source #

unpackConst a x → O (Const a x) Source #

FromField a ⇒ FromField (Const a b) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

ToField a ⇒ ToField (Const a b) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldConst a b → Action Source #

Pretty a ⇒ Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

prettyConst a b → Doc ann Source #

prettyList ∷ [Const a b] → Doc ann Source #

Prim a ⇒ Prim (Const a b)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Methods

sizeOf#Const a b → Int# Source #

alignment#Const a b → Int# Source #

indexByteArray#ByteArray#Int#Const a b Source #

readByteArray#MutableByteArray# s → Int#State# s → (# State# s, Const a b #) Source #

writeByteArray#MutableByteArray# s → Int#Const a b → State# s → State# s Source #

setByteArray#MutableByteArray# s → Int#Int#Const a b → State# s → State# s Source #

indexOffAddr#Addr#Int#Const a b Source #

readOffAddr#Addr#Int#State# s → (# State# s, Const a b #) Source #

writeOffAddr#Addr#Int#Const a b → State# s → State# s Source #

setOffAddr#Addr#Int#Int#Const a b → State# s → State# s Source #

Serialise a ⇒ Serialise (Const a b)

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

ToSample a ⇒ ToSample (Const a b) 
Instance details

Defined in Servant.Docs.Internal

Methods

toSamplesProxy (Const a b) → [(Text, Const a b)] Source #

Unbox a ⇒ Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

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)

Since: base-4.9.0.0

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)

Since: base-4.9.0.0

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 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"])
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
type O (Const a x) 
Instance details

Defined in Control.Newtype.Generics

type O (Const a x) = a
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)

class (Typeable e, Show e) ⇒ Exception e Source #

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

Defined in Data.Aeson

Exception CardanoQueryException # 
Instance details

Defined in GeniusYield.CardanoApi.Query

Exception SubmitTxException # 
Instance details

Defined in GeniusYield.Providers.Common

Exception BuildTxException # 
Instance details

Defined in GeniusYield.Transaction

Exception GYTxMonadException # 
Instance details

Defined in GeniusYield.TxBuilder.Errors

Exception GYAwaitTxException # 
Instance details

Defined in GeniusYield.Types.Providers

Exception NestedAtomically

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 NonTermination

Since: base-4.0

Instance details

Defined in Control.Exception.Base

Exception PatternMatchFail

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 RecSelError

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 TypeError

Since: base-4.9.0.0

Instance details

Defined in Control.Exception.Base

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

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 AllocationLimitExceeded

Since: base-4.8.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 AssertionFailed

Since: base-4.1.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 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 CompactionFailed

Since: base-4.10.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 ExitCode

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 IOException

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

Defined in Basement.String.Encoding.ASCII7

Methods

toException ∷ ASCII7_Invalid → SomeException Source #

fromExceptionSomeExceptionMaybe ASCII7_Invalid Source #

displayException ∷ ASCII7_Invalid → String Source #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException ∷ ISO_8859_1_Invalid → SomeException Source #

fromExceptionSomeExceptionMaybe ISO_8859_1_Invalid Source #

displayException ∷ ISO_8859_1_Invalid → String Source #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException ∷ UTF16_Invalid → SomeException Source #

fromExceptionSomeExceptionMaybe UTF16_Invalid Source #

displayException ∷ UTF16_Invalid → String Source #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException ∷ UTF32_Invalid → SomeException Source #

fromExceptionSomeExceptionMaybe UTF32_Invalid Source #

displayException ∷ UTF32_Invalid → String Source #

Exception HumanReadablePartError 
Instance details

Defined in Codec.Binary.Bech32.Internal

Exception BimapException 
Instance details

Defined in Data.Bimap

Methods

toException ∷ BimapException → SomeException Source #

fromExceptionSomeExceptionMaybe BimapException Source #

displayException ∷ BimapException → String Source #

Exception ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Byron

Exception ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Icarus

Exception ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

Exception ErrInspectAddressOnlyShelley 
Instance details

Defined in Cardano.Address.Style.Shelley

Exception ErrorAsException 
Instance details

Defined in Cardano.Api.Error

Methods

toException ∷ ErrorAsException → SomeException Source #

fromExceptionSomeExceptionMaybe ErrorAsException Source #

displayException ∷ ErrorAsException → String Source #

Exception AlonzoGenesisError 
Instance details

Defined in Cardano.Api.LedgerState

Methods

toException ∷ AlonzoGenesisError → SomeException Source #

fromExceptionSomeExceptionMaybe AlonzoGenesisError Source #

displayException ∷ AlonzoGenesisError → String Source #

Exception ConwayGenesisError 
Instance details

Defined in Cardano.Api.LedgerState

Methods

toException ∷ ConwayGenesisError → SomeException Source #

fromExceptionSomeExceptionMaybe ConwayGenesisError Source #

displayException ∷ ConwayGenesisError → String Source #

Exception GenesisConfigError 
Instance details

Defined in Cardano.Api.LedgerState

Exception InitialLedgerStateError 
Instance details

Defined in Cardano.Api.LedgerState

Exception LedgerStateError 
Instance details

Defined in Cardano.Api.LedgerState

Exception ShelleyGenesisError 
Instance details

Defined in Cardano.Api.LedgerState

Methods

toException ∷ ShelleyGenesisError → SomeException Source #

fromExceptionSomeExceptionMaybe ShelleyGenesisError Source #

displayException ∷ ShelleyGenesisError → String Source #

Exception DecoderError 
Instance details

Defined in Cardano.Binary.FromCBOR

Exception SeedBytesExhausted 
Instance details

Defined in Cardano.Crypto.Seed

Exception EpochErr 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toException ∷ EpochErr → SomeException Source #

fromExceptionSomeExceptionMaybe EpochErr Source #

displayException ∷ EpochErr → String Source #

Exception DeserialiseFailure 
Instance details

Defined in Codec.CBOR.Read

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Exception FsError 
Instance details

Defined in System.FS.API.Types

Exception EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

toException ∷ EncapsulatedPopperException → SomeException Source #

fromExceptionSomeExceptionMaybe EncapsulatedPopperException Source #

displayException ∷ EncapsulatedPopperException → String Source #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException ∷ HttpExceptionContentWrapper → SomeException Source #

fromExceptionSomeExceptionMaybe HttpExceptionContentWrapper Source #

displayException ∷ HttpExceptionContentWrapper → String Source #

Exception DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Monad.Class.MonadAsync

Exception BlockedIndefinitely 
Instance details

Defined in Control.Monad.Class.MonadSTM.Internal

Methods

toException ∷ BlockedIndefinitely → SomeException Source #

fromExceptionSomeExceptionMaybe BlockedIndefinitely Source #

displayException ∷ BlockedIndefinitely → String Source #

Exception MaestroError 
Instance details

Defined in Maestro.Client.Error

Exception DataMeasureClassOverflowException 
Instance details

Defined in Data.Measure.Class

Exception InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Exception MuxError 
Instance details

Defined in Network.Mux.Trace

Exception MuxRuntimeError 
Instance details

Defined in Network.Mux.Types

Exception HardForkEncoderException 
Instance details

Defined in Ouroboros.Consensus.HardFork.Combinator.Serialisation.Common

Exception PastHorizonException 
Instance details

Defined in Ouroboros.Consensus.HardFork.History.Qry

Exception ChainSyncClientException 
Instance details

Defined in Ouroboros.Consensus.MiniProtocol.ChainSync.Client

Exception ChunkAssertionFailure 
Instance details

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

Exception RegistryClosedException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Exception ResourceRegistryThreadException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Exception TempRegistryException 
Instance details

Defined in Ouroboros.Consensus.Util.ResourceRegistry

Exception UnexpectedAlonzoLedgerErrors 
Instance details

Defined in Ouroboros.Consensus.Shelley.Eras

Exception ShelleyReapplyException 
Instance details

Defined in Ouroboros.Consensus.Shelley.Ledger.Ledger

Exception TxSubmissionProtocolError 
Instance details

Defined in Ouroboros.Network.TxSubmission.Inbound

Exception KeepAliveProtocolFailure 
Instance details

Defined in Ouroboros.Network.Protocol.KeepAlive.Type

Exception FreeVariableError 
Instance details

Defined in PlutusCore.DeBruijn.Internal

Exception CostModelApplyError 
Instance details

Defined in PlutusCore.Evaluation.Machine.CostModelInterface

Exception ScriptDecodeError 
Instance details

Defined in PlutusLedgerApi.Common.SerialisedScript

Exception LedgerBytesError 
Instance details

Defined in PlutusLedgerApi.V1.Bytes

Exception ImpossibleDeserialisationFailure 
Instance details

Defined in PlutusTx.Code

Exception ResultError 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Exception FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Exception ManyErrors 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Exception InvalidBaseUrlException 
Instance details

Defined in Servant.Client.Core.BaseUrl

Exception ClientError 
Instance details

Defined in Servant.Client.Core.ClientError

Exception AssertionException 
Instance details

Defined in Control.State.Transition.Extended

Exception ResourceError 
Instance details

Defined in Test.Tasty.Core

Methods

toException ∷ ResourceError → SomeException Source #

fromExceptionSomeExceptionMaybe ResourceError Source #

displayException ∷ ResourceError → String Source #

Exception HUnitFailure 
Instance details

Defined in Test.Tasty.HUnit.Orig

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

KnownNat csz ⇒ Exception (MnemonicException csz) 
Instance details

Defined in Cardano.Mnemonic

(Typeable blk, Show (SomeSecond BlockQuery blk)) ⇒ Exception (QueryEncoderException blk) 
Instance details

Defined in Ouroboros.Consensus.Ledger.Query

Methods

toException ∷ QueryEncoderException blk → SomeException Source #

fromExceptionSomeExceptionMaybe (QueryEncoderException blk) Source #

displayException ∷ QueryEncoderException blk → String Source #

(Typeable blk, StandardHash blk) ⇒ Exception (ChainDbError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

(Typeable blk, StandardHash blk) ⇒ Exception (ChainDbFailure blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ChainDB.API

(StandardHash blk, Typeable blk) ⇒ Exception (ImmutableDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.ImmutableDB.API

(StandardHash blk, Typeable blk) ⇒ Exception (VolatileDBError blk) 
Instance details

Defined in Ouroboros.Consensus.Storage.VolatileDB.API

(Typeable vNumber, Show vNumber) ⇒ Exception (HandshakeProtocolError vNumber) 
Instance details

Defined in Ouroboros.Network.Protocol.Handshake.Type

(Typeable vNumber, Show vNumber) ⇒ Exception (RefuseReason vNumber) 
Instance details

Defined in Ouroboros.Network.Protocol.Handshake.Type

Exception (UniqueError SrcSpan) 
Instance details

Defined in PlutusCore.Error

(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

(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

(Typeable era, Typeable proto) ⇒ Exception (ShelleyEncoderException era proto) 
Instance details

Defined in Ouroboros.Consensus.Shelley.Node.Serialisation

Methods

toException ∷ ShelleyEncoderException era proto → SomeException Source #

fromExceptionSomeExceptionMaybe (ShelleyEncoderException era proto) Source #

displayException ∷ ShelleyEncoderException era proto → String Source #

(PrettyPlc cause, PrettyPlc err, Typeable cause, Typeable err) ⇒ Exception (ErrorWithCause err cause) 
Instance details

Defined in PlutusCore.Evaluation.Machine.Exception

(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 Source #

fromExceptionSomeExceptionMaybe (Error uni fun ann) Source #

displayException ∷ Error uni fun ann → String Source #

catch Source #

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 propagated further up. If you call it again, you might get the opposite behaviour. This is ok, because catch is an IO computation.

throwIOException e ⇒ e → IO a Source #

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.

newtype Identity a Source #

Identity functor and monad. (a non-strict monad)

Since: base-4.8.0.0

Constructors

Identity 

Fields

Instances

Instances details
Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity Source #

Methods

tabulate ∷ (Rep Identity → a) → Identity a Source #

indexIdentity a → Rep Identity → a Source #

FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON ∷ (ValueParser a) → (ValueParser [a]) → ValueParser (Identity a) Source #

liftParseJSONList ∷ (ValueParser a) → (ValueParser [a]) → ValueParser [Identity a] Source #

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON ∷ (a → Value) → ([a] → Value) → Identity a → Value Source #

liftToJSONList ∷ (a → Value) → ([a] → Value) → [Identity a] → Value Source #

liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Identity a → Encoding Source #

liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Identity a] → Encoding Source #

MonadFix Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

mfix ∷ (a → Identity a) → Identity a Source #

Foldable Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

foldMonoid m ⇒ Identity m → m Source #

foldMapMonoid m ⇒ (a → m) → Identity a → m Source #

foldMap'Monoid m ⇒ (a → m) → Identity a → m Source #

foldr ∷ (a → b → b) → b → Identity a → b Source #

foldr' ∷ (a → b → b) → b → Identity a → b Source #

foldl ∷ (b → a → b) → b → Identity a → b Source #

foldl' ∷ (b → a → b) → b → Identity a → b Source #

foldr1 ∷ (a → a → a) → Identity a → a Source #

foldl1 ∷ (a → a → a) → Identity a → a Source #

toListIdentity a → [a] Source #

nullIdentity a → Bool Source #

lengthIdentity a → Int Source #

elemEq a ⇒ a → Identity a → Bool Source #

maximumOrd a ⇒ Identity a → a Source #

minimumOrd a ⇒ Identity a → a Source #

sumNum a ⇒ Identity a → a Source #

productNum a ⇒ Identity a → a Source #

Foldable Node 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

foldMonoid m ⇒ Node m → m Source #

foldMapMonoid m ⇒ (a → m) → Node a → m Source #

foldMap'Monoid m ⇒ (a → m) → Node a → m Source #

foldr ∷ (a → b → b) → b → Node a → b Source #

foldr' ∷ (a → b → b) → b → Node a → b Source #

foldl ∷ (b → a → b) → b → Node a → b Source #

foldl' ∷ (b → a → b) → b → Node a → b Source #

foldr1 ∷ (a → a → a) → Node a → a Source #

foldl1 ∷ (a → a → a) → Node a → a Source #

toListNode a → [a] Source #

nullNode a → Bool Source #

lengthNode a → Int Source #

elemEq a ⇒ a → Node a → Bool Source #

maximumOrd a ⇒ Node a → a Source #

minimumOrd a ⇒ Node a → a Source #

sumNum a ⇒ Node a → a Source #

productNum a ⇒ Node a → a Source #

Foldable Tree 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

foldMonoid m ⇒ Tree m → m Source #

foldMapMonoid m ⇒ (a → m) → Tree a → m Source #

foldMap'Monoid m ⇒ (a → m) → Tree a → m Source #

foldr ∷ (a → b → b) → b → Tree a → b Source #

foldr' ∷ (a → b → b) → b → Tree a → b Source #

foldl ∷ (b → a → b) → b → Tree a → b Source #

foldl' ∷ (b → a → b) → b → Tree a → b Source #

foldr1 ∷ (a → a → a) → Tree a → a Source #

foldl1 ∷ (a → a → a) → Tree a → a Source #

toListTree a → [a] Source #

nullTree a → Bool Source #

lengthTree a → Int Source #

elemEq a ⇒ a → Tree a → Bool Source #

maximumOrd a ⇒ Tree a → a Source #

minimumOrd a ⇒ Tree a → a Source #

sumNum a ⇒ Tree a → a Source #

productNum a ⇒ Tree a → a Source #

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

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

Read1 Identity

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec ∷ (IntReadS a) → ReadS [a] → IntReadS (Identity a) Source #

liftReadList ∷ (IntReadS a) → ReadS [a] → ReadS [Identity a] Source #

liftReadPrecReadPrec a → ReadPrec [a] → ReadPrec (Identity a) Source #

liftReadListPrecReadPrec a → ReadPrec [a] → ReadPrec [Identity a] Source #

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

liftShowList ∷ (Int → a → ShowS) → ([a] → ShowS) → [Identity a] → ShowS Source #

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) Source #

sequenceAApplicative f ⇒ Identity (f a) → f (Identity a) Source #

mapMMonad m ⇒ (a → m b) → Identity a → m (Identity b) Source #

sequenceMonad m ⇒ Identity (m a) → m (Identity a) Source #

Traversable Node 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

traverseApplicative f ⇒ (a → f b) → Node a → f (Node b) Source #

sequenceAApplicative f ⇒ Node (f a) → f (Node a) Source #

mapMMonad m ⇒ (a → m b) → Node a → m (Node b) Source #

sequenceMonad m ⇒ Node (m a) → m (Node a) Source #

Traversable Tree 
Instance details

Defined in Hedgehog.Internal.Tree

Methods

traverseApplicative f ⇒ (a → f b) → Tree a → f (Tree b) Source #

sequenceAApplicative f ⇒ Tree (f a) → f (Tree a) Source #

mapMMonad m ⇒ (a → m b) → Tree a → m (Tree b) Source #

sequenceMonad m ⇒ Tree (m a) → m (Tree a) Source #

Applicative Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

pure ∷ a → Identity a Source #

(<*>)Identity (a → b) → Identity a → Identity b Source #

liftA2 ∷ (a → b → c) → Identity a → Identity b → Identity c Source #

(*>)Identity a → Identity b → Identity b Source #

(<*)Identity a → Identity b → Identity a Source #

Functor Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

fmap ∷ (a → b) → Identity a → Identity b Source #

(<$) ∷ a → Identity b → Identity a Source #

Monad Identity

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(>>=)Identity a → (a → Identity b) → Identity b Source #

(>>)Identity a → Identity b → Identity b Source #

return ∷ a → Identity a Source #

HKDFunctor Identity 
Instance details

Defined in Cardano.Ledger.HKD

Methods

hkdMap ∷ proxy Identity → (a → b) → HKD Identity a → HKD Identity b Source #

NFData1 Identity

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf ∷ (a → ()) → Identity a → () Source #

Distributive Identity 
Instance details

Defined in Data.Distributive

Methods

distributeFunctor f ⇒ f (Identity a) → Identity (f a) Source #

collectFunctor f ⇒ (a → Identity b) → f a → Identity (f b) Source #

distributeMMonad m ⇒ m (Identity a) → Identity (m a) Source #

collectMMonad m ⇒ (a → Identity b) → m a → Identity (m b) Source #

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt ∷ (Int → a → Int) → IntIdentity a → Int Source #

Settable Identity

So you can pass our Setter into combinators from other lens libraries.

Instance details

Defined in Control.Lens.Internal.Setter

Methods

untaintedIdentity a → a Source #

untaintedDotProfunctor p ⇒ p a (Identity b) → p a b Source #

taintedDotProfunctor p ⇒ p a b → p a (Identity b) Source #

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity ∷ k → Type Source #

Methods

from1 ∷ ∀ (a ∷ k). Identity a → Rep1 Identity a Source #

to1 ∷ ∀ (a ∷ k). Rep1 Identity a → Identity a Source #

Vector Identity a 
Instance details

Defined in Data.Vector.Fixed.Cont

Methods

constructFun (Peano (Dim Identity)) a (Identity a) Source #

inspectIdentity a → Fun (Peano (Dim Identity)) a b → b Source #

basicIndexIdentity a → Int → a Source #

FoldableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (() → a → m) → Identity a → m Source #

ifoldMap'Monoid m ⇒ (() → a → m) → Identity a → m Source #

ifoldr ∷ (() → a → b → b) → b → Identity a → b Source #

ifoldl ∷ (() → b → a → b) → b → Identity a → b Source #

ifoldr' ∷ (() → a → b → b) → b → Identity a → b Source #

ifoldl' ∷ (() → b → a → b) → b → Identity a → b Source #

FunctorWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

imap ∷ (() → a → b) → Identity a → Identity b Source #

TraversableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (() → a → f b) → Identity a → f (Identity b) Source #

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a Source #

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieveReifiedGetter a b → Identity a → b Source #

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieveReifiedGetter a b → a → Identity b Source #

PrettyBy config a ⇒ DefaultPrettyBy config (Identity a) 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → Identity a → Doc ann Source #

defaultPrettyListBy ∷ config → [Identity a] → Doc ann Source #

PrettyDefaultBy config (Identity a) ⇒ PrettyBy config (Identity a)
>>> prettyBy () (Identity True)
True
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → Identity a → Doc ann Source #

prettyListBy ∷ config → [Identity a] → Doc ann Source #

Unbox a ⇒ Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a ⇒ MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

FromJSON a ⇒ FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey a ⇒ FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a ⇒ ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey a ⇒ ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a ⇒ Data (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Data

Methods

gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Identity a → c (Identity a) Source #

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Identity a) Source #

toConstrIdentity a → Constr Source #

dataTypeOfIdentity a → DataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Identity a)) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Identity a)) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → Identity a → Identity a Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Identity a → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Identity a → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Identity a → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Identity a → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Identity a → m (Identity a) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Identity a → m (Identity a) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Identity a → m (Identity a) Source #

IsString a ⇒ IsString (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.String

Methods

fromStringStringIdentity a Source #

Storable a ⇒ Storable (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Methods

sizeOfIdentity a → Int Source #

alignmentIdentity a → Int Source #

peekElemOffPtr (Identity a) → IntIO (Identity a) Source #

pokeElemOffPtr (Identity a) → IntIdentity a → IO () Source #

peekByteOffPtr b → IntIO (Identity a) Source #

pokeByteOffPtr b → IntIdentity a → IO () Source #

peekPtr (Identity a) → IO (Identity a) Source #

pokePtr (Identity a) → Identity a → IO () Source #

Monoid a ⇒ Monoid (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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

sconcatNonEmpty (Identity a) → Identity a Source #

stimesIntegral b ⇒ b → Identity a → Identity a Source #

Bits a ⇒ Bits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

FiniteBits a ⇒ FiniteBits (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Bounded a ⇒ Bounded (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Enum a ⇒ Enum (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Floating a ⇒ Floating (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

RealFloat a ⇒ RealFloat (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) ∷ TypeType Source #

Methods

fromIdentity a → Rep (Identity a) x Source #

toRep (Identity a) x → Identity a Source #

Ix a ⇒ Ix (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Num a ⇒ Num (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

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

Fractional a ⇒ Fractional (Identity a)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Identity

Integral a ⇒ Integral (Identity a)

Since: base-4.9.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

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) Source #

truncateIntegral b ⇒ Identity a → b Source #

roundIntegral b ⇒ Identity a → b Source #

ceilingIntegral b ⇒ Identity a → b Source #

floorIntegral b ⇒ Identity a → b Source #

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

Show (DowngradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Show (UpgradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Crypto c ⇒ DecCBOR (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

decCBORDecoder s (Pulser c) Source #

dropCBORProxy (Pulser c) → Decoder s () Source #

labelProxy (Pulser c) → Text Source #

Crypto c ⇒ EncCBOR (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

encCBORPulser c → Encoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy (Pulser c) → Size Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Pulser c] → Size Source #

FromField a ⇒ FromField (Identity a)

Since: cassava-0.5.2.0

Instance details

Defined in Data.Csv.Conversion

Methods

parseFieldFieldParser (Identity a) Source #

ToField a ⇒ ToField (Identity a)

Since: cassava-0.5.2.0

Instance details

Defined in Data.Csv.Conversion

Methods

toFieldIdentity a → Field Source #

NFData a ⇒ NFData (Identity a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfIdentity a → () Source #

NFData (DowngradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

NFData (UpgradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

NFData (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Methods

rnfPulser c → () Source #

Eq a ⇒ Eq (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

(==)Identity a → Identity a → Bool Source #

(/=)Identity a → Identity a → Bool Source #

Eq (DowngradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Eq (UpgradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Ord a ⇒ Ord (Identity a)

Since: base-4.8.0.0

Instance details

Defined in Data.Functor.Identity

Methods

compareIdentity a → Identity a → Ordering Source #

(<)Identity a → Identity a → Bool Source #

(<=)Identity a → Identity a → Bool Source #

(>)Identity a → Identity a → Bool Source #

(>=)Identity a → Identity a → Bool Source #

maxIdentity a → Identity a → Identity a Source #

minIdentity a → Identity a → Identity a Source #

Abelian a ⇒ Abelian (Identity a) 
Instance details

Defined in Data.Group

Cyclic a ⇒ Cyclic (Identity a) 
Instance details

Defined in Data.Group

Methods

generatorIdentity a Source #

Group a ⇒ Group (Identity a)

Identity lifts groups pointwise (at only one point).

Instance details

Defined in Data.Group

Methods

invertIdentity a → Identity a Source #

(~~)Identity a → Identity a → Identity a Source #

powIntegral x ⇒ Identity a → x → Identity a Source #

Hashable a ⇒ Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntIdentity a → Int Source #

hashIdentity a → Int Source #

FromFormKey a ⇒ FromFormKey (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey a ⇒ ToFormKey (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyIdentity a → Text Source #

FromHttpApiData a ⇒ FromHttpApiData (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a ⇒ ToHttpApiData (Identity a)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.HttpApiData

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ixIndex (Identity a) → Traversal' (Identity a) (IxValue (Identity a)) Source #

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a) Source #

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element (Identity a) → m) → Identity a → m Source #

ofoldr ∷ (Element (Identity a) → b → b) → b → Identity a → b Source #

ofoldl' ∷ (a0 → Element (Identity a) → a0) → a0 → Identity a → a0 Source #

otoListIdentity a → [Element (Identity a)] Source #

oall ∷ (Element (Identity a) → Bool) → Identity a → Bool Source #

oany ∷ (Element (Identity a) → Bool) → Identity a → Bool Source #

onullIdentity a → Bool Source #

olengthIdentity a → Int Source #

olength64Identity a → Int64 Source #

ocompareLengthIntegral i ⇒ Identity a → i → Ordering Source #

otraverse_Applicative f ⇒ (Element (Identity a) → f b) → Identity a → f () Source #

ofor_Applicative f ⇒ Identity a → (Element (Identity a) → f b) → f () Source #

omapM_Applicative m ⇒ (Element (Identity a) → m ()) → Identity a → m () Source #

oforM_Applicative m ⇒ Identity a → (Element (Identity a) → m ()) → m () Source #

ofoldlMMonad m ⇒ (a0 → Element (Identity a) → m a0) → a0 → Identity a → m a0 Source #

ofoldMap1ExSemigroup m ⇒ (Element (Identity a) → m) → Identity a → m Source #

ofoldr1Ex ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a) Source #

ofoldl1Ex' ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a) Source #

headExIdentity a → Element (Identity a) Source #

lastExIdentity a → Element (Identity a) Source #

unsafeHeadIdentity a → Element (Identity a) Source #

unsafeLastIdentity a → Element (Identity a) Source #

maximumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a) Source #

minimumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a) Source #

oelemElement (Identity a) → Identity a → Bool Source #

onotElemElement (Identity a) → Identity a → Bool Source #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element (Identity a) → Element (Identity a)) → Identity a → Identity a Source #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opointElement (Identity a) → Identity a Source #

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element (Identity a) → f (Element (Identity a))) → Identity a → f (Identity a) Source #

omapMApplicative m ⇒ (Element (Identity a) → m (Element (Identity a))) → Identity a → m (Identity a) Source #

Newtype (Identity a)

Since: newtype-generics-0.5.1

Instance details

Defined in Control.Newtype.Generics

Associated Types

type O (Identity a) Source #

Methods

packO (Identity a) → Identity a Source #

unpackIdentity a → O (Identity a) Source #

NoThunks (DowngradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

NoThunks (UpgradeAlonzoPParams Identity) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Typeable c ⇒ NoThunks (Pulser c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Ixed (Identity a) 
Instance details

Defined in Optics.At.Core

Associated Types

type IxKind (Identity a) Source #

Methods

ixIndex (Identity a) → Optic' (IxKind (Identity a)) NoIx (Identity a) (IxValue (Identity a)) Source #

FromField a ⇒ FromField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

ToField a ⇒ ToField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldIdentity a → Action Source #

Pretty a ⇒ Pretty (Identity a)
>>> pretty (Identity 1)
1
Instance details

Defined in Prettyprinter.Internal

Methods

prettyIdentity a → Doc ann Source #

prettyList ∷ [Identity a] → Doc ann Source #

Prim a ⇒ Prim (Identity a)

Since: primitive-0.6.5.0

Instance details

Defined in Data.Primitive.Types

Serialise a ⇒ Serialise (Identity a)

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

ToParamSchema a ⇒ ToParamSchema (Identity a) 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Identity a) → ParamSchema t Source #

ToSchema a ⇒ ToSchema (Identity a) 
Instance details

Defined in Data.Swagger.Internal.Schema

Unbox a ⇒ Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

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

_1Lens (Identity a) (Identity b) a b Source #

FromJSON (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

FromJSON (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Crypto c ⇒ ToJSON (AlonzoPParams Identity (AlonzoEra c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

(PParamsHKD Identity era ~ BabbagePParams Identity era, BabbageEraPParams era) ⇒ ToJSON (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

(EraPParams era, PParamsHKD Identity era ~ ShelleyPParams Identity era, ProtVerAtMost era 4, ProtVerAtMost era 6) ⇒ ToJSON (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Era era ⇒ Generic (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Associated Types

type Rep (WitnessSetHKD Identity era) ∷ TypeType Source #

Show (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Show (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Show (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

EraScript era ⇒ Show (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Era era ⇒ FromCBOR (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Era era ⇒ FromCBOR (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Era era ⇒ FromCBOR (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Era era ⇒ ToCBOR (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

toCBORAlonzoPParams Identity era → Encoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (AlonzoPParams Identity era) → Size Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [AlonzoPParams Identity era] → Size Source #

Era era ⇒ ToCBOR (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Era era ⇒ ToCBOR (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Era era ⇒ DecCBOR (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Era era ⇒ DecCBOR (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Era era ⇒ DecCBOR (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Era era ⇒ EncCBOR (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Era era ⇒ EncCBOR (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Era era ⇒ EncCBOR (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

NFData (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Methods

rnfAlonzoPParams Identity era → () Source #

NFData (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Methods

rnfBabbagePParams Identity era → () Source #

NFData (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Methods

rnfShelleyPParams Identity era → () Source #

(Era era, NFData (Script era), NFData (WitVKey 'Witness (EraCrypto era)), NFData (BootstrapWitness (EraCrypto era))) ⇒ NFData (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Methods

rnfWitnessSetHKD Identity era → () Source #

Eq (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Eq (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Eq (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

EraScript era ⇒ Eq (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

Ord (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Ord (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

Ord (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

NoThunks (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

NoThunks (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

NoThunks (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

(Era era, NoThunks (Script era)) ⇒ NoThunks (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

ToExpr (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

ToExpr (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

ToExpr (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Dim Identity 
Instance details

Defined in Data.Vector.Fixed.Cont

type Dim Identity = 1
type Rep1 Identity

Since: base-4.8.0.0

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 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)

Since: base-4.8.0.0

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 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 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 Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
type O (Identity a) 
Instance details

Defined in Control.Newtype.Generics

type O (Identity a) = a
type Index (Identity a) 
Instance details

Defined in Optics.At.Core

type Index (Identity a) = ()
type IxKind (Identity a) 
Instance details

Defined in Optics.At.Core

type IxValue (Identity a) 
Instance details

Defined in Optics.At.Core

type IxValue (Identity a) = a
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)
type Rep (WitnessSetHKD Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxWits

type Rep (WitnessSetHKD Identity era) = D1 ('MetaData "WitnessSetHKD" "Cardano.Ledger.Shelley.TxWits" "cardano-ledger-shelley-1.2.0.0-c9ff9fda8cd07e927593824274ea8fe53c9a5f16dc078acb2c6353b6eacf62b0" 'False) (C1 ('MetaCons "WitnessSet'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "addrWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (WitVKey 'Witness (EraCrypto era))))) :*: S1 ('MetaSel ('Just "scriptWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Map (ScriptHash (EraCrypto era)) (Script era))))) :*: (S1 ('MetaSel ('Just "bootWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (BootstrapWitness (EraCrypto era))))) :*: S1 ('MetaSel ('Just "txWitsBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))

foldM ∷ (Foldable t, Monad m) ⇒ (b → a → m b) → b → t a → m b Source #

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

unlessApplicative f ⇒ Bool → f () → f () Source #

The reverse of when.

absurdVoid → a Source #

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

Uninhabited data type

Since: base-4.8.0.0

Instances

Instances details
HasTrie Void 
Instance details

Defined in Data.MemoTrie

Associated Types

data (:->:) VoidTypeType Source #

Methods

trie ∷ (Void → b) → Void :->: b Source #

untrie ∷ (Void :->: b) → Void → b Source #

enumerate ∷ (Void :->: b) → [(Void, b)] Source #

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Void

Since: aeson-2.1.2.0

Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Void

Since: aeson-2.1.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

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

gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c Void Source #

toConstrVoidConstr Source #

dataTypeOfVoidDataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c Void) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c Void) Source #

gmapT ∷ (∀ b. Data b ⇒ b → b) → VoidVoid Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Void → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Void → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → Void → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → Void → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void Source #

Semigroup Void

Since: base-4.9.0.0

Instance details

Defined in Data.Void

Methods

(<>)VoidVoidVoid Source #

sconcatNonEmpty VoidVoid Source #

stimesIntegral b ⇒ b → VoidVoid Source #

Exception Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep VoidTypeType Source #

Methods

fromVoidRep Void x Source #

toRep Void x → Void Source #

Ix Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

range ∷ (Void, Void) → [Void] Source #

index ∷ (Void, Void) → VoidInt Source #

unsafeIndex ∷ (Void, Void) → VoidInt Source #

inRange ∷ (Void, Void) → VoidBool Source #

rangeSize ∷ (Void, Void) → Int Source #

unsafeRangeSize ∷ (Void, Void) → Int Source #

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

showVoidString Source #

showList ∷ [Void] → ShowS Source #

FromCBOR Void 
Instance details

Defined in Cardano.Binary.FromCBOR

ToCBOR Void 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORVoidEncoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy VoidSize Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Void] → Size Source #

DecCBOR Void 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.DecCBOR

EncCBOR Void 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

Methods

encCBORVoidEncoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy VoidSize Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Void] → Size Source #

NFData Void

Defined as rnf = absurd.

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnfVoid → () Source #

Buildable Void 
Instance details

Defined in Formatting.Buildable

Methods

buildVoidBuilder Source #

Eq Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

(==)VoidVoidBool Source #

(/=)VoidVoidBool Source #

Ord Void

Since: base-4.8.0.0

Instance details

Defined in Data.Void

Methods

compareVoidVoidOrdering Source #

(<)VoidVoidBool Source #

(<=)VoidVoidBool Source #

(>)VoidVoidBool Source #

(>=)VoidVoidBool Source #

maxVoidVoidVoid Source #

minVoidVoidVoid Source #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntVoidInt Source #

hashVoidInt Source #

FromFormKey Void 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Void 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyVoidText Source #

FromHttpApiData Void

Parsing a Void value is always an error, considering Void as a data type with no constructors.

Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

ShowErrorComponent Void 
Instance details

Defined in Text.Megaparsec.Error

NoThunks Void 
Instance details

Defined in NoThunks.Class

FromData Void 
Instance details

Defined in PlutusTx.IsData.Class

ToData Void 
Instance details

Defined in PlutusTx.IsData.Class

UnsafeFromData Void 
Instance details

Defined in PlutusTx.IsData.Class

Pretty Void

Finding a good example for printing something that does not exist is hard, so here is an example of printing a list full of nothing.

>>> pretty ([] :: [Void])
[]
Instance details

Defined in Prettyprinter.Internal

Methods

prettyVoidDoc ann Source #

prettyList ∷ [Void] → Doc ann Source #

Finite Void 
Instance details

Defined in System.Random.GFinite

Methods

cardinalityProxy# Void → Cardinality

toFiniteIntegerVoid

fromFiniteVoidInteger

Serialise Void

Since: serialise-0.2.4.0

Instance details

Defined in Codec.Serialise.Class

DefaultPrettyBy config Void 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → VoidDoc ann Source #

defaultPrettyListBy ∷ config → [Void] → Doc ann Source #

PrettyDefaultBy config VoidPrettyBy config Void
>>> prettyBy () ([] :: [Void])
[]
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → VoidDoc ann Source #

prettyListBy ∷ config → [Void] → Doc ann Source #

Lift Void

Since: template-haskell-2.15.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftQuote m ⇒ Void → m Exp Source #

liftTyped ∷ ∀ (m ∷ TypeType). Quote m ⇒ VoidCode m Void Source #

FoldableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Proxy a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → Proxy a → m Source #

ifoldr ∷ (Void → a → b → b) → b → Proxy a → b Source #

ifoldl ∷ (Void → b → a → b) → b → Proxy a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → Proxy a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → Proxy a → b Source #

FoldableWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → U1 a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → U1 a → m Source #

ifoldr ∷ (Void → a → b → b) → b → U1 a → b Source #

ifoldl ∷ (Void → b → a → b) → b → U1 a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → U1 a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → U1 a → b Source #

FoldableWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → V1 a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → V1 a → m Source #

ifoldr ∷ (Void → a → b → b) → b → V1 a → b Source #

ifoldl ∷ (Void → b → a → b) → b → V1 a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → V1 a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → V1 a → b Source #

FunctorWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Proxy a → Proxy b Source #

FunctorWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → U1 a → U1 b Source #

FunctorWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → V1 a → V1 b Source #

TraversableWithIndex Void (ProxyTypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Proxy a → f (Proxy b) Source #

TraversableWithIndex Void (U1TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → U1 a → f (U1 b) Source #

TraversableWithIndex Void (V1TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → V1 a → f (V1 b) Source #

FilterableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

imapMaybe ∷ (Void → a → Maybe b) → Proxy a → Proxy b Source #

ifilter ∷ (Void → a → Bool) → Proxy a → Proxy a Source #

WitherableWithIndex Void (ProxyTypeType) 
Instance details

Defined in Witherable

Methods

iwitherApplicative f ⇒ (Void → a → f (Maybe b)) → Proxy a → f (Proxy b) Source #

iwitherMMonad m ⇒ (Void → a → m (Maybe b)) → Proxy a → m (Proxy b) Source #

ifilterAApplicative f ⇒ (Void → a → f Bool) → Proxy a → f (Proxy a) Source #

FoldableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Const e a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → Const e a → m Source #

ifoldr ∷ (Void → a → b → b) → b → Const e a → b Source #

ifoldl ∷ (Void → b → a → b) → b → Const e a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → Const e a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → Const e a → b Source #

FoldableWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → Constant e a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → Constant e a → m Source #

ifoldr ∷ (Void → a → b → b) → b → Constant e a → b Source #

ifoldl ∷ (Void → b → a → b) → b → Constant e a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → Constant e a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → Constant e a → b Source #

FunctorWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Const e a → Const e b Source #

FunctorWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → Constant e a → Constant e b Source #

TraversableWithIndex Void (Const e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Const e a → f (Const e b) Source #

TraversableWithIndex Void (Constant e ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

itraverseApplicative f ⇒ (Void → a → f b) → Constant e a → f (Constant e b) Source #

FoldableWithIndex Void (K1 i c ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

ifoldMapMonoid m ⇒ (Void → a → m) → K1 i c a → m Source #

ifoldMap'Monoid m ⇒ (Void → a → m) → K1 i c a → m Source #

ifoldr ∷ (Void → a → b → b) → b → K1 i c a → b Source #

ifoldl ∷ (Void → b → a → b) → b → K1 i c a → b Source #

ifoldr' ∷ (Void → a → b → b) → b → K1 i c a → b Source #

ifoldl' ∷ (Void → b → a → b) → b → K1 i c a → b Source #

FunctorWithIndex Void (K1 i c ∷ TypeType) 
Instance details

Defined in WithIndex

Methods

imap ∷ (Void → a → b) → K1 i c a → K1 i c b Source #

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) Source #

Newtype (Void :->: a) 
Instance details

Defined in Data.MemoTrie

Associated Types

type O (Void :->: a) Source #

Methods

packO (Void :->: a) → Void :->: a Source #

unpack ∷ (Void :->: a) → O (Void :->: a) Source #

data Void :->: a 
Instance details

Defined in Data.MemoTrie

data Void :->: a = VoidTrie
type Rep Void

Since: base-4.8.0.0

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]])
type O (Void :->: a) 
Instance details

Defined in Data.MemoTrie

type O (Void :->: a) = ()

data Text Source #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
Structured Text 
Instance details

Defined in Distribution.Utils.Structured

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text Source #

FromCBOR Text 
Instance details

Defined in Cardano.Binary.FromCBOR

ToCBOR Text 
Instance details

Defined in Cardano.Binary.ToCBOR

Methods

toCBORTextEncoding Source #

encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy TextSize Source #

encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Text] → Size Source #

DecCBOR Text 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.DecCBOR

EncCBOR Text 
Instance details

Defined in Cardano.Ledger.Binary.Encoding.EncCBOR

Methods

encCBORTextEncoding Source #

encodedSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy TextSize Source #

encodedListSizeExpr ∷ (∀ t. EncCBOR t ⇒ Proxy t → Size) → Proxy [Text] → Size Source #

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCaseTextText Source #

foldCaseList ∷ [Text] → [Text]

FromField Text

Assumes UTF-8 encoding. Fails on invalid byte sequences.

Instance details

Defined in Data.Csv.Conversion

ToField Text

Uses UTF-8 encoding.

Instance details

Defined in Data.Csv.Conversion

Methods

toFieldTextField Source #

Buildable Text 
Instance details

Defined in Formatting.Buildable

Methods

buildTextBuilder Source #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSaltIntTextInt Source #

hashTextInt Source #

FromFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKeyTextText Source #

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

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text Source #

type Tokens Text Source #

TraversableStream Text 
Instance details

Defined in Text.Megaparsec.Stream

VisualStream Text 
Instance details

Defined in Text.Megaparsec.Stream

MonoZip Text 
Instance details

Defined in Data.Containers

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMapMonoid m ⇒ (Element Text → m) → Text → m Source #

ofoldr ∷ (Element Text → b → b) → b → Text → b Source #

ofoldl' ∷ (a → Element Text → a) → a → Text → a Source #

otoListText → [Element Text] Source #

oall ∷ (Element TextBool) → TextBool Source #

oany ∷ (Element TextBool) → TextBool Source #

onullTextBool Source #

olengthTextInt Source #

olength64TextInt64 Source #

ocompareLengthIntegral i ⇒ Text → i → Ordering Source #

otraverse_Applicative f ⇒ (Element Text → f b) → Text → f () Source #

ofor_Applicative f ⇒ Text → (Element Text → f b) → f () Source #

omapM_Applicative m ⇒ (Element Text → m ()) → Text → m () Source #

oforM_Applicative m ⇒ Text → (Element Text → m ()) → m () Source #

ofoldlMMonad m ⇒ (a → Element Text → m a) → a → Text → m a Source #

ofoldMap1ExSemigroup m ⇒ (Element Text → m) → Text → m Source #

ofoldr1Ex ∷ (Element TextElement TextElement Text) → TextElement Text Source #

ofoldl1Ex' ∷ (Element TextElement TextElement Text) → TextElement Text Source #

headExTextElement Text Source #

lastExTextElement Text Source #

unsafeHeadTextElement Text Source #

unsafeLastTextElement Text Source #

maximumByEx ∷ (Element TextElement TextOrdering) → TextElement Text Source #

minimumByEx ∷ (Element TextElement TextOrdering) → TextElement Text Source #

oelemElement TextTextBool Source #

onotElemElement TextTextBool Source #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap ∷ (Element TextElement Text) → TextText Source #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opointElement TextText Source #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverseApplicative f ⇒ (Element Text → f (Element Text)) → Text → f Text Source #

omapMApplicative m ⇒ (Element Text → m (Element Text)) → Text → m Text Source #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList ∷ [Element Text] → Text Source #

lengthIndexTextIndex Text Source #

break ∷ (Element TextBool) → Text → (Text, Text) Source #

span ∷ (Element TextBool) → Text → (Text, Text) Source #

dropWhile ∷ (Element TextBool) → TextText Source #

takeWhile ∷ (Element TextBool) → TextText Source #

splitAtIndex TextText → (Text, Text) Source #

unsafeSplitAtIndex TextText → (Text, Text) Source #

takeIndex TextTextText Source #

unsafeTakeIndex TextTextText Source #

dropIndex TextTextText Source #

unsafeDropIndex TextTextText Source #

dropEndIndex TextTextText Source #

partition ∷ (Element TextBool) → Text → (Text, Text) Source #

unconsTextMaybe (Element Text, Text) Source #

unsnocTextMaybe (Text, Element Text) Source #

filter ∷ (Element TextBool) → TextText Source #

filterMMonad m ⇒ (Element Text → m Bool) → Text → m Text Source #

replicateIndex TextElement TextText Source #

replicateMMonad m ⇒ Index Text → m (Element Text) → m Text Source #

groupBy ∷ (Element TextElement TextBool) → Text → [Text] Source #

groupAllOnEq b ⇒ (Element Text → b) → Text → [Text] Source #

subsequencesText → [Text] Source #

permutationsText → [Text] Source #

tailExTextText Source #

tailMayTextMaybe Text Source #

initExTextText Source #

initMayTextMaybe Text Source #

unsafeTailTextText Source #

unsafeInitTextText Source #

indexTextIndex TextMaybe (Element Text) Source #

indexExTextIndex TextElement Text Source #

unsafeIndexTextIndex TextElement Text Source #

splitWhen ∷ (Element TextBool) → Text → [Text] Source #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text Source #

Textual Text 
Instance details

Defined in Data.Sequences

Methods

wordsText → [Text] Source #

unwords ∷ (Element seq ~ Text, MonoFoldable seq) ⇒ seq → Text Source #

linesText → [Text] Source #

unlines ∷ (Element seq ~ Text, MonoFoldable seq) ⇒ seq → Text Source #

toLowerTextText Source #

toUpperTextText Source #

toCaseFoldTextText Source #

breakWordText → (Text, Text) Source #

breakLineText → (Text, Text) Source #

MonoidNull Text 
Instance details

Defined in Data.Monoid.Null

Methods

nullTextBool Source #

PositiveMonoid Text 
Instance details

Defined in Data.Monoid.Null

NoThunks Text 
Instance details

Defined in NoThunks.Class

FromField Text

name, text, "char", bpchar, varchar

Instance details

Defined in Database.PostgreSQL.Simple.FromField

ToField Text 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldTextAction Source #

Pretty Text

Automatically converts all newlines to line.

>>> pretty ("hello\nworld" :: Text)
hello
world

Note that line can be undone by group:

>>> group (pretty ("hello\nworld" :: Text))
hello world

Manually use hardline if you definitely want newlines.

Instance details

Defined in Prettyprinter.Internal

Methods

prettyTextDoc ann Source #

prettyList ∷ [Text] → Doc ann Source #

Serialise Text

Since: serialise-0.2.0.0

Instance details

Defined in Codec.Serialise.Class

ToParamSchema Text 
Instance details

Defined in Data.Swagger.Internal.ParamSchema

Methods

toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy TextParamSchema t Source #

ToSchema Text 
Instance details

Defined in Data.Swagger.Internal.Schema

FromText Text 
Instance details

Defined in Data.Text.Class

ToText Text 
Instance details

Defined in Data.Text.Class

Methods

toTextTextText Source #

Pretty Text 
Instance details

Defined in Text.PrettyPrint.Annotated.WL

Methods

prettyTextDoc b Source #

prettyList ∷ [Text] → Doc b Source #

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

FromBuiltin BuiltinString Text 
Instance details

Defined in PlutusTx.Builtins.Class

ToBuiltin Text BuiltinString 
Instance details

Defined in PlutusTx.Builtins.Class

DefaultPrettyBy config Text 
Instance details

Defined in Text.PrettyBy.Internal

Methods

defaultPrettyBy ∷ config → TextDoc ann Source #

defaultPrettyListBy ∷ config → [Text] → Doc ann Source #

NonDefaultPrettyBy ConstConfig Text 
Instance details

Defined in PlutusCore.Pretty.PrettyConst

PrettyDefaultBy config TextPrettyBy config Text

Automatically converts all newlines to line.

>>> prettyBy () ("hello\nworld" :: Strict.Text)
hello
world
Instance details

Defined in Text.PrettyBy.Internal

Methods

prettyBy ∷ config → TextDoc ann Source #

prettyListBy ∷ config → [Text] → Doc ann Source #

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyByteStringText Source #

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyByteStringText Source #

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyTextByteString Source #

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyTextByteString Source #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyTextText Source #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyText0Text Source #

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyTextString Source #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyTextText0 Source #

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConvLeniencyStringText Source #

HasDescription Response Text 
Instance details

Defined in Data.Swagger.Lens

HasName License Text 
Instance details

Defined in Data.Swagger.Lens

HasName Param Text 
Instance details

Defined in Data.Swagger.Lens

HasName Tag TagName 
Instance details

Defined in Data.Swagger.Lens

HasTitle Info Text 
Instance details

Defined in Data.Swagger.Lens

HasVersion Info Text 
Instance details

Defined in Data.Swagger.Lens

HasConstantIn DefaultUni term ⇒ MakeKnownIn DefaultUni term Text 
Instance details

Defined in PlutusCore.Default.Universe

Methods

makeKnownTextMakeKnownM term Source #

HasConstantIn DefaultUni term ⇒ ReadKnownIn DefaultUni term Text 
Instance details

Defined in PlutusCore.Default.Universe

Methods

readKnown ∷ term → ReadKnownM Text Source #

KnownBuiltinTypeAst DefaultUni TextKnownTypeAst DefaultUni Text 
Instance details

Defined in PlutusCore.Default.Universe

Associated Types

type IsBuiltin TextBool Source #

type ToHoles Text ∷ [Hole] Source #

type ToBinds acc Text ∷ [Some TyNameRep] Source #

Methods

toTypeAst ∷ proxy TextType TyName DefaultUni () Source #

Contains DefaultUni Text 
Instance details

Defined in PlutusCore.Default.Universe

MimeRender PlainText Text
fromStrict . TextS.encodeUtf8
Instance details

Defined in Servant.API.ContentTypes

MimeUnrender PlainText Text
left show . TextS.decodeUtf8' . toStrict
Instance details

Defined in Servant.API.ContentTypes

HasDefinitions Swagger (Definitions Schema) 
Instance details

Defined in Data.Swagger.Lens

HasDescription ExternalDocs (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Header (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Info (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Param (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription SecurityScheme (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDescription Tag (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasDiscriminator Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasEmail Contact (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasParamSchema s (ParamSchema t) ⇒ HasFormat s (Maybe Format) 
Instance details

Defined in Data.Swagger.Lens

Methods

formatLens' s (Maybe Format) Source #

HasName Contact (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasName NamedSchema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasName Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

nameLens' Xml (Maybe Text) Source #

HasNamespace Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasOperationId Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasParameters Swagger (Definitions Param) 
Instance details

Defined in Data.Swagger.Lens

HasParamSchema s (ParamSchema t) ⇒ HasPattern s (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

Methods

patternLens' s (Maybe Text) Source #

HasPrefix Xml (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasRequired Schema [ParamName] 
Instance details

Defined in Data.Swagger.Lens

HasResponses Swagger (Definitions Response) 
Instance details

Defined in Data.Swagger.Lens

HasSummary Operation (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasTags Operation (InsOrdHashSet TagName) 
Instance details

Defined in Data.Swagger.Lens

HasTermsOfService Info (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasTitle Schema (Maybe Text) 
Instance details

Defined in Data.Swagger.Lens

HasExtensions Operation (InsOrdHashMap Text Value) 
Instance details

Defined in Data.Swagger.Lens

HasHeaders Response (InsOrdHashMap HeaderName Header) 
Instance details

Defined in Data.Swagger.Lens

HasProperties Schema (InsOrdHashMap Text (Referenced Schema)) 
Instance details

Defined in Data.Swagger.Lens

Stream (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (NoShareInput Text) Source #

type Tokens (NoShareInput Text) Source #

Stream (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (ShareInput Text) Source #

type Tokens (ShareInput Text) Source #

FromField (CI Text)

citext

Instance details

Defined in Database.PostgreSQL.Simple.FromField

ToField (CI Text)

citext

Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toFieldCI TextAction Source #

HasFormat (ParamSchema t) (Maybe Format) 
Instance details

Defined in Data.Swagger.Lens

HasPattern (ParamSchema t) (Maybe Pattern) 
Instance details

Defined in Data.Swagger.Lens

FromJSON (Text, Metric) 
Instance details

Defined in Blockfrost.Types.Common

ToJSON (Text, Metric) 
Instance details

Defined in Blockfrost.Types.Common

ToSample (Text, Metric) 
Instance details

Defined in Blockfrost.Types.Common

Methods

toSamplesProxy (Text, Metric) → [(Text, (Text, Metric))] Source #

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item 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 Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Element Text 
Instance details

Defined in Data.MonoTraversable

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 IxKind Text 
Instance details

Defined in Optics.At

type IxValue Text 
Instance details

Defined in Optics.At

type IsBuiltin Text 
Instance details

Defined in PlutusCore.Default.Universe

type IsBuiltin Text = IsBuiltin (ElaborateBuiltin Text)
type ToHoles Text 
Instance details

Defined in PlutusCore.Default.Universe

type ToHoles Text = ToHoles (ElaborateBuiltin Text)
type ToBinds acc Text 
Instance details

Defined in PlutusCore.Default.Universe

type ToBinds acc Text = ToBinds acc (ElaborateBuiltin Text)
type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

forM ∷ (Traversable t, Monad m) ⇒ t a → (a → m b) → m (t b) Source #

forM is mapM with its arguments flipped. For a version that ignores the results see forM_.

class Contravariant (f ∷ TypeType) where Source #

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 :: (a' -> a) -> (Predicate a -> Predicate a')
  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' → a) → f a → f a' Source #

(>$) ∷ b → f b → f a infixl 4 Source #

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

Defined in Data.Aeson.Types.ToJSON

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' → a) → Comparison a → Comparison a' Source #

(>$) ∷ b → Comparison b → Comparison a Source #

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' → a) → Equivalence a → Equivalence a' Source #

(>$) ∷ b → Equivalence b → Equivalence a Source #

Contravariant Predicate

A Predicate is a Contravariant Functor, because contramap can apply its function argument to the input of the predicate.

Without newtypes contramap f equals precomposing with f (= (. f)).

contramap :: (a' -> a) -> (Predicate a -> Predicate a')
contramap f (Predicate g) = Predicate (g . f)
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Predicate a → Predicate a' Source #

(>$) ∷ b → Predicate b → Predicate a Source #

Contravariant (Op a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a0) → Op a a0 → Op a a' Source #

(>$) ∷ b → Op a b → Op a a0 Source #

Contravariant (ProxyTypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Proxy a → Proxy a' Source #

(>$) ∷ b → Proxy b → Proxy a Source #

Contravariant (U1TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → U1 a → U1 a' Source #

(>$) ∷ b → U1 b → U1 a Source #

Contravariant (V1TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → V1 a → V1 a' Source #

(>$) ∷ b → V1 b → V1 a Source #

Contravariant (Tracer m) 
Instance details

Defined in Control.Tracer

Methods

contramap ∷ (a' → a) → Tracer m a → Tracer m a' Source #

(>$) ∷ b → Tracer m b → Tracer m a Source #

Contravariant f ⇒ Contravariant (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap ∷ (a' → a) → Indexing f a → Indexing f a' Source #

(>$) ∷ b → Indexing f b → Indexing f a Source #

Contravariant f ⇒ Contravariant (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

contramap ∷ (a' → a) → Indexing64 f a → Indexing64 f a' Source #

(>$) ∷ b → Indexing64 f b → Indexing64 f a Source #

Contravariant m ⇒ Contravariant (FirstToFinish m) 
Instance details

Defined in Data.Monoid.Synchronisation

Methods

contramap ∷ (a' → a) → FirstToFinish m a → FirstToFinish m a' Source #

(>$) ∷ b → FirstToFinish m b → FirstToFinish m a Source #

Contravariant m ⇒ Contravariant (ListT m) 
Instance details

Defined in Control.Monad.Trans.List

Methods

contramap ∷ (a' → a) → ListT m a → ListT m a' Source #

(>$) ∷ b → ListT m b → ListT m a Source #

Contravariant m ⇒ Contravariant (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

contramap ∷ (a' → a) → MaybeT m a → MaybeT m a' Source #

(>$) ∷ b → MaybeT m b → MaybeT m a Source #

Contravariant (Const a ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a0) → Const a a0 → Const a a' Source #

(>$) ∷ b → Const a b → Const a a0 Source #

Contravariant f ⇒ Contravariant (Alt f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Alt f a → Alt f a' Source #

(>$) ∷ b → Alt f b → Alt f a Source #

Contravariant f ⇒ Contravariant (Rec1 f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Rec1 f a → Rec1 f a' Source #

(>$) ∷ b → Rec1 f b → Rec1 f a Source #

Contravariant m ⇒ Contravariant (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

contramap ∷ (a' → a) → ErrorT e m a → ErrorT e m a' Source #

(>$) ∷ b → ErrorT e m b → ErrorT e m a Source #

Contravariant m ⇒ Contravariant (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

contramap ∷ (a' → a) → ExceptT e m a → ExceptT e m a' Source #

(>$) ∷ b → ExceptT e m b → ExceptT e m a Source #

Contravariant f ⇒ Contravariant (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

contramap ∷ (a' → a) → IdentityT f a → IdentityT f a' Source #

(>$) ∷ b → IdentityT f b → IdentityT f a Source #

Contravariant m ⇒ Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap ∷ (a' → a) → ReaderT r m a → ReaderT r m a' Source #

(>$) ∷ b → ReaderT r m b → ReaderT r m a Source #

Contravariant m ⇒ Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

contramap ∷ (a' → a) → StateT s m a → StateT s m a' Source #

(>$) ∷ b → StateT s m b → StateT s m a Source #

Contravariant m ⇒ Contravariant (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

contramap ∷ (a' → a) → StateT s m a → StateT s m a' Source #

(>$) ∷ b → StateT s m b → StateT s m a Source #

Contravariant m ⇒ Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

contramap ∷ (a' → a) → WriterT w m a → WriterT w m a' Source #

(>$) ∷ b → WriterT w m b → WriterT w m a Source #

Contravariant m ⇒ Contravariant (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

contramap ∷ (a' → a) → WriterT w m a → WriterT w m a' Source #

(>$) ∷ b → WriterT w m b → WriterT w m a Source #

(Contravariant f, Contravariant g) ⇒ Contravariant (Product f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Product f g a → Product f g a' Source #

(>$) ∷ b → Product f g b → Product f g a Source #

(Contravariant f, Contravariant g) ⇒ Contravariant (Sum f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Sum f g a → Sum f g a' Source #

(>$) ∷ b → Sum f g b → Sum f g a Source #

(Contravariant f, Contravariant g) ⇒ Contravariant (f :*: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → (f :*: g) a → (f :*: g) a' Source #

(>$) ∷ b → (f :*: g) b → (f :*: g) a Source #

(Contravariant f, Contravariant g) ⇒ Contravariant (f :+: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → (f :+: g) a → (f :+: g) a' Source #

(>$) ∷ b → (f :+: g) b → (f :+: g) a Source #

Contravariant (K1 i c ∷ TypeType) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → K1 i c a → K1 i c a' Source #

(>$) ∷ b → K1 i c b → K1 i c a Source #

(Functor f, Contravariant g) ⇒ Contravariant (Compose f g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → Compose f g a → Compose f g a' Source #

(>$) ∷ b → Compose f g b → Compose f g a Source #

(Functor f, Contravariant g) ⇒ Contravariant (f :.: g) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → (f :.: g) a → (f :.: g) a' Source #

(>$) ∷ b → (f :.: g) b → (f :.: g) a Source #

Contravariant f ⇒ Contravariant (M1 i c f) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap ∷ (a' → a) → M1 i c f a → M1 i c f a' Source #

(>$) ∷ b → M1 i c f b → M1 i c f a Source #

Contravariant m ⇒ Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

contramap ∷ (a' → a) → RWST r w s m a → RWST r w s m a' Source #

(>$) ∷ b → RWST r w s m b → RWST r w s m a Source #

Contravariant m ⇒ Contravariant (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

contramap ∷ (a' → a) → RWST r w s m a → RWST r w s m a' Source #

(>$) ∷ b → RWST r w s m b → RWST r w s m a Source #

class ToJSON a where Source #

A type that can be converted to JSON.

Instances in general must specify toJSON and should (but don't need to) specify toEncoding.

An example type and instance:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance ToJSON Coord where
  toJSON (Coord x y) = object ["x" .= x, "y" .= y]

  toEncoding (Coord x y) = pairs ("x" .= x <> "y" .= y)

Instead of manually writing your ToJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for toJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a ToJSON instance. If you require nothing other than defaultOptions, it is sufficient to write (and this is the only alternative where the default toJSON implementation is sufficient):

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

or more conveniently using the DerivingVia extension

deriving via Generically Coord instance ToJSON Coord

If on the other hand you wish to customize the generic decoding, you have to implement both methods:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance ToJSON Coord where
    toJSON     = genericToJSON customOptions
    toEncoding = genericToEncoding customOptions

Previous versions of this library only had the toJSON method. Adding toEncoding had two reasons:

  1. toEncoding is more efficient for the common case that the output of toJSON is directly serialized to a ByteString. Further, expressing either method in terms of the other would be non-optimal.
  2. The choice of defaults allows a smooth transition for existing users: Existing instances that do not define toEncoding still compile and have the correct semantics. This is ensured by making the default implementation of toEncoding use toJSON. This produces correct results, but since it performs an intermediate conversion to a Value, it will be less efficient than directly emitting an Encoding. (this also means that specifying nothing more than instance ToJSON Coord would be sufficient as a generically decoding instance, but there probably exists no good reason to not specify toEncoding in new instances.)

Minimal complete definition

Nothing

Methods

toJSON ∷ a → Value Source #

Convert a Haskell value to a JSON-friendly intermediate type.

toEncoding ∷ a → Encoding Source #

Encode a Haskell value as JSON.

The default implementation of this method creates an intermediate Value using toJSON. This provides source-level compatibility for people upgrading from older versions of this library, but obviously offers no performance advantage.

To benefit from direct encoding, you must provide an implementation for this method. The easiest way to do so is by having your types implement Generic using the DeriveGeneric extension, and then have GHC generate a method body as follows.

instance ToJSON Coord where
    toEncoding = genericToEncoding defaultOptions

toJSONList ∷ [a] → Value Source #

toEncodingList ∷ [a] → Encoding Source #

Instances

Instances details
ToJSON Key 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON GYAddress #
>>> LBS8.putStrLn $ Aeson.encode addr
"00e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d1b930e9f7add78a174a21000e989ff551366dcd127028cb2aa39f616"
Instance details

Defined in GeniusYield.Types.Address

ToJSON GYAddressBech32 #
>>> LBS8.putStrLn $ Aeson.encode $ addressToBech32 addr
"addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5"
Instance details

Defined in GeniusYield.Types.Address

ToJSON GYStakeAddress #
>>> LBS8.putStrLn $ Aeson.encode stakeAddr
"e07a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d"
Instance details

Defined in GeniusYield.Types.Address

ToJSON GYStakeAddressBech32 #
>>> LBS8.putStrLn $ Aeson.encode $ stakeAddressToBech32 stakeAddr
"stake_test1upa805fqh85x4hw88zxmhvdaydgyjzmazs9tydqrscerxnghfq4t3"
Instance details

Defined in GeniusYield.Types.Address

ToJSON GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

ToJSON GYEra # 
Instance details

Defined in GeniusYield.Types.Era

ToJSON GYPaymentSigningKey #
>>> LBS8.putStrLn $ Aeson.encode ("5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290" :: GYPaymentSigningKey)
"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290"
Instance details

Defined in GeniusYield.Types.Key

ToJSON GYPaymentVerificationKey #
>>> LBS8.putStrLn $ Aeson.encode ("0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605" :: GYPaymentVerificationKey)
"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605"
Instance details

Defined in GeniusYield.Types.Key

ToJSON GYStakeSigningKey #
>>> LBS8.putStrLn $ Aeson.encode ("5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290" :: GYStakeSigningKey)
"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290"
Instance details

Defined in GeniusYield.Types.Key

ToJSON GYStakeVerificationKey #
>>> LBS8.putStrLn $ Aeson.encode ("0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605" :: GYStakeVerificationKey)
"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605"
Instance details

Defined in GeniusYield.Types.Key

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

ToJSON GYLogScribeType #
>>> LBS8.putStrLn $ Aeson.encode GYStdErrScribe
{"tag":"stderr"}
>>> LBS8.putStrLn $ Aeson.encode $ GYCustomSourceScribe "https://pub:[email protected]:8443/sentry/example_project"
{"tag":"gySource","source":"https://pub:[email protected]:8443/sentry/example_project"}
>>> LBS8.putStrLn $ Aeson.encode $ GYCustomSourceScribe "log.txt"
{"tag":"gySource","source":"log.txt"}
Instance details

Defined in GeniusYield.Types.Logging

ToJSON GYLogSeverity # 
Instance details

Defined in GeniusYield.Types.Logging

ToJSON GYLogVerbosity # 
Instance details

Defined in GeniusYield.Types.Logging

ToJSON LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

ToJSON GYNatural #
>>> LBS8.putStrLn $ Aeson.encode (1234 :: GYNatural)
"1234"
>>> LBS8.putStrLn $ Aeson.encode (123456789123456789123456789123456789123456789 :: GYNatural)
"123456789123456789123456789123456789123456789"
Instance details

Defined in GeniusYield.Types.Natural

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

ToJSON GYPaymentKeyHash #
>>> let Just pkh = Aeson.decode @GYPaymentKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d\""
>>> LBS8.putStrLn $ Aeson.encode pkh
"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
Instance details

Defined in GeniusYield.Types.PaymentKeyHash

ToJSON GYPubKeyHash #
>>> let Just pkh = Aeson.decode @GYPubKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d\""
>>> LBS8.putStrLn $ Aeson.encode pkh
"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
Instance details

Defined in GeniusYield.Types.PubKeyHash

ToJSON GYRational #
>>> LBS8.putStrLn $ Aeson.encode (fromRational @GYRational 0.123)
"0.123"
Instance details

Defined in GeniusYield.Types.Rational

ToJSON GYMintingPolicyId # 
Instance details

Defined in GeniusYield.Types.Script

ToJSON GYScriptHash # 
Instance details

Defined in GeniusYield.Types.Script

ToJSON GYSlot # 
Instance details

Defined in GeniusYield.Types.Slot

ToJSON GYStakeKeyHash #
>>> let Just skh = Aeson.decode @GYStakeKeyHash "\"7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d\""
>>> LBS8.putStrLn $ Aeson.encode skh
"7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d"
Instance details

Defined in GeniusYield.Types.StakeKeyHash

ToJSON GYTime #
>>> LBS8.putStrLn $ Aeson.encode $ timeFromPlutus 0
"1970-01-01T00:00:00Z"
Instance details

Defined in GeniusYield.Types.Time

ToJSON GYTx #
>>> Aeson.toJSON tx
String "84a70082825820975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb27501825820c887cba672004607a0f60ab28091d5c24860dbefb92b1a8776272d752846574f000d818258207a67cd033169e330c9ae9b8d0ef8b71de9eb74bbc8f3f6be90446dab7d1e8bfd00018282583900fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf401a1abac7d882583900fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40821a0017ad4aa2581ca6bb5fd825455e7c69bdaa9d3a6dda9bcbe9b570bc79bd55fa50889ba1466e69636b656c1911d7581cb17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6fa14853696c6c69636f6e190258021a00072f3c0e8009a1581cb17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6fa14853696c6c69636f6e1902580b5820291b4e4c5f189cb896674e02e354028915b11889687c53d9cf4c1c710ff5e4aea203815908d45908d101000033332332232332232323232323232323232323232323232323232222223232323235500222222222225335333553024120013232123300122333500522002002001002350012200112330012253350021001102d02c25335325335333573466e3cd400488008d404c880080b40b04ccd5cd19b873500122001350132200102d02c102c3500122002102b102c00a132635335738921115554784f206e6f7420636f6e73756d65640002302115335333573466e3c048d5402c880080ac0a854cd4ccd5cd19b8701335500b2200102b02a10231326353357389210c77726f6e6720616d6f756e740002302113263533573892010b77726f6e6720746f6b656e00023021135500122222222225335330245027007162213500222253350041335502d00200122161353333573466e1cd55cea8012400046644246600200600464646464646464646464646666ae68cdc39aab9d500a480008cccccccccc888888888848cccccccccc00402c02802402001c01801401000c008cd40548c8c8cccd5cd19b8735573aa0049000119910919800801801180f1aba15002301a357426ae8940088c98d4cd5ce01381401301289aab9e5001137540026ae854028cd4054058d5d0a804999aa80c3ae501735742a010666aa030eb9405cd5d0a80399a80a80f1aba15006335015335502101f75a6ae854014c8c8c8cccd5cd19b8735573aa00490001199109198008018011919191999ab9a3370e6aae754009200023322123300100300233502475a6ae854008c094d5d09aba2500223263533573805605805405226aae7940044dd50009aba150023232323333573466e1cd55cea8012400046644246600200600466a048eb4d5d0a80118129aba135744a004464c6a66ae700ac0b00a80a44d55cf280089baa001357426ae8940088c98d4cd5ce01381401301289aab9e5001137540026ae854010cd4055d71aba15003335015335502175c40026ae854008c06cd5d09aba2500223263533573804604804404226ae8940044d5d1280089aba25001135744a00226ae8940044d5d1280089aba25001135744a00226aae7940044dd50009aba150023232323333573466e1d400520062321222230040053016357426aae79400c8cccd5cd19b875002480108c848888c008014c060d5d09aab9e500423333573466e1d400d20022321222230010053014357426aae7940148cccd5cd19b875004480008c848888c00c014dd71aba135573ca00c464c6a66ae7007807c07407006c0680644d55cea80089baa001357426ae8940088c98d4cd5ce00b80c00b00a9100109aab9e5001137540022464460046eb0004c8004d5406488cccd55cf8009280c119a80b98021aba100230033574400402446464646666ae68cdc39aab9d5003480008ccc88848ccc00401000c008c8c8c8cccd5cd19b8735573aa004900011991091980080180118099aba1500233500c012357426ae8940088c98d4cd5ce00b00b80a80a09aab9e5001137540026ae85400cccd5401dd728031aba1500233500875c6ae84d5d1280111931a99ab9c012013011010135744a00226aae7940044dd5000899aa800bae75a224464460046eac004c8004d5405c88c8cccd55cf8011280b919a80b19aa80c18031aab9d5002300535573ca00460086ae8800c0444d5d080089119191999ab9a3370ea0029000119091180100198029aba135573ca00646666ae68cdc3a801240044244002464c6a66ae7004004403c0380344d55cea80089baa001232323333573466e1cd55cea80124000466442466002006004600a6ae854008dd69aba135744a004464c6a66ae7003403803002c4d55cf280089baa0012323333573466e1cd55cea800a400046eb8d5d09aab9e500223263533573801601801401226ea8004488c8c8cccd5cd19b87500148010848880048cccd5cd19b875002480088c84888c00c010c018d5d09aab9e500423333573466e1d400d20002122200223263533573801c01e01a01801601426aae7540044dd50009191999ab9a3370ea0029001100911999ab9a3370ea0049000100911931a99ab9c00a00b009008007135573a6ea80048c8c8c8c8c8cccd5cd19b8750014803084888888800c8cccd5cd19b875002480288488888880108cccd5cd19b875003480208cc8848888888cc004024020dd71aba15005375a6ae84d5d1280291999ab9a3370ea00890031199109111111198010048041bae35742a00e6eb8d5d09aba2500723333573466e1d40152004233221222222233006009008300c35742a0126eb8d5d09aba2500923333573466e1d40192002232122222223007008300d357426aae79402c8cccd5cd19b875007480008c848888888c014020c038d5d09aab9e500c23263533573802402602202001e01c01a01801601426aae7540104d55cf280189aab9e5002135573ca00226ea80048c8c8c8c8cccd5cd19b875001480088ccc888488ccc00401401000cdd69aba15004375a6ae85400cdd69aba135744a00646666ae68cdc3a80124000464244600400660106ae84d55cf280311931a99ab9c00b00c00a009008135573aa00626ae8940044d55cf280089baa001232323333573466e1d400520022321223001003375c6ae84d55cf280191999ab9a3370ea004900011909118010019bae357426aae7940108c98d4cd5ce00400480380300289aab9d5001137540022244464646666ae68cdc39aab9d5002480008cd5403cc018d5d0a80118029aba135744a004464c6a66ae7002002401c0184d55cf280089baa00149924103505431001200132001355008221122253350011350032200122133350052200230040023335530071200100500400132001355007222533500110022213500222330073330080020060010033200135500622225335001100222135002225335333573466e1c005200000d00c13330080070060031333008007335009123330010080030020060031122002122122330010040031122123300100300212200212200111232300100122330033002002001482c0252210853696c6c69636f6e003351223300248920975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb27500480088848cc00400c00880050581840100d87980821a001f372a1a358a2b14f5f6"
Instance details

Defined in GeniusYield.Types.Tx

ToJSON GYTxId #
>>> Aeson.toJSON gyTxId
String "6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8"
Instance details

Defined in GeniusYield.Types.Tx

ToJSON GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

ToJSON GYAssetClass #
>>> LBS8.putStrLn $ Aeson.encode GYLovelace
"lovelace"
>>> LBS8.putStrLn $ Aeson.encode $ GYToken "ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef" "Gold"
"ff80aaaf03a273b8f5c558168dc0e2377eea810badbae6eceefc14ef.476f6c64"
Instance details

Defined in GeniusYield.Types.Value

ToJSON GYTokenName #
>>> Aeson.encode @GYTokenName "Gold"
"\"476f6c64\""
Instance details

Defined in GeniusYield.Types.Value

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

ToJSON Number 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

ToJSON ApiError 
Instance details

Defined in Blockfrost.Types.ApiError

ToJSON AccountDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountMir 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountRegistration 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountReward 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AccountWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AddressAssociated 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON RewardType 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

ToJSON AddressDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

ToJSON AddressInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

ToJSON AddressTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

ToJSON AddressType 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

ToJSON AddressUtxo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

ToJSON AssetAction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetAddress 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetOnChainMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON AssetTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

ToJSON Block 
Instance details

Defined in Blockfrost.Types.Cardano.Blocks

ToJSON CostModels 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

ToJSON EpochInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

ToJSON PoolStakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

ToJSON ProtocolParams 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

ToJSON StakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

ToJSON Genesis 
Instance details

Defined in Blockfrost.Types.Cardano.Genesis

ToJSON TxMeta 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

ToJSON TxMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

ToJSON TxMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

ToJSON Network 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON NetworkEraBound 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON NetworkEraParameters 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON NetworkEraSummary 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON NetworkStake 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON NetworkSupply 
Instance details

Defined in Blockfrost.Types.Cardano.Network

ToJSON PoolDelegator 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolEpoch 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolRelay 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON PoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON InlineDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON Script 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptDatumCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON ScriptType 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

ToJSON PoolUpdateMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON Pot 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON Transaction 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionMir 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionPoolRetiring 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionPoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionStake 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionUtxos 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON TransactionWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON UtxoInput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON UtxoOutput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

ToJSON Healthy 
Instance details

Defined in Blockfrost.Types.Common

ToJSON Metric 
Instance details

Defined in Blockfrost.Types.Common

ToJSON ServerTime 
Instance details

Defined in Blockfrost.Types.Common

ToJSON URLVersion 
Instance details

Defined in Blockfrost.Types.Common

ToJSON IPFSAdd 
Instance details

Defined in Blockfrost.Types.IPFS

ToJSON IPFSPin 
Instance details

Defined in Blockfrost.Types.IPFS

ToJSON IPFSPinChange 
Instance details

Defined in Blockfrost.Types.IPFS

ToJSON PinState 
Instance details

Defined in Blockfrost.Types.IPFS

ToJSON NutlinkAddress 
Instance details

Defined in Blockfrost.Types.NutLink

ToJSON NutlinkAddressTicker 
Instance details

Defined in Blockfrost.Types.NutLink

ToJSON NutlinkTicker 
Instance details

Defined in Blockfrost.Types.NutLink

ToJSON Address 
Instance details

Defined in Blockfrost.Types.Shared.Address

ToJSON Amount 
Instance details

Defined in Blockfrost.Types.Shared.Amount

ToJSON AssetId 
Instance details

Defined in Blockfrost.Types.Shared.AssetId

ToJSON BlockHash 
Instance details

Defined in Blockfrost.Types.Shared.BlockHash

ToJSON DatumHash 
Instance details

Defined in Blockfrost.Types.Shared.DatumHash

ToJSON Epoch 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

ToJSON EpochLength 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

ToJSON POSIXMillis 
Instance details

Defined in Blockfrost.Types.Shared.POSIXMillis

ToJSON PolicyId 
Instance details

Defined in Blockfrost.Types.Shared.PolicyId

ToJSON PoolId 
Instance details

Defined in Blockfrost.Types.Shared.PoolId

ToJSON Quantity 
Instance details

Defined in Blockfrost.Types.Shared.Quantity

ToJSON ScriptHash 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

ToJSON ScriptHashList 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

ToJSON Slot 
Instance details

Defined in Blockfrost.Types.Shared.Slot

ToJSON TxHash 
Instance details

Defined in Blockfrost.Types.Shared.TxHash

ToJSON ValidationPurpose 
Instance details

Defined in Blockfrost.Types.Shared.ValidationPurpose

(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # 
Instance details

Defined in GeniusYield.Imports

ToJSON ChainPointer 
Instance details

Defined in Cardano.Address

ToJSON NetworkTag 
Instance details

Defined in Cardano.Address

ToJSON Cosigner 
Instance details

Defined in Cardano.Address.Script

ToJSON KeyHash 
Instance details

Defined in Cardano.Address.Script

ToJSON ScriptTemplate 
Instance details

Defined in Cardano.Address.Script

ToJSON AddressInfo 
Instance details

Defined in Cardano.Address.Style.Byron

ToJSON ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Byron

ToJSON PayloadInfo 
Instance details

Defined in Cardano.Address.Style.Byron

Methods

toJSON ∷ PayloadInfo → Value Source #

toEncoding ∷ PayloadInfo → Encoding Source #

toJSONList ∷ [PayloadInfo] → Value Source #

toEncodingList ∷ [PayloadInfo] → Encoding Source #

ToJSON AddressInfo 
Instance details

Defined in Cardano.Address.Style.Icarus

ToJSON ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Icarus

ToJSON AddressInfo 
Instance details

Defined in Cardano.Address.Style.Shelley

ToJSON ErrInspectAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

ToJSON ErrInspectAddressOnlyShelley 
Instance details

Defined in Cardano.Address.Style.Shelley

ToJSON InspectAddress 
Instance details

Defined in Cardano.Address.Style.Shelley

ToJSON StakeAddress 
Instance details

Defined in Cardano.Api.Address

ToJSON StakeCredential 
Instance details

Defined in Cardano.Api.Address

ToJSON ChainPoint 
Instance details

Defined in Cardano.Api.Block

ToJSON ChainTip 
Instance details

Defined in Cardano.Api.Block

ToJSON AnyCardanoEra 
Instance details

Defined in Cardano.Api.Eras

ToJSON AnyShelleyBasedEra 
Instance details

Defined in Cardano.Api.Eras

ToJSON CostModels 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

toJSON ∷ CostModels → Value Source #

toEncoding ∷ CostModels → Encoding Source #

toJSONList ∷ [CostModels] → Value Source #

toEncodingList ∷ [CostModels] → Encoding Source #

ToJSON ExecutionUnitPrices 
Instance details

Defined in Cardano.Api.ProtocolParameters

ToJSON PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

ToJSON ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

ToJSON AnyPlutusScriptVersion 
Instance details

Defined in Cardano.Api.Script

ToJSON ExecutionUnits 
Instance details

Defined in Cardano.Api.Script

ToJSON ScriptHash 
Instance details

Defined in Cardano.Api.Script

ToJSON ScriptInAnyLang 
Instance details

Defined in Cardano.Api.Script

ToJSON SimpleScript 
Instance details

Defined in Cardano.Api.Script

ToJSON TextEnvelopeCddl 
Instance details

Defined in Cardano.Api.SerialiseLedgerCddl

ToJSON TextEnvelope 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

ToJSON TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

ToJSON TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

ToJSON ScriptWitnessIndex 
Instance details

Defined in Cardano.Api.TxBody

ToJSON TxId 
Instance details

Defined in Cardano.Api.TxIn

ToJSON TxIn 
Instance details

Defined in Cardano.Api.TxIn

ToJSON TxIx 
Instance details

Defined in Cardano.Api.TxIn

ToJSON AssetName 
Instance details

Defined in Cardano.Api.Value

ToJSON Lovelace 
Instance details

Defined in Cardano.Api.Value

ToJSON PolicyId 
Instance details

Defined in Cardano.Api.Value

ToJSON Quantity 
Instance details

Defined in Cardano.Api.Value

ToJSON Value 
Instance details

Defined in Cardano.Api.Value

ToJSON ValueNestedRep 
Instance details

Defined in Cardano.Api.Value

ToJSON ProtocolMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

ToJSON ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

ToJSON RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

ToJSON CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

ToJSON RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

ToJSON VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

ToJSON CoinPerWord 
Instance details

Defined in Cardano.Ledger.Alonzo.Core

ToJSON AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

ToJSON OrdExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

ToJSON CostModel 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

ToJSON CostModels 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

ToJSON ExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

ToJSON Prices 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

ToJSON CoinPerByte 
Instance details

Defined in Cardano.Ledger.Babbage.Core

ToJSON ByteSpan 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

ToJSON Version 
Instance details

Defined in Cardano.Ledger.Binary.Version

ToJSON Proof 
Instance details

Defined in Cardano.Chain.Block.Proof

ToJSON AddrAttributes 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

ToJSON HDAddressPayload 
Instance details

Defined in Cardano.Chain.Common.AddrAttributes

ToJSON AddrType 
Instance details

Defined in Cardano.Chain.Common.AddrSpendingData

ToJSON Address 
Instance details

Defined in Cardano.Chain.Common.Address

ToJSON UnparsedFields 
Instance details

Defined in Cardano.Chain.Common.Attributes

ToJSON ChainDifficulty 
Instance details

Defined in Cardano.Chain.Common.ChainDifficulty

ToJSON Lovelace 
Instance details

Defined in Cardano.Chain.Common.Lovelace

ToJSON LovelacePortion 
Instance details

Defined in Cardano.Chain.Common.LovelacePortion

ToJSON NetworkMagic 
Instance details

Defined in Cardano.Chain.Common.NetworkMagic

ToJSON TxFeePolicy 
Instance details

Defined in Cardano.Chain.Common.TxFeePolicy

ToJSON TxSizeLinear 
Instance details

Defined in Cardano.Chain.Common.TxSizeLinear

ToJSON GenesisHash 
Instance details

Defined in Cardano.Chain.Genesis.Hash

ToJSON EpochNumber 
Instance details

Defined in Cardano.Chain.Slotting.EpochNumber

ToJSON SlotNumber 
Instance details

Defined in Cardano.Chain.Slotting.SlotNumber

ToJSON SscPayload 
Instance details

Defined in Cardano.Chain.Ssc

ToJSON SscProof 
Instance details

Defined in Cardano.Chain.Ssc

ToJSON Tx 
Instance details

Defined in Cardano.Chain.UTxO.Tx

ToJSON TxIn 
Instance details

Defined in Cardano.Chain.UTxO.Tx

ToJSON TxOut 
Instance details

Defined in Cardano.Chain.UTxO.Tx

ToJSON TxProof 
Instance details

Defined in Cardano.Chain.UTxO.TxProof

ToJSON TxInWitness 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

ToJSON TxSigData 
Instance details

Defined in Cardano.Chain.UTxO.TxWitness

ToJSON ApplicationName 
Instance details

Defined in Cardano.Chain.Update.ApplicationName

ToJSON InstallerHash 
Instance details

Defined in Cardano.Chain.Update.InstallerHash

ToJSON ProposalBody 
Instance details

Defined in Cardano.Chain.Update.Proposal

ToJSON ProtocolParametersUpdate 
Instance details

Defined in Cardano.Chain.Update.ProtocolParametersUpdate

ToJSON ProtocolVersion 
Instance details

Defined in Cardano.Chain.Update.ProtocolVersion

ToJSON SoftforkRule 
Instance details

Defined in Cardano.Chain.Update.SoftforkRule

ToJSON SoftwareVersion 
Instance details

Defined in Cardano.Chain.Update.SoftwareVersion

ToJSON SystemTag 
Instance details

Defined in Cardano.Chain.Update.SystemTag

ToJSON GovernanceActionIx 
Instance details

Defined in Cardano.Ledger.Conway.Governance

ToJSON Vote 
Instance details

Defined in Cardano.Ledger.Conway.Governance

ToJSON VoterRole 
Instance details

Defined in Cardano.Ledger.Conway.Governance

ToJSON CertIx 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON TxIx 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

ToJSON Coin 
Instance details

Defined in Cardano.Ledger.Coin

ToJSON DeltaCoin 
Instance details

Defined in Cardano.Ledger.Coin

ToJSON Ptr 
Instance details

Defined in Cardano.Ledger.Credential

ToJSON Language 
Instance details

Defined in Cardano.Ledger.Language

ToJSON PoolMetadata 
Instance details

Defined in Cardano.Ledger.PoolParams

ToJSON StakePoolRelay 
Instance details

Defined in Cardano.Ledger.PoolParams

ToJSON RewardType 
Instance details

Defined in Cardano.Ledger.Rewards

ToJSON AssetName 
Instance details

Defined in Cardano.Ledger.Mary.Value

ToJSON RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

ToJSON RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

ToJSON NominalDiffTimeMicro 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

ToJSON AccountState 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

ToJSON Likelihood 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

ToJSON LogWeight 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

ToJSON Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

ToJSON Slot 
Instance details

Defined in Cardano.Simple.Ledger.Slot

ToJSON Ada 
Instance details

Defined in Cardano.Simple.Plutus.Model.Ada

ToJSON BlockNo 
Instance details

Defined in Cardano.Slotting.Block

ToJSON EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

ToJSON EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

ToJSON SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

ToJSON RelativeTime 
Instance details

Defined in Cardano.Slotting.Time

ToJSON SystemStart 
Instance details

Defined in Cardano.Slotting.Time

ToJSON FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ FlatAssetQuantity → Value Source #

toEncoding ∷ FlatAssetQuantity → Encoding Source #

toJSONList ∷ [FlatAssetQuantity] → Value Source #

toEncodingList ∷ [FlatAssetQuantity] → Encoding Source #

ToJSON NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ NestedMapEntry → Value Source #

toEncoding ∷ NestedMapEntry → Encoding Source #

toJSONList ∷ [NestedMapEntry] → Value Source #

toEncodingList ∷ [NestedMapEntry] → Encoding Source #

ToJSON NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

toJSON ∷ NestedTokenQuantity → Value Source #

toEncoding ∷ NestedTokenQuantity → Encoding Source #

toJSONList ∷ [NestedTokenQuantity] → Value Source #

toEncodingList ∷ [NestedTokenQuantity] → Encoding Source #

ToJSON TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

ToJSON TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

ToJSON TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

ToJSON Percentage 
Instance details

Defined in Data.Quantity

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Environment 
Instance details

Defined in Katip.Core

ToJSON LocJs 
Instance details

Defined in Katip.Core

ToJSON Namespace 
Instance details

Defined in Katip.Core

ToJSON ProcessIDJs 
Instance details

Defined in Katip.Core

ToJSON Severity 
Instance details

Defined in Katip.Core

ToJSON SimpleLogPayload

A built-in convenience log payload that won't log anything on V0, but will log everything in any other level of verbosity. Intended for easy in-line usage without having to define new log types.

Construct using sl and combine multiple tuples using <> from Monoid.

Instance details

Defined in Katip.Core

ToJSON ThreadIdText 
Instance details

Defined in Katip.Core

ToJSON Verbosity 
Instance details

Defined in Katip.Core

ToJSON LogContexts 
Instance details

Defined in Katip.Monadic

ToJSON ApiError 
Instance details

Defined in Maestro.Client.Error

ToJSON AbsoluteSlot 
Instance details

Defined in Maestro.Types.Common

ToJSON BlockHash 
Instance details

Defined in Maestro.Types.Common

ToJSON BlockHeight 
Instance details

Defined in Maestro.Types.Common

ToJSON DatumOption 
Instance details

Defined in Maestro.Types.Common

ToJSON DatumOptionType 
Instance details

Defined in Maestro.Types.Common

ToJSON EpochNo 
Instance details

Defined in Maestro.Types.Common

ToJSON EpochSize 
Instance details

Defined in Maestro.Types.Common

ToJSON Order 
Instance details

Defined in Maestro.Types.Common

ToJSON PolicyId 
Instance details

Defined in Maestro.Types.Common

ToJSON Script 
Instance details

Defined in Maestro.Types.Common

ToJSON ScriptType 
Instance details

Defined in Maestro.Types.Common

ToJSON SlotNo 
Instance details

Defined in Maestro.Types.Common

ToJSON TokenName 
Instance details

Defined in Maestro.Types.Common

ToJSON TxHash 
Instance details

Defined in Maestro.Types.Common

ToJSON TxIndex 
Instance details

Defined in Maestro.Types.Common

ToJSON AccountAction 
Instance details

Defined in Maestro.Types.V1.Accounts

Methods

toJSON ∷ AccountAction → Value Source #

toEncoding ∷ AccountAction → Encoding Source #

toJSONList ∷ [AccountAction] → Value Source #

toEncodingList ∷ [AccountAction] → Encoding Source #

ToJSON AccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON AccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON AccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON AccountStakingRewardType 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON AccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON PaginatedAccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON PaginatedAccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON PaginatedAccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON PaginatedAddress 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON PaginatedAsset 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON TimestampedAccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

ToJSON AddressInfo 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON AddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON CertIndex 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON ChainPointer 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON NetworkId 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON OutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaginatedAddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaginatedOutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaginatedPaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaymentCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaymentCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON PaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON StakingCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON StakingCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

ToJSON AssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

ToJSON TimestampedAssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

ToJSON TokenRegistryMetadata 
Instance details

Defined in Maestro.Types.V1.Assets

ToJSON BlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

ToJSON TimestampedBlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

ToJSON Asset 
Instance details

Defined in Maestro.Types.V1.Common

ToJSON AssetUnit 
Instance details

Defined in Maestro.Types.V1.Common

ToJSON PaginatedUtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

ToJSON UtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

ToJSON NextCursor 
Instance details

Defined in Maestro.Types.V1.Common.Pagination

ToJSON LastUpdated 
Instance details

Defined in Maestro.Types.V1.Common.Timestamped

ToJSON Datum 
Instance details

Defined in Maestro.Types.V1.Datum

ToJSON TimestampedDatum 
Instance details

Defined in Maestro.Types.V1.Datum

ToJSON Dex 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

ToJSON Resolution 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

ToJSON ChainTip 
Instance details

Defined in Maestro.Types.V1.General

ToJSON CostModel 
Instance details

Defined in Maestro.Types.V1.General

ToJSON CostModels 
Instance details

Defined in Maestro.Types.V1.General

ToJSON EraBound 
Instance details

Defined in Maestro.Types.V1.General

ToJSON EraParameters 
Instance details

Defined in Maestro.Types.V1.General

ToJSON EraSummary 
Instance details

Defined in Maestro.Types.V1.General

ToJSON MaestroRational 
Instance details

Defined in Maestro.Types.V1.General

ToJSON ProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

ToJSON ProtocolVersion 
Instance details

Defined in Maestro.Types.V1.General

ToJSON TimestampedChainTip 
Instance details

Defined in Maestro.Types.V1.General

ToJSON TimestampedEraSummaries 
Instance details

Defined in Maestro.Types.V1.General

ToJSON TimestampedProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

ToJSON TimestampedSystemStart 
Instance details

Defined in Maestro.Types.V1.General

ToJSON PaginatedPoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

ToJSON PoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

ToJSON OutputReference 
Instance details

Defined in Maestro.Types.V1.Transactions

ToJSON PaginatedUtxo 
Instance details

Defined in Maestro.Types.V1.Transactions

ToJSON TimestampedTxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

ToJSON TxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

ToJSON UtxoWithBytes 
Instance details

Defined in Maestro.Types.V1.Transactions

ToJSON PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerAdvertise

ToJSON PeerSharing 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerSharing

ToJSON ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

ToJSON ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

ToJSON ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

ToJSON CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

ToJSON SatInt 
Instance details

Defined in Data.SatInt

ToJSON CovLoc 
Instance details

Defined in PlutusTx.Coverage

ToJSON CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

ToJSON CoverageData 
Instance details

Defined in PlutusTx.Coverage

ToJSON CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

ToJSON CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

ToJSON CoverageReport 
Instance details

Defined in PlutusTx.Coverage

ToJSON Metadata 
Instance details

Defined in PlutusTx.Coverage

ToJSON Rational

This mimics the behaviour of Aeson's instance for Rational.

Instance details

Defined in PlutusTx.Ratio

ToJSON SentryLevel 
Instance details

Defined in System.Log.Raven.Types

ToJSON SentryRecord 
Instance details

Defined in System.Log.Raven.Types

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON BaseUrl
>>> traverse_ (LBS8.putStrLn . encode) $ parseBaseUrl "api.example.com"
"http://api.example.com"
Instance details

Defined in Servant.Client.Core.BaseUrl

ToJSON StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

ToJSON AdditionalProperties 
Instance details

Defined in Data.Swagger.Internal

ToJSON ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

ToJSON ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

ToJSON Contact 
Instance details

Defined in Data.Swagger.Internal

ToJSON Example 
Instance details

Defined in Data.Swagger.Internal

ToJSON ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

ToJSON Header 
Instance details

Defined in Data.Swagger.Internal

ToJSON Host 
Instance details

Defined in Data.Swagger.Internal

ToJSON Info 
Instance details

Defined in Data.Swagger.Internal

ToJSON License 
Instance details

Defined in Data.Swagger.Internal

ToJSON MimeList 
Instance details

Defined in Data.Swagger.Internal

ToJSON OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

ToJSON OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

ToJSON Operation 
Instance details

Defined in Data.Swagger.Internal

ToJSON Param 
Instance details

Defined in Data.Swagger.Internal

ToJSON ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

ToJSON ParamLocation 
Instance details

Defined in Data.Swagger.Internal

ToJSON ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

ToJSON PathItem 
Instance details

Defined in Data.Swagger.Internal

ToJSON Reference 
Instance details

Defined in Data.Swagger.Internal

ToJSON Response 
Instance details

Defined in Data.Swagger.Internal

ToJSON Responses 
Instance details

Defined in Data.Swagger.Internal

ToJSON Schema 
Instance details

Defined in Data.Swagger.Internal

ToJSON Scheme 
Instance details

Defined in Data.Swagger.Internal

ToJSON SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

ToJSON SecurityRequirement 
Instance details

Defined in Data.Swagger.Internal

ToJSON SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

ToJSON SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

ToJSON Swagger 
Instance details

Defined in Data.Swagger.Internal

ToJSON Tag 
Instance details

Defined in Data.Swagger.Internal

ToJSON URL 
Instance details

Defined in Data.Swagger.Internal

ToJSON Xml 
Instance details

Defined in Data.Swagger.Internal

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ShortText

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Month 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Quarter 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON SystemTime

Encoded as number

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ () → Value Source #

toEncoding ∷ () → Encoding Source #

toJSONList ∷ [()] → Value Source #

toEncodingList ∷ [()] → Encoding Source #

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON v ⇒ ToJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, Integral a) ⇒ ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Exception e, Generic e, GToJSON Zero (Rep e)) ⇒ ToJSON (WithErrorMessage e) 
Instance details

Defined in Cardano.Address.Internal

ToJSON elem ⇒ ToJSON (Script elem) 
Instance details

Defined in Cardano.Address.Script

Methods

toJSONScript elem → Value Source #

toEncodingScript elem → Encoding Source #

toJSONList ∷ [Script elem] → Value Source #

toEncodingList ∷ [Script elem] → Encoding Source #

ToJSON (Address ByronAddr) 
Instance details

Defined in Cardano.Api.Address

ToJSON (Address ShelleyAddr) 
Instance details

Defined in Cardano.Api.Address

IsCardanoEra era ⇒ ToJSON (AddressInEra era) 
Instance details

Defined in Cardano.Api.Address

ToJSON (CardanoEra era) 
Instance details

Defined in Cardano.Api.Eras

ToJSON (ShelleyBasedEra era) 
Instance details

Defined in Cardano.Api.Eras

ToJSON (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

ToJSON (Hash PaymentKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

ToJSON (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

ToJSON (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

ToJSON (LocalTxMonitoringResult mode) 
Instance details

Defined in Cardano.Api.IPC

(IsShelleyBasedEra era, ShelleyLedgerEra era ~ ledgerera, ShelleyBasedEra ledgerera) ⇒ ToJSON (DebugLedgerState era) 
Instance details

Defined in Cardano.Api.Query

IsCardanoEra era ⇒ ToJSON (UTxO era) 
Instance details

Defined in Cardano.Api.Query

Methods

toJSONUTxO era → Value Source #

toEncodingUTxO era → Encoding Source #

toJSONList ∷ [UTxO era] → Value Source #

toEncodingList ∷ [UTxO era] → Encoding Source #

IsCardanoEra era ⇒ ToJSON (ReferenceScript era) 
Instance details

Defined in Cardano.Api.Script

SerialiseAsBech32 a ⇒ ToJSON (UsingBech32 a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

SerialiseAsRawBytes a ⇒ ToJSON (UsingRawBytesHex a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

ToJSON (MultiAssetSupportedInEra era) 
Instance details

Defined in Cardano.Api.TxBody

ToJSON (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

ToJSON a ⇒ ToJSON (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

ToJSON (Signature w) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

Era era ⇒ ToJSON (AlonzoScript era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

ToJSON a ⇒ ToJSON (ExUnits' a) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Era era ⇒ ToJSON (Datum era) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts.Data

(Era era, Val (Value era)) ⇒ ToJSON (AlonzoTxOut era) 
Instance details

Defined in Cardano.Ledger.Alonzo.TxOut

(Era era, ToJSON (Datum era), ToJSON (Script era), Val (Value era)) ⇒ ToJSON (BabbageTxOut era) 
Instance details

Defined in Cardano.Ledger.Babbage.TxOut

ToJSON a ⇒ ToJSON (ABlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

ToJSON a ⇒ ToJSON (ABlockOrBoundary a) 
Instance details

Defined in Cardano.Chain.Block.Block

ToJSON a ⇒ ToJSON (ABoundaryBlock a) 
Instance details

Defined in Cardano.Chain.Block.Block

ToJSON a ⇒ ToJSON (ABoundaryBody a) 
Instance details

Defined in Cardano.Chain.Block.Block

ToJSON a ⇒ ToJSON (ABody a) 
Instance details

Defined in Cardano.Chain.Block.Body

ToJSON a ⇒ ToJSON (ABlockSignature a) 
Instance details

Defined in Cardano.Chain.Block.Header

ToJSON a ⇒ ToJSON (ABoundaryHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

ToJSON a ⇒ ToJSON (AHeader a) 
Instance details

Defined in Cardano.Chain.Block.Header

ToJSON a ⇒ ToJSON (Attributes a) 
Instance details

Defined in Cardano.Chain.Common.Attributes

ToJSON a ⇒ ToJSON (MerkleRoot a) 
Instance details

Defined in Cardano.Chain.Common.Merkle

ToJSON a ⇒ ToJSON (ACertificate a) 
Instance details

Defined in Cardano.Chain.Delegation.Certificate

ToJSON a ⇒ ToJSON (APayload a) 
Instance details

Defined in Cardano.Chain.Delegation.Payload

ToJSON a ⇒ ToJSON (ATxAux a) 
Instance details

Defined in Cardano.Chain.UTxO.TxAux

ToJSON a ⇒ ToJSON (ATxPayload a) 
Instance details

Defined in Cardano.Chain.UTxO.TxPayload

ToJSON a ⇒ ToJSON (APayload a) 
Instance details

Defined in Cardano.Chain.Update.Payload

ToJSON a ⇒ ToJSON (AProposal a) 
Instance details

Defined in Cardano.Chain.Update.Proposal

ToJSON a ⇒ ToJSON (AVote a) 
Instance details

Defined in Cardano.Chain.Update.Vote

Crypto c ⇒ ToJSON (ConwayGenesis c) 
Instance details

Defined in Cardano.Ledger.Conway.Genesis

Crypto c ⇒ ToJSON (Anchor c) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (ConwayGovernance era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (ConwayTallyState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (EnactState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (GovernanceAction era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

Crypto c ⇒ ToJSON (GovernanceActionId c) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (GovernanceActionState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (RatifyState era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

EraPParams era ⇒ ToJSON (VotingProcedure era) 
Instance details

Defined in Cardano.Ledger.Conway.Governance

ToJSON (Addr c) 
Instance details

Defined in Cardano.Ledger.Address

Crypto c ⇒ ToJSON (RewardAcnt c) 
Instance details

Defined in Cardano.Ledger.Address

Crypto c ⇒ ToJSON (AuxiliaryDataHash c) 
Instance details

Defined in Cardano.Ledger.AuxiliaryData

Crypto c ⇒ ToJSON (BlocksMade c) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Era era ⇒ ToJSON (CertState era) 
Instance details

Defined in Cardano.Ledger.CertState

Era era ⇒ ToJSON (DState era) 
Instance details

Defined in Cardano.Ledger.CertState

Crypto c ⇒ ToJSON (FutureGenDeleg c) 
Instance details

Defined in Cardano.Ledger.CertState

Crypto c ⇒ ToJSON (InstantaneousRewards c) 
Instance details

Defined in Cardano.Ledger.CertState

Era era ⇒ ToJSON (PState era) 
Instance details

Defined in Cardano.Ledger.CertState

ToJSON (CompactForm Coin) 
Instance details

Defined in Cardano.Ledger.Coin

ToJSON (CompactForm DeltaCoin) 
Instance details

Defined in Cardano.Ledger.Coin

ToJSON (PParamsHKD Identity era) ⇒ ToJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

ToJSON (PParamsHKD StrictMaybe era) ⇒ ToJSON (PParamsUpdate era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Crypto c ⇒ ToJSON (StakeReference c) 
Instance details

Defined in Cardano.Ledger.Credential

Crypto c ⇒ ToJSON (SnapShot c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Crypto c ⇒ ToJSON (SnapShots c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Crypto c ⇒ ToJSON (Stake c) 
Instance details

Defined in Cardano.Ledger.EpochBoundary

Crypto c ⇒ ToJSON (ScriptHash c) 
Instance details

Defined in Cardano.Ledger.Hashes

Crypto c ⇒ ToJSON (GenDelegPair c) 
Instance details

Defined in Cardano.Ledger.Keys

Crypto c ⇒ ToJSON (GenDelegs c) 
Instance details

Defined in Cardano.Ledger.Keys

Crypto c ⇒ ToJSON (IndividualPoolStake c) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Crypto c ⇒ ToJSON (PoolDistr c) 
Instance details

Defined in Cardano.Ledger.PoolDistr

Crypto c ⇒ ToJSON (PoolParams c) 
Instance details

Defined in Cardano.Ledger.PoolParams

Crypto c ⇒ ToJSON (Reward c) 
Instance details

Defined in Cardano.Ledger.Rewards

Crypto c ⇒ ToJSON (TxId c) 
Instance details

Defined in Cardano.Ledger.TxIn

Crypto c ⇒ ToJSON (TxIn c) 
Instance details

Defined in Cardano.Ledger.TxIn

Crypto c ⇒ ToJSON (Trip c) 
Instance details

Defined in Cardano.Ledger.UMap

Crypto c ⇒ ToJSON (UMap c) 
Instance details

Defined in Cardano.Ledger.UMap

(Era era, ToJSON (TxOut era)) ⇒ ToJSON (UTxO era) 
Instance details

Defined in Cardano.Ledger.UTxO

Methods

toJSONUTxO era → Value Source #

toEncodingUTxO era → Encoding Source #

toJSONList ∷ [UTxO era] → Value Source #

toEncodingList ∷ [UTxO era] → Encoding Source #

Crypto c ⇒ ToJSON (MaryValue c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Crypto c ⇒ ToJSON (MultiAsset c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Crypto c ⇒ ToJSON (PolicyID c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Crypto c ⇒ ToJSON (ShelleyGenesis c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Crypto c ⇒ ToJSON (ShelleyGenesisStaking c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

EraPParams era ⇒ ToJSON (ShelleyPPUPState era) 
Instance details

Defined in Cardano.Ledger.Shelley.Governance

(EraTxOut era, EraGovernance era) ⇒ ToJSON (EpochState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

Crypto c ⇒ ToJSON (IncrementalStake c) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

(EraTxOut era, EraGovernance era) ⇒ ToJSON (LedgerState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

(EraTxOut era, EraGovernance era) ⇒ ToJSON (UTxOState era) 
Instance details

Defined in Cardano.Ledger.Shelley.LedgerState.Types

EraPParams era ⇒ ToJSON (ProposedPPUpdates era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

Crypto crypto ⇒ ToJSON (NonMyopic crypto) 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

Methods

toJSONNonMyopic crypto → Value Source #

toEncodingNonMyopic crypto → Encoding Source #

toJSONList ∷ [NonMyopic crypto] → Value Source #

toEncodingList ∷ [NonMyopic crypto] → Encoding Source #

Crypto c ⇒ ToJSON (RewardProvenance c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Crypto c ⇒ ToJSON (RewardProvenancePool c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Crypto c ⇒ ToJSON (PulsingRewUpdate c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

Crypto c ⇒ ToJSON (RewardUpdate c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardUpdate

(Era era, Val (Value era)) ⇒ ToJSON (ShelleyTxOut era) 
Instance details

Defined in Cardano.Ledger.Shelley.TxOut

ToJSON a ⇒ ToJSON (WithOrigin a) 
Instance details

Defined in Cardano.Slotting.Slot

ToJSON a ⇒ ToJSON (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

ToJSON a ⇒ ToJSON (StrictSeq a) 
Instance details

Defined in Data.Sequence.Strict

ToJSON (Flat TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

ToJSON (Nested TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

ToJSON a ⇒ ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON v ⇒ ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON1 f ⇒ ToJSON (Fix f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON1 f, Functor f) ⇒ ToJSON (Mu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON1 f, Functor f) ⇒ ToJSON (Nu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (DNonEmpty a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Generic a, GToJSON' Value Zero (Rep a), GToJSON' Encoding Zero (Rep a)) ⇒ ToJSON (Generically a)

Since: aeson-2.1.0.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (InsOrdHashSet a) 
Instance details

Defined in Data.HashSet.InsOrd

ToJSON a ⇒ ToJSON (Item a) 
Instance details

Defined in Katip.Core

ToJSON (Bech32StringOf a) 
Instance details

Defined in Maestro.Types.Common

ToJSON (HashStringOf a) 
Instance details

Defined in Maestro.Types.Common

ToJSON (HexStringOf a) 
Instance details

Defined in Maestro.Types.Common

ToJSON (TaggedText description) 
Instance details

Defined in Maestro.Types.V1.Common

Methods

toJSONTaggedText description → Value Source #

toEncodingTaggedText description → Encoding Source #

toJSONList ∷ [TaggedText description] → Value Source #

toEncodingList ∷ [TaggedText description] → Encoding Source #

ToJSON i ⇒ ToJSON (MemoryStepsWith i) 
Instance details

Defined in Maestro.Types.V1.General

ToJSON (BuiltinCostModelBase MCostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

ToJSON (BuiltinCostModelBase CostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

ToJSON a ⇒ ToJSON (MCostingFun a) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

ToJSON a ⇒ ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) ⇒ ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON d ⇒ ToJSON (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

ToJSON a ⇒ ToJSON (Maybe a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (CollectionFormat t) 
Instance details

Defined in Data.Swagger.Internal

ToJSON (ParamSchema k) 
Instance details

Defined in Data.Swagger.Internal

ToJSON (Referenced Param) 
Instance details

Defined in Data.Swagger.Internal

ToJSON (Referenced Response) 
Instance details

Defined in Data.Swagger.Internal

ToJSON (Referenced Schema) 
Instance details

Defined in Data.Swagger.Internal

ToJSON (ParamSchema t) ⇒ ToJSON (SwaggerItems t)

As for nullary schema for 0-arity type constructors, see https://github.com/GetShopTV/swagger2/issues/167.

>>> encode (SwaggerItemsArray [])
"{\"example\":[],\"items\":{},\"maxItems\":0}"
Instance details

Defined in Data.Swagger.Internal

ToJSON (SwaggerType t) 
Instance details

Defined in Data.Swagger.Internal

ToJSON a ⇒ ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Storable a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Vector Vector a, ToJSON a) ⇒ ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (Maybe PoolMetadata) 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

ToJSON a ⇒ ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a ⇒ ToJSON (a)

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a) → Value Source #

toEncoding ∷ (a) → Encoding Source #

toJSONList ∷ [(a)] → Value Source #

toEncodingList ∷ [(a)] → Encoding Source #

ToJSON a ⇒ ToJSON [a] 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ [a] → Value Source #

toEncoding ∷ [a] → Encoding Source #

toJSONList ∷ [[a]] → Value Source #

toEncodingList ∷ [[a]] → Encoding Source #

(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

HasResolution a ⇒ ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (File content direction) 
Instance details

Defined in Cardano.Api.IO.Base

Methods

toJSONFile content direction → Value Source #

toEncodingFile content direction → Encoding Source #

toJSONList ∷ [File content direction] → Value Source #

toEncodingList ∷ [File content direction] → Encoding Source #

ToJSON (EraInMode era mode) 
Instance details

Defined in Cardano.Api.Modes

Methods

toJSONEraInMode era mode → Value Source #

toEncodingEraInMode era mode → Encoding Source #

toJSONList ∷ [EraInMode era mode] → Value Source #

toEncodingList ∷ [EraInMode era mode] → Encoding Source #

ToJSON (ScriptLanguageInEra lang era) 
Instance details

Defined in Cardano.Api.Script

IsCardanoEra era ⇒ ToJSON (TxOut ctx era) 
Instance details

Defined in Cardano.Api.TxBody

Methods

toJSONTxOut ctx era → Value Source #

toEncodingTxOut ctx era → Encoding Source #

toJSONList ∷ [TxOut ctx era] → Value Source #

toEncodingList ∷ [TxOut ctx era] → Encoding Source #

HashAlgorithm h ⇒ ToJSON (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

toJSONHash h a → Value Source #

toEncodingHash h a → Encoding Source #

toJSONList ∷ [Hash h a] → Value Source #

toEncodingList ∷ [Hash h a] → Encoding Source #

ToJSON (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

(ToJSON v, ToJSONKey k) ⇒ ToJSON (ListMap k v) 
Instance details

Defined in Data.ListMap

Crypto c ⇒ ToJSON (AlonzoPParams Identity (AlonzoEra c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

Crypto c ⇒ ToJSON (AlonzoPParams StrictMaybe (AlonzoEra c)) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

(PParamsHKD Identity era ~ BabbagePParams Identity era, BabbageEraPParams era) ⇒ ToJSON (BabbagePParams Identity era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

(PParamsHKD StrictMaybe era ~ BabbagePParams StrictMaybe era, BabbageEraPParams era) ⇒ ToJSON (BabbagePParams StrictMaybe era) 
Instance details

Defined in Cardano.Ledger.Babbage.PParams

ToJSON b ⇒ ToJSON (Annotated b a) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

ToJSON (BoundedRatio b Word64) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

toJSON ∷ BoundedRatio b Word64Value Source #

toEncoding ∷ BoundedRatio b Word64Encoding Source #

toJSONList ∷ [BoundedRatio b Word64] → Value Source #

toEncodingList ∷ [BoundedRatio b Word64] → Encoding Source #

Crypto c ⇒ ToJSON (Credential kr c) 
Instance details

Defined in Cardano.Ledger.Credential

Crypto c ⇒ ToJSON (KeyHash disc c) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

toJSONKeyHash disc c → Value Source #

toEncodingKeyHash disc c → Encoding Source #

toJSONList ∷ [KeyHash disc c] → Value Source #

toEncodingList ∷ [KeyHash disc c] → Encoding Source #

Crypto c ⇒ ToJSON (SafeHash c index) 
Instance details

Defined in Cardano.Ledger.SafeHash

Methods

toJSONSafeHash c index → Value Source #

toEncodingSafeHash c index → Encoding Source #

toJSONList ∷ [SafeHash c index] → Value Source #

toEncodingList ∷ [SafeHash c index] → Encoding Source #

(EraPParams era, PParamsHKD Identity era ~ ShelleyPParams Identity era, ProtVerAtMost era 4, ProtVerAtMost era 6) ⇒ ToJSON (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

(EraPParams era, PParamsHKD StrictMaybe era ~ ShelleyPParams StrictMaybe era, ProtVerAtMost era 4, ProtVerAtMost era 6) ⇒ ToJSON (ShelleyPParams StrictMaybe era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

(KnownSymbol unit, ToJSON a) ⇒ ToJSON (Quantity unit a) 
Instance details

Defined in Data.Quantity

Methods

toJSONQuantity unit a → Value Source #

toEncodingQuantity unit a → Encoding Source #

toJSONList ∷ [Quantity unit a] → Value Source #

toEncodingList ∷ [Quantity unit a] → Encoding Source #

(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONMap k v → Value Source #

toEncodingMap k v → Encoding Source #

toJSONList ∷ [Map k v] → Value Source #

toEncodingList ∷ [Map k v] → Encoding Source #

(ToJSONKey k, ToJSON v) ⇒ ToJSON (InsOrdHashMap k v) 
Instance details

Defined in Data.HashMap.Strict.InsOrd

(ToJSON a, ToJSONKey k) ⇒ ToJSON (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSON b) ⇒ ToJSON (These a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSON b) ⇒ ToJSON (Pair a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONPair a b → Value Source #

toEncodingPair a b → Encoding Source #

toJSONList ∷ [Pair a b] → Value Source #

toEncodingList ∷ [Pair a b] → Encoding Source #

(ToJSON a, ToJSON b) ⇒ ToJSON (These a b)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON v, ToJSONKey k) ⇒ ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (Address, NutlinkTicker) 
Instance details

Defined in Blockfrost.Types.NutLink

ToJSON (Text, Metric) 
Instance details

Defined in Blockfrost.Types.Common

(ToJSON a, ToJSON b) ⇒ ToJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b) → Value Source #

toEncoding ∷ (a, b) → Encoding Source #

toJSONList ∷ [(a, b)] → Value Source #

toEncodingList ∷ [(a, b)] → Encoding Source #

ToJSON a ⇒ ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(AesonOptions t, Generic a, GToJSON Zero (Rep a), GToEncoding Zero (Rep a)) ⇒ ToJSON (CustomJSON t a) 
Instance details

Defined in Deriving.Aeson

ToJSON b ⇒ ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (These1 f g a)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONThese1 f g a → Value Source #

toEncodingThese1 f g a → Encoding Source #

toJSONList ∷ [These1 f g a] → Value Source #

toEncodingList ∷ [These1 f g a] → Encoding Source #

(ToJSON a, ToJSON b, ToJSON c) ⇒ ToJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON ∷ (a, b, c) → Value Source #

toEncoding ∷ (a, b, c) → Encoding Source #

toJSONList ∷ [(a, b, c)] → Value Source #

toEncodingList ∷ [(a, b, c)] → Encoding Source #

(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 Source #

toEncodingProduct f g a → Encoding Source #

toJSONList ∷ [Product f g a] → Value Source #

toEncodingList ∷ [Product f g a] → Encoding Source #

(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 Source #

toEncodingSum f g a → Encoding Source #

toJSONList ∷ [Sum f g a] → Value Source #

toEncodingList ∷ [Sum f g a] → Encoding Source #

(Vector vk k, Vector vv v, ToJSONKey k, ToJSON v) ⇒ ToJSON (VMap vk vv k v) 
Instance details

Defined in Data.VMap

Methods

toJSONVMap vk vv k v → Value Source #

toEncodingVMap vk vv k v → Encoding Source #

toJSONList ∷ [VMap vk vv k v] → Value Source #

toEncodingList ∷ [VMap vk vv k v] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d) → Encoding Source #

toJSONList ∷ [(a, b, c, d)] → Value Source #

toEncodingList ∷ [(a, b, c, d)] → Encoding Source #

(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 Source #

toEncodingCompose f g a → Encoding Source #

toJSONList ∷ [Compose f g a] → Value Source #

toEncodingList ∷ [Compose f g a] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Encoding Source #

(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 Source #

toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Encoding Source #

toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Value Source #

toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Encoding Source #

class FromJSON a where Source #

A type that can be converted from JSON, with the possibility of failure.

In many cases, you can get the compiler to generate parsing code for you (see below). To begin, let's cover writing an instance by hand.

There are various reasons a conversion could fail. For example, an Object could be missing a required key, an Array could be of the wrong size, or a value could be of an incompatible type.

The basic ways to signal a failed conversion are as follows:

  • fail yields a custom error message: it is the recommended way of reporting a failure;
  • empty (or mzero) is uninformative: use it when the error is meant to be caught by some (<|>);
  • typeMismatch can be used to report a failure when the encountered value is not of the expected JSON type; unexpected is an appropriate alternative when more than one type may be expected, or to keep the expected type implicit.

prependFailure (or modifyFailure) add more information to a parser's error messages.

An example type and instance using typeMismatch and prependFailure:

-- Allow ourselves to write Text literals.
{-# LANGUAGE OverloadedStrings #-}

data Coord = Coord { x :: Double, y :: Double }

instance FromJSON Coord where
    parseJSON (Object v) = Coord
        <$> v .: "x"
        <*> v .: "y"

    -- We do not expect a non-Object value here.
    -- We could use empty to fail, but typeMismatch
    -- gives a much more informative error message.
    parseJSON invalid    =
        prependFailure "parsing Coord failed, "
            (typeMismatch "Object" invalid)

For this common case of only being concerned with a single type of JSON value, the functions withObject, withScientific, etc. are provided. Their use is to be preferred when possible, since they are more terse. Using withObject, we can rewrite the above instance (assuming the same language extension and data type) as:

instance FromJSON Coord where
    parseJSON = withObject "Coord" $ \v -> Coord
        <$> v .: "x"
        <*> v .: "y"

Instead of manually writing your FromJSON instance, there are two options to do it automatically:

  • Data.Aeson.TH provides Template Haskell functions which will derive an instance at compile time. The generated instance is optimized for your type so it will probably be more efficient than the following option.
  • The compiler can provide a default generic implementation for parseJSON.

To use the second, simply add a deriving Generic clause to your datatype and declare a FromJSON instance for your datatype without giving a definition for parseJSON.

For example, the previous example can be simplified to just:

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics

data Coord = Coord { x :: Double, y :: Double } deriving Generic

instance FromJSON Coord

or using the DerivingVia extension

deriving via Generically Coord instance FromJSON Coord

The default implementation will be equivalent to parseJSON = genericParseJSON defaultOptions; if you need different options, you can customize the generic decoding by defining:

customOptions = defaultOptions
                { fieldLabelModifier = map toUpper
                }

instance FromJSON Coord where
    parseJSON = genericParseJSON customOptions

Minimal complete definition

Nothing

Instances

Instances details
FromJSON Key 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON GYCoreConfig # 
Instance details

Defined in GeniusYield.GYConfig

FromJSON GYCoreProviderInfo # 
Instance details

Defined in GeniusYield.GYConfig

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

FromJSON GYAddressBech32 #
>>> Aeson.decode @GYAddressBech32 "\"addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5\""
Just (unsafeAddressFromText "addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5")
Instance details

Defined in GeniusYield.Types.Address

FromJSON GYStakeAddress #

In JSON context, stake addresses are represented in hex.

>>> Aeson.decode @GYStakeAddress "\"e07a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d\""
Just (unsafeStakeAddressFromText "stake_test1upa805fqh85x4hw88zxmhvdaydgyjzmazs9tydqrscerxnghfq4t3")
Instance details

Defined in GeniusYield.Types.Address

FromJSON GYStakeAddressBech32 #
>>> Aeson.decode @GYStakeAddressBech32 "\"stake_test1upa805fqh85x4hw88zxmhvdaydgyjzmazs9tydqrscerxnghfq4t3\""
Just (unsafeStakeAddressFromText "stake_test1upa805fqh85x4hw88zxmhvdaydgyjzmazs9tydqrscerxnghfq4t3")
Instance details

Defined in GeniusYield.Types.Address

FromJSON GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

FromJSON GYEra # 
Instance details

Defined in GeniusYield.Types.Era

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

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

FromJSON GYStakeSigningKey #
>>> Aeson.eitherDecode @GYStakeSigningKey "\"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290\""
Right (GYStakeSigningKey "5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290")
>>> Aeson.eitherDecode @GYStakeSigningKey "\"58205ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fceczzz\""
Left "Error in $: invalid character at offset: 65"
Instance details

Defined in GeniusYield.Types.Key

FromJSON GYStakeVerificationKey #
>>> Aeson.eitherDecode @GYStakeVerificationKey "\"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605\""
Right (GYStakeVerificationKey "0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605")
>>> Aeson.eitherDecode @GYStakeVerificationKey "\"58200717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193zzz\""
Left "Error in $: invalid character at offset: 65"
Instance details

Defined in GeniusYield.Types.Key

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

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:[email protected]:8443/sentry/example_project\"}"
Right (GYCustomSourceScribe (LogSrc https://pub:[email protected]: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

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

FromJSON GYLogVerbosity # 
Instance details

Defined in GeniusYield.Types.Logging

FromJSON LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

FromJSON GYNatural #
>>> Aeson.decode @GYNatural "\"123\""
Just (GYNatural 123)
>>> Aeson.eitherDecode @GYNatural "\"-123\""
Left "Error in $: underflow: -123 (should be a non-negative integer)"
>>> Aeson.eitherDecode @GYNatural "\"+123\""
Right (GYNatural 123)
>>> Aeson.eitherDecode @GYNatural "\"9223372036854775807\""
Right (GYNatural 9223372036854775807)
>>> Aeson.eitherDecode @GYNatural "\"123456789123456789123456789123456789123456789\""
Right (GYNatural 123456789123456789123456789123456789123456789)
>>> Aeson.eitherDecode @GYNatural "\"0011\""
Right (GYNatural 11)
>>> Aeson.eitherDecode @GYNatural "\"0f11\""
Left "Error in $: could not parse: `0f11'"
>>> Aeson.eitherDecode @GYNatural "\"-123456789123456789123456789123456789123456789\""
Left "Error in $: underflow: -123456789123456789123456789123456789123456789 (should be a non-negative integer)"
Instance details

Defined in GeniusYield.Types.Natural

FromJSON GYNetworkId #
>>> Aeson.eitherDecode @GYNetworkId <$> ["\"mainnet\"", "\"testnet-preprod\"", "\"preprod\"", "\"testnet-preview\"", "\"preview\"", "\"testnet\"", "\"privnet\"", "\"no-such-net\""]
[Right GYMainnet,Right GYTestnetPreprod,Right GYTestnetPreprod,Right GYTestnetPreview,Right GYTestnetPreview,Right GYTestnetLegacy,Right GYPrivnet,Left "Error in $: Expected mainnet, testnet-preprod, preprod, testnet-preview, preview, testnet or privnet"]
Instance details

Defined in GeniusYield.Types.NetworkId

FromJSON GYPaymentKeyHash #
>>> Aeson.eitherDecode @GYPaymentKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d\""
Right (GYPaymentKeyHash "e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d")

Invalid characters:

>>> Aeson.eitherDecode @GYPaymentKeyHash "\"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6azzz\""
Left "Error in $: RawBytesHexErrorBase16DecodeFail \"e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6azzz\" \"invalid character at offset: 53\""
Instance details

Defined in GeniusYield.Types.PaymentKeyHash

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

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

FromJSON GYMintingPolicyId # 
Instance details

Defined in GeniusYield.Types.Script

FromJSON GYScriptHash # 
Instance details

Defined in GeniusYield.Types.Script

FromJSON GYStakeKeyHash #
>>> Aeson.eitherDecode @GYStakeKeyHash "\"7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d\""
Right (GYStakeKeyHash "7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d")

Invalid characters:

>>> Aeson.eitherDecode @GYStakeKeyHash "\"7a77d120b9e86addc7388dbbb1bd2350490b7d140ab2340386323zzz\""
Left "Error in $: RawBytesHexErrorBase16DecodeFail \"7a77d120b9e86addc7388dbbb1bd2350490b7d140ab2340386323zzz\" \"invalid character at offset: 53\""
Instance details

Defined in GeniusYield.Types.StakeKeyHash

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

FromJSON GYTx #
>>> txToApi <$> (Aeson.fromJSON @GYTx $ Aeson.toJSON tx)
Success (ShelleyTx ShelleyBasedEraBabbage (AlonzoTx {body = TxBodyConstr BabbageTxBodyRaw {btbrSpendInputs = fromList [TxIn (TxId {unTxId = SafeHash "975e4c7f8d7937f8102e500714feb3f014c8766fcf287a11c10c686154fcb275"}) (TxIx 1),TxIn (TxId {unTxId = SafeHash "c887cba672004607a0f60ab28091d5c24860dbefb92b1a8776272d752846574f"}) (TxIx 0)], btbrCollateralInputs = fromList [TxIn (TxId {unTxId = SafeHash "7a67cd033169e330c9ae9b8d0ef8b71de9eb74bbc8f3f6be90446dab7d1e8bfd"}) (TxIx 0)], btbrReferenceInputs = fromList [], btbrOutputs = StrictSeq {fromStrict = fromList [Sized {sizedValue = (Addr Testnet (KeyHashObj (KeyHash "fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0")) (StakeRefBase (KeyHashObj (KeyHash "c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40"))),MaryValue 448448472 (MultiAsset (fromList [])),NoDatum,SNothing), sizedSize = 65},Sized {sizedValue = (Addr Testnet (KeyHashObj (KeyHash "fd040c7a10744b79e5c80ec912a05dbdb3009e372b7f4b0f026d16b0")) (StakeRefBase (KeyHashObj (KeyHash "c663651ffc046068455d2994564ba9d4b3e9b458ad8ab5232aebbf40"))),MaryValue 1551690 (MultiAsset (fromList [(PolicyID {policyID = ScriptHash "a6bb5fd825455e7c69bdaa9d3a6dda9bcbe9b570bc79bd55fa50889b"},fromList [("6e69636b656c",4567)]),(PolicyID {policyID = ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f"},fromList [("53696c6c69636f6e",600)])])),NoDatum,SNothing), sizedSize = 151}]}, btbrCollateralReturn = SNothing, btbrTotalCollateral = SNothing, btbrCerts = StrictSeq {fromStrict = fromList []}, btbrWithdrawals = Withdrawals {unWithdrawals = fromList []}, btbrTxFee = Coin 470844, btbrValidityInterval = ValidityInterval {invalidBefore = SNothing, invalidHereafter = SNothing}, btbrUpdate = SNothing, btbrReqSignerHashes = fromList [], btbrMint = MultiAsset (fromList [(PolicyID {policyID = ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f"},fromList [("53696c6c69636f6e",600)])]), btbrScriptIntegrityHash = SJust (SafeHash "291b4e4c5f189cb896674e02e354028915b11889687c53d9cf4c1c710ff5e4ae"), btbrAuxDataHash = SNothing, btbrTxNetworkId = SNothing} (blake2b_256: SafeHash "a5e1d764a1bb1e8fab4bb5b8529410bf12517937dac87cbbfec7d59044d16e39"), wits = AlonzoTxWitsRaw {atwrAddrTxWits = fromList [], atwrBootAddrTxWits = fromList [], atwrScriptTxWits = fromList [(ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f",PlutusScript PlutusV1 ScriptHash "b17cb47f51d6744ad05fb937a762848ad61674f8aebbaec67be0bb6f")], atwrDatsTxWits = TxDatsConstr TxDatsRaw (fromList []) (blake2b_256: SafeHash "45b0cfc220ceec5b7c1c62c4d4193d38e4eba48e8815729ce75f9c0ab0e4c1c0"), atwrRdmrsTxWits = RedeemersConstr RedeemersRaw (fromList [(RdmrPtr Mint 0,(DataConstr Constr 0 [] (blake2b_256: SafeHash "923918e403bf43c34b4ef6b48eb2ee04babed17320d8d1b9ff9ad086e86f44ec"),WrapExUnits {unWrapExUnits = ExUnits' {exUnitsMem' = 2045738, exUnitsSteps' = 898247444}}))]) (blake2b_256: SafeHash "3a384e30b63601e50ccbdfc7fe5d1364e52ecf8f0c03a0f6eff44fe42fe65557")} (blake2b_256: SafeHash "9085fea61a5bc7baa0abb2e841264b04987017bc2f61183ad4de77ff6f96fb7c"), isValid = IsValid True, auxiliaryData = SNothing}))
Instance details

Defined in GeniusYield.Types.Tx

FromJSON GYTxId # 
Instance details

Defined in GeniusYield.Types.Tx

FromJSON GYTxWitness # 
Instance details

Defined in GeniusYield.Types.Tx

FromJSON GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

FromJSON GYTxOutRefCbor # 
Instance details

Defined in GeniusYield.Types.TxOutRef

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

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

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

FromJSON Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON ByteString64 
Instance details

Defined in Data.ByteString.Base64.Type

FromJSON ApiError 
Instance details

Defined in Blockfrost.Types.ApiError

FromJSON AccountDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountMir 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountRegistration 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountReward 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AccountWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AddressAssociated 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON RewardType 
Instance details

Defined in Blockfrost.Types.Cardano.Accounts

FromJSON AddressDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

FromJSON AddressInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

FromJSON AddressTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

FromJSON AddressType 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

FromJSON AddressUtxo 
Instance details

Defined in Blockfrost.Types.Cardano.Addresses

FromJSON AssetAction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetAddress 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetDetails 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetOnChainMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON AssetTransaction 
Instance details

Defined in Blockfrost.Types.Cardano.Assets

FromJSON Block 
Instance details

Defined in Blockfrost.Types.Cardano.Blocks

FromJSON CostModels 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

FromJSON EpochInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

FromJSON PoolStakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

FromJSON ProtocolParams 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

FromJSON StakeDistribution 
Instance details

Defined in Blockfrost.Types.Cardano.Epochs

FromJSON Genesis 
Instance details

Defined in Blockfrost.Types.Cardano.Genesis

FromJSON TxMeta 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

FromJSON TxMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

FromJSON TxMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Metadata

FromJSON Network 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON NetworkEraBound 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON NetworkEraParameters 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON NetworkEraSummary 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON NetworkStake 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON NetworkSupply 
Instance details

Defined in Blockfrost.Types.Cardano.Network

FromJSON PoolDelegator 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolEpoch 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolHistory 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolInfo 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolRegistrationAction 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolRelay 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON PoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON InlineDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON Script 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptDatum 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptDatumCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON ScriptType 
Instance details

Defined in Blockfrost.Types.Cardano.Scripts

FromJSON PoolUpdateMetadata 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON Pot 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON Transaction 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionDelegation 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionMetaCBOR 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionMetaJSON 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionMir 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionPoolRetiring 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionPoolUpdate 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionRedeemer 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionStake 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionUtxos 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON TransactionWithdrawal 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON UtxoInput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON UtxoOutput 
Instance details

Defined in Blockfrost.Types.Cardano.Transactions

FromJSON Healthy 
Instance details

Defined in Blockfrost.Types.Common

FromJSON Metric 
Instance details

Defined in Blockfrost.Types.Common

FromJSON ServerTime 
Instance details

Defined in Blockfrost.Types.Common

FromJSON URLVersion 
Instance details

Defined in Blockfrost.Types.Common

FromJSON IPFSAdd 
Instance details

Defined in Blockfrost.Types.IPFS

FromJSON IPFSPin 
Instance details

Defined in Blockfrost.Types.IPFS

FromJSON IPFSPinChange 
Instance details

Defined in Blockfrost.Types.IPFS

FromJSON PinState 
Instance details

Defined in Blockfrost.Types.IPFS

FromJSON NutlinkAddress 
Instance details

Defined in Blockfrost.Types.NutLink

FromJSON NutlinkAddressTicker 
Instance details

Defined in Blockfrost.Types.NutLink

FromJSON NutlinkTicker 
Instance details

Defined in Blockfrost.Types.NutLink

FromJSON Address 
Instance details

Defined in Blockfrost.Types.Shared.Address

FromJSON Amount 
Instance details

Defined in Blockfrost.Types.Shared.Amount

FromJSON AssetId 
Instance details

Defined in Blockfrost.Types.Shared.AssetId

FromJSON BlockHash 
Instance details

Defined in Blockfrost.Types.Shared.BlockHash

FromJSON DatumHash 
Instance details

Defined in Blockfrost.Types.Shared.DatumHash

FromJSON Epoch 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

FromJSON EpochLength 
Instance details

Defined in Blockfrost.Types.Shared.Epoch

FromJSON POSIXMillis 
Instance details

Defined in Blockfrost.Types.Shared.POSIXMillis

FromJSON PolicyId 
Instance details

Defined in Blockfrost.Types.Shared.PolicyId

FromJSON PoolId 
Instance details

Defined in Blockfrost.Types.Shared.PoolId

FromJSON Quantity 
Instance details

Defined in Blockfrost.Types.Shared.Quantity

FromJSON ScriptHash 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

FromJSON ScriptHashList 
Instance details

Defined in Blockfrost.Types.Shared.ScriptHash

FromJSON Slot 
Instance details

Defined in Blockfrost.Types.Shared.Slot

FromJSON TxHash 
Instance details

Defined in Blockfrost.Types.Shared.TxHash

FromJSON ValidationPurpose 
Instance details

Defined in Blockfrost.Types.Shared.ValidationPurpose

(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # 
Instance details

Defined in GeniusYield.Imports

FromJSON Cosigner 
Instance details

Defined in Cardano.Address.Script

FromJSON ScriptTemplate 
Instance details

Defined in Cardano.Address.Script

FromJSON StakeAddress 
Instance details

Defined in Cardano.Api.Address

FromJSON ChainPoint 
Instance details

Defined in Cardano.Api.Block

FromJSON AnyCardanoEra 
Instance details

Defined in Cardano.Api.Eras

FromJSON AnyShelleyBasedEra 
Instance details

Defined in Cardano.Api.Eras

FromJSON NodeConfig 
Instance details

Defined in Cardano.Api.LedgerState

FromJSON CostModels 
Instance details

Defined in Cardano.Api.ProtocolParameters

Methods

parseJSONValueParser CostModels Source #

parseJSONListValueParser [CostModels] Source #

FromJSON ExecutionUnitPrices 
Instance details

Defined in Cardano.Api.ProtocolParameters

FromJSON PraosNonce 
Instance details

Defined in Cardano.Api.ProtocolParameters

FromJSON ProtocolParameters 
Instance details

Defined in Cardano.Api.ProtocolParameters

FromJSON AnyPlutusScriptVersion 
Instance details

Defined in Cardano.Api.Script

FromJSON ExecutionUnits 
Instance details

Defined in Cardano.Api.Script

FromJSON ScriptHash 
Instance details

Defined in Cardano.Api.Script

FromJSON ScriptInAnyLang 
Instance details

Defined in Cardano.Api.Script

FromJSON SimpleScript 
Instance details

Defined in Cardano.Api.Script

FromJSON TextEnvelopeCddl 
Instance details

Defined in Cardano.Api.SerialiseLedgerCddl

FromJSON TextEnvelope 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

FromJSON TextEnvelopeDescr 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

FromJSON TextEnvelopeType 
Instance details

Defined in Cardano.Api.SerialiseTextEnvelope

FromJSON StakePoolMetadata 
Instance details

Defined in Cardano.Api.StakePoolMetadata

FromJSON TxId 
Instance details

Defined in Cardano.Api.TxIn

FromJSON TxIn 
Instance details

Defined in Cardano.Api.TxIn

FromJSON TxIx 
Instance details

Defined in Cardano.Api.TxIn

FromJSON AssetName 
Instance details

Defined in Cardano.Api.Value

FromJSON Lovelace 
Instance details

Defined in Cardano.Api.Value

FromJSON PolicyId 
Instance details

Defined in Cardano.Api.Value

FromJSON Quantity 
Instance details

Defined in Cardano.Api.Value

FromJSON Value 
Instance details

Defined in Cardano.Api.Value

FromJSON ValueNestedRep 
Instance details

Defined in Cardano.Api.Value

FromJSON ProtocolMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

FromJSON ProtocolMagicId 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

FromJSON RequiresNetworkMagic 
Instance details

Defined in Cardano.Crypto.ProtocolMagic

FromJSON CompactRedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Compact

FromJSON RedeemVerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.VerificationKey

FromJSON VerificationKey 
Instance details

Defined in Cardano.Crypto.Signing.VerificationKey

FromJSON CoinPerWord 
Instance details

Defined in Cardano.Ledger.Alonzo.Core

FromJSON AlonzoGenesis 
Instance details

Defined in Cardano.Ledger.Alonzo.Genesis

FromJSON OrdExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

FromJSON CostModels 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

FromJSON ExUnits 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

FromJSON Prices 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

FromJSON CoinPerByte 
Instance details

Defined in Cardano.Ledger.Babbage.Core

FromJSON Version 
Instance details

Defined in Cardano.Ledger.Binary.Version

FromJSON DnsName 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON Network 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON NonNegativeInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON Nonce 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON Port 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON PositiveInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON PositiveUnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON ProtVer 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON UnitInterval 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON Url 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON Coin 
Instance details

Defined in Cardano.Ledger.Coin

FromJSON DeltaCoin 
Instance details

Defined in Cardano.Ledger.Coin

FromJSON Language 
Instance details

Defined in Cardano.Ledger.Language

FromJSON PoolMetadata 
Instance details

Defined in Cardano.Ledger.PoolParams

FromJSON StakePoolRelay 
Instance details

Defined in Cardano.Ledger.PoolParams

FromJSON RewardInfoPool 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

FromJSON RewardParams 
Instance details

Defined in Cardano.Ledger.Shelley.API.Wallet

FromJSON NominalDiffTimeMicro 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

FromJSON LogWeight 
Instance details

Defined in Cardano.Ledger.Shelley.PoolRank

FromJSON Desirability 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

FromJSON Slot 
Instance details

Defined in Cardano.Simple.Ledger.Slot

FromJSON Ada 
Instance details

Defined in Cardano.Simple.Plutus.Model.Ada

FromJSON BlockNo 
Instance details

Defined in Cardano.Slotting.Block

FromJSON EpochNo 
Instance details

Defined in Cardano.Slotting.Slot

FromJSON EpochSize 
Instance details

Defined in Cardano.Slotting.Slot

FromJSON SlotNo 
Instance details

Defined in Cardano.Slotting.Slot

FromJSON RelativeTime 
Instance details

Defined in Cardano.Slotting.Time

FromJSON SystemStart 
Instance details

Defined in Cardano.Slotting.Time

FromJSON FlatAssetQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSONValueParser FlatAssetQuantity Source #

parseJSONListValueParser [FlatAssetQuantity] Source #

FromJSON NestedMapEntry 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSONValueParser NestedMapEntry Source #

parseJSONListValueParser [NestedMapEntry] Source #

FromJSON NestedTokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

Methods

parseJSONValueParser NestedTokenQuantity Source #

parseJSONListValueParser [NestedTokenQuantity] Source #

FromJSON TokenName 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

FromJSON TokenPolicyId 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenPolicy

FromJSON TokenQuantity 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenQuantity

FromJSON Percentage 
Instance details

Defined in Data.Quantity

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Environment 
Instance details

Defined in Katip.Core

FromJSON LocJs 
Instance details

Defined in Katip.Core

FromJSON LogStr 
Instance details

Defined in Katip.Core

FromJSON Namespace 
Instance details

Defined in Katip.Core

FromJSON ProcessIDJs 
Instance details

Defined in Katip.Core

FromJSON Severity 
Instance details

Defined in Katip.Core

FromJSON ThreadIdText 
Instance details

Defined in Katip.Core

FromJSON Verbosity 
Instance details

Defined in Katip.Core

FromJSON ApiError 
Instance details

Defined in Maestro.Client.Error

FromJSON AbsoluteSlot 
Instance details

Defined in Maestro.Types.Common

FromJSON BlockHash 
Instance details

Defined in Maestro.Types.Common

FromJSON BlockHeight 
Instance details

Defined in Maestro.Types.Common

FromJSON DatumOption 
Instance details

Defined in Maestro.Types.Common

FromJSON DatumOptionType 
Instance details

Defined in Maestro.Types.Common

FromJSON EpochNo 
Instance details

Defined in Maestro.Types.Common

FromJSON EpochSize 
Instance details

Defined in Maestro.Types.Common

FromJSON PolicyId 
Instance details

Defined in Maestro.Types.Common

FromJSON Script 
Instance details

Defined in Maestro.Types.Common

FromJSON ScriptType 
Instance details

Defined in Maestro.Types.Common

FromJSON SlotNo 
Instance details

Defined in Maestro.Types.Common

FromJSON TokenName 
Instance details

Defined in Maestro.Types.Common

FromJSON TxHash 
Instance details

Defined in Maestro.Types.Common

FromJSON TxIndex 
Instance details

Defined in Maestro.Types.Common

FromJSON AccountAction 
Instance details

Defined in Maestro.Types.V1.Accounts

Methods

parseJSONValueParser AccountAction Source #

parseJSONListValueParser [AccountAction] Source #

FromJSON AccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON AccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON AccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON AccountStakingRewardType 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON AccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON PaginatedAccountHistory 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON PaginatedAccountReward 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON PaginatedAccountUpdate 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON PaginatedAddress 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON PaginatedAsset 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON TimestampedAccountInfo 
Instance details

Defined in Maestro.Types.V1.Accounts

FromJSON AddressInfo 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON AddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON CertIndex 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON ChainPointer 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON NetworkId 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON OutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaginatedAddressTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaginatedOutputReferenceObject 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaginatedPaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaymentCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaymentCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON PaymentCredentialTransaction 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON StakingCredKind 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON StakingCredential 
Instance details

Defined in Maestro.Types.V1.Addresses

FromJSON AssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

FromJSON TimestampedAssetInfo 
Instance details

Defined in Maestro.Types.V1.Assets

FromJSON TokenRegistryMetadata 
Instance details

Defined in Maestro.Types.V1.Assets

FromJSON BlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

FromJSON TimestampedBlockDetails 
Instance details

Defined in Maestro.Types.V1.Blocks

FromJSON Asset 
Instance details

Defined in Maestro.Types.V1.Common

FromJSON AssetUnit 
Instance details

Defined in Maestro.Types.V1.Common

FromJSON PaginatedUtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

FromJSON UtxoWithSlot 
Instance details

Defined in Maestro.Types.V1.Common

FromJSON NextCursor 
Instance details

Defined in Maestro.Types.V1.Common.Pagination

FromJSON LastUpdated 
Instance details

Defined in Maestro.Types.V1.Common.Timestamped

FromJSON Datum 
Instance details

Defined in Maestro.Types.V1.Datum

FromJSON TimestampedDatum 
Instance details

Defined in Maestro.Types.V1.Datum

FromJSON Dex 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

FromJSON DexPairInfo 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

FromJSON DexPairResponse 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

FromJSON OHLCCandleInfo 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

FromJSON Resolution 
Instance details

Defined in Maestro.Types.V1.DefiMarkets

FromJSON ChainTip 
Instance details

Defined in Maestro.Types.V1.General

FromJSON CostModel 
Instance details

Defined in Maestro.Types.V1.General

FromJSON CostModels 
Instance details

Defined in Maestro.Types.V1.General

FromJSON EraBound 
Instance details

Defined in Maestro.Types.V1.General

FromJSON EraParameters 
Instance details

Defined in Maestro.Types.V1.General

FromJSON EraSummary 
Instance details

Defined in Maestro.Types.V1.General

FromJSON MaestroRational 
Instance details

Defined in Maestro.Types.V1.General

FromJSON ProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

FromJSON ProtocolVersion 
Instance details

Defined in Maestro.Types.V1.General

FromJSON TimestampedChainTip 
Instance details

Defined in Maestro.Types.V1.General

FromJSON TimestampedEraSummaries 
Instance details

Defined in Maestro.Types.V1.General

FromJSON TimestampedProtocolParameters 
Instance details

Defined in Maestro.Types.V1.General

FromJSON TimestampedSystemStart 
Instance details

Defined in Maestro.Types.V1.General

FromJSON PaginatedPoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

FromJSON PoolListInfo 
Instance details

Defined in Maestro.Types.V1.Pools

FromJSON PaginatedUtxo 
Instance details

Defined in Maestro.Types.V1.Transactions

FromJSON TimestampedTxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

FromJSON TxDetails 
Instance details

Defined in Maestro.Types.V1.Transactions

FromJSON UtxoWithBytes 
Instance details

Defined in Maestro.Types.V1.Transactions

FromJSON PeerAdvertise 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerAdvertise

FromJSON PeerSharing 
Instance details

Defined in Ouroboros.Network.PeerSelection.PeerSharing

FromJSON ExBudget 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExBudget

FromJSON ExCPU 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

FromJSON ExMemory 
Instance details

Defined in PlutusCore.Evaluation.Machine.ExMemory

FromJSON CekMachineCosts 
Instance details

Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts

FromJSON SatInt 
Instance details

Defined in Data.SatInt

FromJSON CovLoc 
Instance details

Defined in PlutusTx.Coverage

FromJSON CoverageAnnotation 
Instance details

Defined in PlutusTx.Coverage

FromJSON CoverageData 
Instance details

Defined in PlutusTx.Coverage

FromJSON CoverageIndex 
Instance details

Defined in PlutusTx.Coverage

FromJSON CoverageMetadata 
Instance details

Defined in PlutusTx.Coverage

FromJSON CoverageReport 
Instance details

Defined in PlutusTx.Coverage

FromJSON Metadata 
Instance details

Defined in PlutusTx.Coverage

FromJSON Rational

This mimics the behaviour of Aeson's instance for Rational.

Instance details

Defined in PlutusTx.Ratio

FromJSON Scientific 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON BaseUrl
>>> parseBaseUrl "api.example.com" >>= decode . encode :: Maybe BaseUrl
Just (BaseUrl {baseUrlScheme = Http, baseUrlHost = "api.example.com", baseUrlPort = 80, baseUrlPath = ""})
Instance details

Defined in Servant.Client.Core.BaseUrl

FromJSON StudentT 
Instance details

Defined in Statistics.Distribution.StudentT

FromJSON AdditionalProperties 
Instance details

Defined in Data.Swagger.Internal

FromJSON ApiKeyLocation 
Instance details

Defined in Data.Swagger.Internal

FromJSON ApiKeyParams 
Instance details

Defined in Data.Swagger.Internal

FromJSON Contact 
Instance details

Defined in Data.Swagger.Internal

FromJSON Example 
Instance details

Defined in Data.Swagger.Internal

FromJSON ExternalDocs 
Instance details

Defined in Data.Swagger.Internal

FromJSON Header 
Instance details

Defined in Data.Swagger.Internal

FromJSON Host 
Instance details

Defined in Data.Swagger.Internal

FromJSON Info 
Instance details

Defined in Data.Swagger.Internal

FromJSON License 
Instance details

Defined in Data.Swagger.Internal

FromJSON MimeList 
Instance details

Defined in Data.Swagger.Internal

FromJSON OAuth2Flow 
Instance details

Defined in Data.Swagger.Internal

FromJSON OAuth2Params 
Instance details

Defined in Data.Swagger.Internal

FromJSON Operation 
Instance details

Defined in Data.Swagger.Internal

FromJSON Param 
Instance details

Defined in Data.Swagger.Internal

FromJSON ParamAnySchema 
Instance details

Defined in Data.Swagger.Internal

FromJSON ParamLocation 
Instance details

Defined in Data.Swagger.Internal

FromJSON ParamOtherSchema 
Instance details

Defined in Data.Swagger.Internal

FromJSON PathItem 
Instance details

Defined in Data.Swagger.Internal

FromJSON Reference 
Instance details

Defined in Data.Swagger.Internal

FromJSON Response 
Instance details

Defined in Data.Swagger.Internal

FromJSON Responses 
Instance details

Defined in Data.Swagger.Internal

FromJSON Schema 
Instance details

Defined in Data.Swagger.Internal

FromJSON Scheme 
Instance details

Defined in Data.Swagger.Internal

FromJSON SecurityDefinitions 
Instance details

Defined in Data.Swagger.Internal

FromJSON SecurityRequirement 
Instance details

Defined in Data.Swagger.Internal

FromJSON SecurityScheme 
Instance details

Defined in Data.Swagger.Internal

FromJSON SecuritySchemeType 
Instance details

Defined in Data.Swagger.Internal

FromJSON Swagger 
Instance details

Defined in Data.Swagger.Internal

FromJSON Tag 
Instance details

Defined in Data.Swagger.Internal

FromJSON URL 
Instance details

Defined in Data.Swagger.Internal

FromJSON Xml 
Instance details

Defined in Data.Swagger.Internal

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON ShortText

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Month 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Quarter 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON NominalDiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON ZonedTime

Supported string formats:

YYYY-MM-DD HH:MM Z YYYY-MM-DD HH:MM:SS Z YYYY-MM-DD HH:MM:SS.SSS Z

The first space may instead be a T, and the second space is optional. The Z represents UTC. The Z may be replaced with a time zone offset of the form +0000 or -08:00, where the first two digits are hours, the : is optional and the second two digits (also optional) are minutes.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Integer

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON () 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser () Source #

parseJSONListValueParser [()] Source #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON v ⇒ FromJSON (KeyMap v)

Since: aeson-2.0.1.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Confidential a) # 
Instance details

Defined in GeniusYield.GYConfig

FromJSON a ⇒ FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, Integral a) ⇒ FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (Script Cosigner) 
Instance details

Defined in Cardano.Address.Script

FromJSON (Script KeyHash) 
Instance details

Defined in Cardano.Address.Script

FromJSON (Address ByronAddr) 
Instance details

Defined in Cardano.Api.Address

FromJSON (Address ShelleyAddr) 
Instance details

Defined in Cardano.Api.Address

IsShelleyBasedEra era ⇒ FromJSON (AddressInEra era) 
Instance details

Defined in Cardano.Api.Address

FromJSON (Hash BlockHeader) 
Instance details

Defined in Cardano.Api.Block

FromJSON (Hash PaymentKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

FromJSON (Hash StakePoolKey) 
Instance details

Defined in Cardano.Api.Keys.Shelley

FromJSON (Hash ScriptData) 
Instance details

Defined in Cardano.Api.ScriptData

(IsShelleyBasedEra era, FromJSON (TxOut CtxUTxO era)) ⇒ FromJSON (UTxO era) 
Instance details

Defined in Cardano.Api.Query

Methods

parseJSONValueParser (UTxO era) Source #

parseJSONListValueParser [UTxO era] Source #

IsCardanoEra era ⇒ FromJSON (ReferenceScript era) 
Instance details

Defined in Cardano.Api.Script

SerialiseAsBech32 a ⇒ FromJSON (UsingBech32 a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

SerialiseAsRawBytes a ⇒ FromJSON (UsingRawBytesHex a) 
Instance details

Defined in Cardano.Api.SerialiseUsing

IsCardanoEra era ⇒ FromJSON (TxOutValue era) 
Instance details

Defined in Cardano.Api.TxBody

FromJSON a ⇒ FromJSON (RedeemSignature a) 
Instance details

Defined in Cardano.Crypto.Signing.Redeem.Signature

FromJSON (Signature w) 
Instance details

Defined in Cardano.Crypto.Signing.Signature

FromJSON a ⇒ FromJSON (ExUnits' a) 
Instance details

Defined in Cardano.Ledger.Alonzo.Scripts

Crypto c ⇒ FromJSON (ConwayGenesis c) 
Instance details

Defined in Cardano.Ledger.Conway.Genesis

Crypto c ⇒ FromJSON (Addr c) 
Instance details

Defined in Cardano.Ledger.Address

Crypto c ⇒ FromJSON (RewardAcnt c) 
Instance details

Defined in Cardano.Ledger.Address

Crypto c ⇒ FromJSON (BlocksMade c) 
Instance details

Defined in Cardano.Ledger.BaseTypes

FromJSON (CompactForm Coin) 
Instance details

Defined in Cardano.Ledger.Coin

FromJSON (PParamsHKD Identity era) ⇒ FromJSON (PParams era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

FromJSON (PParamsHKD StrictMaybe era) ⇒ FromJSON (PParamsUpdate era) 
Instance details

Defined in Cardano.Ledger.Core.PParams

Crypto c ⇒ FromJSON (ScriptHash c) 
Instance details

Defined in Cardano.Ledger.Hashes

Crypto c ⇒ FromJSON (GenDelegPair c) 
Instance details

Defined in Cardano.Ledger.Keys

Crypto c ⇒ FromJSON (GenDelegs c) 
Instance details

Defined in Cardano.Ledger.Keys

Crypto c ⇒ FromJSON (PoolParams c) 
Instance details

Defined in Cardano.Ledger.PoolParams

Crypto c ⇒ FromJSON (TxId c) 
Instance details

Defined in Cardano.Ledger.TxIn

Crypto c ⇒ FromJSON (PolicyID c) 
Instance details

Defined in Cardano.Ledger.Mary.Value

Crypto c ⇒ FromJSON (ShelleyGenesis c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Crypto c ⇒ FromJSON (ShelleyGenesisStaking c) 
Instance details

Defined in Cardano.Ledger.Shelley.Genesis

Crypto c ⇒ FromJSON (RewardProvenance c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

Crypto c ⇒ FromJSON (RewardProvenancePool c) 
Instance details

Defined in Cardano.Ledger.Shelley.RewardProvenance

FromJSON a ⇒ FromJSON (WithOrigin a) 
Instance details

Defined in Cardano.Slotting.Slot

FromJSON a ⇒ FromJSON (StrictMaybe a) 
Instance details

Defined in Data.Maybe.Strict

FromJSON a ⇒ FromJSON (StrictSeq a) 
Instance details

Defined in Data.Sequence.Strict

FromJSON (Flat TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

FromJSON (Nested TokenMap) 
Instance details

Defined in Cardano.Wallet.Primitive.Types.TokenMap

FromJSON a ⇒ FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Ord a, FromJSON a) ⇒ FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON v ⇒ FromJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON1 f ⇒ FromJSON (Fix f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON1 f, Functor f) ⇒ FromJSON (Mu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON1 f, Functor f) ⇒ FromJSON (Nu f)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (DNonEmpty a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (Generically a)

Since: aeson-2.1.0.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (InsOrdHashSet a) 
Instance details

Defined in Data.HashSet.InsOrd

FromJSON a ⇒ FromJSON (Item a) 
Instance details

Defined in Katip.Core

FromJSON (Bech32StringOf a) 
Instance details

Defined in Maestro.Types.Common

FromJSON (HashStringOf a) 
Instance details

Defined in Maestro.Types.Common

FromJSON (HexStringOf a) 
Instance details

Defined in Maestro.Types.Common

FromJSON (TaggedText description) 
Instance details

Defined in Maestro.Types.V1.Common

Methods

parseJSONValueParser (TaggedText description) Source #

parseJSONListValueParser [TaggedText description] Source #

FromJSON i ⇒ FromJSON (MemoryStepsWith i) 
Instance details

Defined in Maestro.Types.V1.General

FromJSON (BuiltinCostModelBase CostingFun) 
Instance details

Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel

FromJSON a ⇒ FromJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Prim a, FromJSON a) ⇒ FromJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON d ⇒ FromJSON (LinearTransform d) 
Instance details

Defined in Statistics.Distribution.Transform

FromJSON a ⇒ FromJSON (Maybe a)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (CollectionFormat ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (CollectionFormat ('SwaggerKindParamOtherSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

(FromJSON (SwaggerType ('SwaggerKindNormal t)), FromJSON (SwaggerItems ('SwaggerKindNormal t))) ⇒ FromJSON (ParamSchema ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (ParamSchema ('SwaggerKindParamOtherSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (ParamSchema ('SwaggerKindSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (Referenced Param) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (Referenced Response) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (Referenced Schema) 
Instance details

Defined in Data.Swagger.Internal

(FromJSON (CollectionFormat ('SwaggerKindNormal t)), FromJSON (ParamSchema ('SwaggerKindNormal t))) ⇒ FromJSON (SwaggerItems ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (SwaggerItems ('SwaggerKindParamOtherSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (SwaggerItems ('SwaggerKindSchemaSwaggerKind Type))
>>> decode "{}" :: Maybe (SwaggerItems 'SwaggerKindSchema)
Just (SwaggerItemsArray [])
>>> eitherDecode "{\"$ref\":\"#/definitions/example\"}" :: Either String (SwaggerItems 'SwaggerKindSchema)
Right (SwaggerItemsObject (Ref (Reference {getReference = "example"})))
>>> eitherDecode "[{\"$ref\":\"#/definitions/example\"}]" :: Either String (SwaggerItems 'SwaggerKindSchema)
Right (SwaggerItemsArray [Ref (Reference {getReference = "example"})])
Instance details

Defined in Data.Swagger.Internal

FromJSON (SwaggerType ('SwaggerKindNormal t)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (SwaggerType ('SwaggerKindParamOtherSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

FromJSON (SwaggerType ('SwaggerKindSchemaSwaggerKind Type)) 
Instance details

Defined in Data.Swagger.Internal

(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Prim a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Storable a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(Vector Vector a, FromJSON a) ⇒ FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (Maybe PoolMetadata) 
Instance details

Defined in Blockfrost.Types.Cardano.Pools

FromJSON a ⇒ FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a ⇒ FromJSON (a)

Since: aeson-2.0.2.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (a) Source #

parseJSONListValueParser [(a)] Source #

FromJSON a ⇒ FromJSON [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser [a] Source #

parseJSONListValueParser [[a]] Source #

(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

HasResolution a ⇒ FromJSON (Fixed a)

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (File content direction) 
Instance details

Defined in Cardano.Api.IO.Base

Methods

parseJSONValueParser (File content direction) Source #

parseJSONListValueParser [File content direction] Source #

FromJSON (EraInMode AllegraEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode AlonzoEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode BabbageEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode ByronEra ByronMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode ByronEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode ConwayEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode MaryEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode ShelleyEra CardanoMode) 
Instance details

Defined in Cardano.Api.Modes

FromJSON (EraInMode ShelleyEra ShelleyMode) 
Instance details

Defined in Cardano.Api.Modes

IsShelleyBasedEra era ⇒ FromJSON (TxOut CtxTx era) 
Instance details

Defined in Cardano.Api.TxBody

IsShelleyBasedEra era ⇒ FromJSON (TxOut CtxUTxO era) 
Instance details

Defined in Cardano.Api.TxBody

HashAlgorithm h ⇒ FromJSON (Hash h a) 
Instance details

Defined in Cardano.Crypto.Hash.Class

Methods

parseJSONValueParser (Hash h a) Source #

parseJSONListValueParser [Hash h a] Source #

HashAlgorithm algo ⇒ FromJSON (AbstractHash algo a) 
Instance details

Defined in Cardano.Crypto.Hashing

(FromJSON v, FromJSONKey k) ⇒ FromJSON (ListMap k v) 
Instance details

Defined in Data.ListMap

FromJSON (AlonzoPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Alonzo.PParams

FromJSON b ⇒ FromJSON (Annotated b ()) 
Instance details

Defined in Cardano.Ledger.Binary.Decoding.Annotated

Bounded (BoundedRatio b Word64) ⇒ FromJSON (BoundedRatio b Word64) 
Instance details

Defined in Cardano.Ledger.BaseTypes

Methods

parseJSONValueParser (BoundedRatio b Word64) Source #

parseJSONListValueParser [BoundedRatio b Word64] Source #

Crypto c ⇒ FromJSON (Credential kr c) 
Instance details

Defined in Cardano.Ledger.Credential

Crypto c ⇒ FromJSON (KeyHash disc c) 
Instance details

Defined in Cardano.Ledger.Keys

Methods

parseJSONValueParser (KeyHash disc c) Source #

parseJSONListValueParser [KeyHash disc c] Source #

Crypto c ⇒ FromJSON (SafeHash c index) 
Instance details

Defined in Cardano.Ledger.SafeHash

Methods

parseJSONValueParser (SafeHash c index) Source #

parseJSONListValueParser [SafeHash c index] Source #

FromJSON (ShelleyPParams Identity era) 
Instance details

Defined in Cardano.Ledger.Shelley.PParams

(KnownSymbol unit, FromJSON a) ⇒ FromJSON (Quantity unit a) 
Instance details

Defined in Data.Quantity

Methods

parseJSONValueParser (Quantity unit a) Source #

parseJSONListValueParser [Quantity unit a] Source #

(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Map k v) Source #

parseJSONListValueParser [Map k v] Source #

(Eq k, Hashable k, FromJSONKey k, FromJSON v) ⇒ FromJSON (InsOrdHashMap k v) 
Instance details

Defined in Data.HashMap.Strict.InsOrd

(FromJSONKey k, Ord k, FromJSON a) ⇒ FromJSON (MonoidalMap k a) 
Instance details

Defined in Data.Map.Monoidal

(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSON b) ⇒ FromJSON (These a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSON b) ⇒ FromJSON (Pair a b)

Since: aeson-1.5.3.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Pair a b) Source #

parseJSONListValueParser [Pair a b] Source #

(FromJSON a, FromJSON b) ⇒ FromJSON (These a b)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON v, FromJSONKey k, Eq k, Hashable k) ⇒ FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON (Address, NutlinkTicker) 
Instance details

Defined in Blockfrost.Types.NutLink

FromJSON (Text, Metric) 
Instance details

Defined in Blockfrost.Types.Common

(FromJSON a, FromJSON b) ⇒ FromJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (a, b) Source #

parseJSONListValueParser [(a, b)] Source #

FromJSON a ⇒ FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(AesonOptions t, Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (CustomJSON t a) 
Instance details

Defined in Deriving.Aeson

FromJSON b ⇒ FromJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (These1 f g a)

Since: aeson-1.5.1.0

Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (These1 f g a) Source #

parseJSONListValueParser [These1 f g a] Source #

(FromJSON a, FromJSON b, FromJSON c) ⇒ FromJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (a, b, c) Source #

parseJSONListValueParser [(a, b, c)] Source #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Product f g a) Source #

parseJSONListValueParser [Product f g a] Source #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Sum f g a) Source #

parseJSONListValueParser [Sum f g a] Source #

(Vector vk k, Vector vv v, Ord k, FromJSONKey k, FromJSON v) ⇒ FromJSON (VMap vk vv k v) 
Instance details

Defined in Data.VMap

Methods

parseJSONValueParser (VMap vk vv k v) Source #

parseJSONListValueParser [VMap vk vv k v] Source #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d) ⇒ FromJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (a, b, c, d) Source #

parseJSONListValueParser [(a, b, c, d)] Source #

(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSONValueParser (Compose f g a) Source #

parseJSONListValueParser [Compose f g a] Source #

(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

parseJSONValueParser (a, b, c, d, e) Source #

parseJSONListValueParser [(a, b, c, d, e)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f) Source #

parseJSONListValueParser [(a, b, c, d, e, f)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j, k) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j, k)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j, k, l) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j, k, l)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j, k, l, m) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] Source #

(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

parseJSONValueParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) Source #

parseJSONListValueParser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] Source #

secondBifunctor p ⇒ (b → c) → p a b → p a c Source #

Map covariantly over the second argument.

secondbimap id

Examples

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

bimapBifunctor p ⇒ (a → b) → (c → d) → p a c → p b d Source #

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

Map covariantly over the first argument.

first f ≡ bimap f id

Examples

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

class PrintfArg a where Source #

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

Since: base-4.7.0.0

parseFormat ∷ a → ModifierParser Source #

Since: base-4.7.0.0

Instances

Instances details
PrintfArg BalancingError # 
Instance details

Defined in GeniusYield.Transaction.Common

PrintfArg GYAddress #

This instance is using for logging

>>> Printf.printf "addr = %s" addr
addr = addr_test1qrsuhwqdhz0zjgnf46unas27h93amfghddnff8lpc2n28rgmjv8f77ka0zshfgssqr5cnl64zdnde5f8q2xt923e7ctqu49mg5
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYStakeAddress #

This instance is using for logging

>>> Printf.printf "stake addr = %s" stakeAddr
stake addr = stake_test1upa805fqh85x4hw88zxmhvdaydgyjzmazs9tydqrscerxnghfq4t3
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYStakeAddressBech32 # 
Instance details

Defined in GeniusYield.Types.Address

PrintfArg GYPaymentCredential # 
Instance details

Defined in GeniusYield.Types.Credential

PrintfArg GYStakeCredential # 
Instance details

Defined in GeniusYield.Types.Credential

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 GYStakeSigningKey #
>>> Printf.printf "%s\n" ("5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290" :: GYStakeSigningKey)
5ac75cb3435ef38c5bf15d11469b301b13729deb9595133a608fc0881fcec290
Instance details

Defined in GeniusYield.Types.Key

PrintfArg GYStakeVerificationKey #
>>> Printf.printf "%s\n" ("0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605" :: GYStakeVerificationKey)
0717bc56ed4897c3dde0690e3d9ce61e28a55f520fde454f6b5b61305b193605
Instance details

Defined in GeniusYield.Types.Key

PrintfArg GYLogNamespace #
>>> printf "%s" ("My" <> "Namespace" :: GYLogNamespace)
My.Namespace
Instance details

Defined in GeniusYield.Types.Logging

PrintfArg GYNatural # 
Instance details

Defined in GeniusYield.Types.Natural

PrintfArg GYPaymentKeyHash #
>>> Printf.printf "%s\n" $ paymentKeyHashFromApi "e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d
Instance details

Defined in GeniusYield.Types.PaymentKeyHash

PrintfArg GYPubKeyHash #
>>> Printf.printf "%s\n" $ pubKeyHashFromApi "e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d"
e1cbb80db89e292269aeb93ec15eb963dda5176b66949fe1c2a6a38d
Instance details

Defined in GeniusYield.Types.PubKeyHash

PrintfArg GYRational #
>>> printf "%6.4f\n" $ fromRational @GYRational 0.123
0.1230
Instance details

Defined in GeniusYield.Types.Rational

PrintfArg GYScriptHash #
>>> printf "%s" ("cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0" :: GYScriptHash)
cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0
Instance details

Defined in GeniusYield.Types.Script

PrintfArg GYValidatorHash #
>>> printf "%s" ("cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0" :: GYValidatorHash)
cabdd19b58d4299fde05b53c2c0baf978bf9ade734b490fc0cc8b7d0
Instance details

Defined in GeniusYield.Types.Script

PrintfArg GYSlot # 
Instance details

Defined in GeniusYield.Types.Slot

PrintfArg GYStakeKeyHash #
>>> Printf.printf "%s\n" $ stakeKeyHashFromApi "7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d"
7a77d120b9e86addc7388dbbb1bd2350490b7d140ab234038632334d
Instance details

Defined in GeniusYield.Types.StakeKeyHash

PrintfArg GYTime #
>>> printf "%s\n" $ timeFromPlutus 1000
1970-01-01T00:00:01Z
Instance details

Defined in GeniusYield.Types.Time

PrintfArg GYTx # 
Instance details

Defined in GeniusYield.Types.Tx

PrintfArg GYTxId #
>>> Printf.printf "tid = %s" gyTxId
tid = 6c751d3e198c5608dfafdfdffe16aeac8a28f88f3a769cf22dd45e8bc84f47e8
Instance details

Defined in GeniusYield.Types.Tx

PrintfArg GYTxWitness # 
Instance details

Defined in GeniusYield.Types.Tx

PrintfArg GYTxOutRef # 
Instance details

Defined in GeniusYield.Types.TxOutRef

PrintfArg GYTxOutRefCbor # 
Instance details

Defined in GeniusYield.Types.TxOutRef

PrintfArg GYUTxOs # 
Instance details

Defined in GeniusYield.Types.UTxO

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 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 Int8

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 Word8

Since: base-2.1

Instance details

Defined in Text.Printf

PrintfArg ShortText

Since: text-short-0.1.2

Instance details

Defined in Data.Text.Short.Internal

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 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 Word

Since: base-2.1

Instance details

Defined in Text.Printf

IsChar c ⇒ PrintfArg [c]

Since: base-2.1

Instance details

Defined in Text.Printf

printfPrintfType r ⇒ String → r Source #

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.

minimumByFoldable t ⇒ (a → a → Ordering) → t a → a Source #

The least element of a non-empty structure with respect to the given comparison function.

Examples

Expand

Basic usage:

>>> minimumBy (compare `on` length) ["Hello", "World", "!", "Longest", "bar"]
"!"

WARNING: This function is partial for possibly-empty structures like lists.

maximumByFoldable t ⇒ (a → a → Ordering) → t a → a Source #

The largest element of a non-empty structure with respect to the given comparison function.

Examples

Expand

Basic usage:

>>> maximumBy (compare `on` length) ["Hello", "World", "!", "Longest", "bar"]
"Longest"

WARNING: This function is partial for possibly-empty structures like lists.

fromRight ∷ b → Either a b → b Source #

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

Examples

Expand

Basic usage:

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

Since: base-4.10.0.0

(>>>) ∷ ∀ {k} cat (a ∷ k) (b ∷ k) (c ∷ k). Category cat ⇒ cat a b → cat b c → cat a c infixr 1 Source #

Left-to-right composition

data (a ∷ k) :~: (b ∷ k) where infix 4 Source #

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
Category ((:~:) ∷ k → k → Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Category

Methods

id ∷ ∀ (a ∷ k0). a :~: a Source #

(.) ∷ ∀ (b ∷ k0) (c ∷ k0) (a ∷ k0). (b :~: c) → (a :~: b) → a :~: c Source #

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) Source #

GNFData ((:~:) a ∷ k → Type)

Since: some-1.0.3

Instance details

Defined in Data.GADT.DeepSeq

Methods

grnf ∷ ∀ (a0 ∷ k0). (a :~: a0) → () Source #

GCompare ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

gcompare ∷ ∀ (a0 ∷ k0) (b ∷ k0). (a :~: a0) → (a :~: b) → GOrdering a0 b Source #

GEq ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

geq ∷ ∀ (a0 ∷ k0) (b ∷ k0). (a :~: a0) → (a :~: b) → Maybe (a0 :~: b) Source #

GRead ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

greadsPrecIntGReadS ((:~:) a) Source #

GShow ((:~:) a ∷ k → Type) 
Instance details

Defined in Data.GADT.Internal

Methods

gshowsPrec ∷ ∀ (a0 ∷ k0). Int → (a :~: a0) → ShowS Source #

NFData2 ((:~:)TypeTypeType)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 ∷ (a → ()) → (b → ()) → (a :~: b) → () Source #

NFData1 ((:~:) a)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf ∷ (a0 → ()) → (a :~: a0) → () Source #

(a ~ b, Data a) ⇒ Data (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Data

Methods

gfoldl ∷ (∀ d b0. Data d ⇒ c (d → b0) → d → c b0) → (∀ g. g → c g) → (a :~: b) → c (a :~: b) Source #

gunfold ∷ (∀ b0 r. Data b0 ⇒ c (b0 → r) → c r) → (∀ r. r → c r) → Constr → c (a :~: b) Source #

toConstr ∷ (a :~: b) → Constr Source #

dataTypeOf ∷ (a :~: b) → DataType Source #

dataCast1Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (a :~: b)) Source #

dataCast2Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (a :~: b)) Source #

gmapT ∷ (∀ b0. Data b0 ⇒ b0 → b0) → (a :~: b) → a :~: b Source #

gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → (a :~: b) → r Source #

gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → (a :~: b) → r Source #

gmapQ ∷ (∀ d. Data d ⇒ d → u) → (a :~: b) → [u] Source #

gmapQiInt → (∀ d. Data d ⇒ d → u) → (a :~: b) → u Source #

gmapMMonad m ⇒ (∀ d. Data d ⇒ d → m d) → (a :~: b) → m (a :~: b) Source #

gmapMpMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → (a :~: b) → m (a :~: b) Source #

gmapMoMonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → (a :~: b) → m (a :~: b) Source #

a ~ b ⇒ Bounded (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

minBound ∷ a :~: b Source #

maxBound ∷ a :~: b Source #

a ~ b ⇒ Enum (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

succ ∷ (a :~: b) → a :~: b Source #

pred ∷ (a :~: b) → a :~: b Source #

toEnumInt → a :~: b Source #

fromEnum ∷ (a :~: b) → Int Source #

enumFrom ∷ (a :~: b) → [a :~: b] Source #

enumFromThen ∷ (a :~: b) → (a :~: b) → [a :~: b] Source #

enumFromTo ∷ (a :~: b) → (a :~: b) → [a :~: b] Source #

enumFromThenTo ∷ (a :~: b) → (a :~: b) → (a :~: b) → [a :~: b] Source #

a ~ b ⇒ Read (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Show (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

showsPrecInt → (a :~: b) → ShowS Source #

show ∷ (a :~: b) → String Source #

showList ∷ [a :~: b] → ShowS Source #

NFData (a :~: b)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

rnf ∷ (a :~: b) → () Source #

Eq (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

(==) ∷ (a :~: b) → (a :~: b) → Bool Source #

(/=) ∷ (a :~: b) → (a :~: b) → Bool Source #

Ord (a :~: b)

Since: base-4.7.0.0

Instance details

Defined in Data.Type.Equality

Methods

compare ∷ (a :~: b) → (a :~: b) → Ordering Source #

(<) ∷ (a :~: b) → (a :~: b) → Bool Source #

(<=) ∷ (a :~: b) → (a :~: b) → Bool Source #

(>) ∷ (a :~: b) → (a :~: b) → Bool Source #

(>=) ∷ (a :~: b) → (a :~: b) → Bool Source #

max ∷ (a :~: b) → (a :~: b) → a :~: b Source #

min ∷ (a :~: b) → (a :~: b) → a :~: b Source #

isHexDigitCharBool Source #

Selects ASCII hexadecimal digits, i.e. '0'..'9', 'a'..'f', 'A'..'F'.

(&) ∷ a → (a → b) → b infixl 1 Source #

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

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

Since: base-4.8.0.0

(<&>)Functor f ⇒ f a → (a → b) → f b infixl 1 Source #

Flipped version of <$>.

(<&>) = flip fmap

Examples

Expand

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

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

Since: base-4.11.0.0

type HasCallStack = ?callStack ∷ CallStack Source #

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

encodeUtf8TextByteString Source #

Encode text using UTF-8 encoding.

rightToMaybeEither a b → Maybe b Source #

Maybe get the Right side of an Either.

rightToMaybeeither (const Nothing) Just

Using Control.Lens:

rightToMaybe ≡ preview _Right
rightToMaybe x ≡ x^?_Right
>>> rightToMaybe (Left 12)
Nothing
>>> rightToMaybe (Right 12)
Just 12

itoListFoldableWithIndex i f ⇒ f a → [(i, a)] Source #

Extract the key-value pairs from a structure.

When you don't need access to the indices in the result, then toList is more flexible in what it accepts.

toListmap snd . itoList

ifor_ ∷ (FoldableWithIndex i t, Applicative f) ⇒ t a → (i → a → f b) → f () Source #

Traverse elements with access to the index i, discarding the results (with the arguments flipped).

ifor_flip itraverse_

When you don't need access to the index then for_ is more flexible in what it accepts.

for_ a ≡ ifor_ a . const

data Some (tag ∷ k → Type) where Source #

Existential. This is type is useful to hide GADTs' parameters.

>>> data Tag :: Type -> Type where TagInt :: Tag Int; TagBool :: Tag Bool
>>> instance GShow Tag where gshowsPrec _ TagInt = showString "TagInt"; gshowsPrec _ TagBool = showString "TagBool"
>>> classify s = case s of "TagInt" -> [mkGReadResult TagInt]; "TagBool" -> [mkGReadResult TagBool]; _ -> []
>>> instance GRead Tag where greadsPrec _ s = [ (r, rest) | (con, rest) <-  lex s, r <- classify con ]

You can either use PatternSynonyms (available with GHC >= 8.0)

>>> let x = Some TagInt
>>> x
Some TagInt
>>> case x of { Some TagInt -> "I"; Some TagBool -> "B" } :: String
"I"

or you can use functions

>>> let y = mkSome TagBool
>>> y
Some TagBool
>>> withSome y $ \y' -> case y' of { TagInt -> "I"; TagBool -> "B" } :: String
"B"

The implementation of mapSome is safe.

>>> let f :: Tag a -> Tag a; f TagInt = TagInt; f TagBool = TagBool
>>> mapSome f y
Some TagBool

but you can also use:

>>> withSome y (mkSome . f)
Some TagBool
>>> read "Some TagBool" :: Some Tag
Some TagBool
>>> read "mkSome TagInt" :: Some Tag
Some TagInt

Bundled Patterns

pattern Some ∷ ∀ {k} tag (a ∷ k). () ⇒ tag a → Some tag 

Instances

Instances details
Applicative m ⇒ Monoid (Some m) 
Instance details

Defined in Data.Some.Newtype

Methods

memptySome m Source #

mappendSome m → Some m → Some m Source #

mconcat ∷ [Some m] → Some m Source #

Applicative m ⇒ Semigroup (Some m) 
Instance details

Defined in Data.Some.Newtype

Methods

(<>)Some m → Some m → Some m Source #

sconcatNonEmpty (Some m) → Some m Source #

stimesIntegral b ⇒ b → Some m → Some m Source #

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

showSome tag → String Source #

showList ∷ [Some tag] → ShowS Source #

GNFData tag ⇒ NFData (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

rnfSome tag → () Source #

GEq tag ⇒ Eq (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

(==)Some tag → Some tag → Bool Source #

(/=)Some tag → Some tag → Bool Source #

GCompare tag ⇒ Ord (Some tag) 
Instance details

Defined in Data.Some.Newtype

Methods

compareSome tag → Some tag → Ordering Source #

(<)Some tag → Some tag → Bool Source #

(<=)Some tag → Some tag → Bool Source #

(>)Some tag → Some tag → Bool Source #

(>=)Some tag → Some tag → Bool Source #

maxSome tag → Some tag → Some tag Source #

minSome tag → Some tag → Some tag Source #

withSomeSome tag → (∀ (a ∷ k). tag a → b) → b Source #

Eliminator.

mapMaybeFilterable f ⇒ (a → Maybe b) → f a → f b Source #

Like mapMaybe.

catMaybesFilterable f ⇒ f (Maybe a) → f a Source #

wither ∷ (Witherable t, Applicative f) ⇒ (a → f (Maybe b)) → t a → f (t b) Source #

Effectful mapMaybe.

wither (pure . f) ≡ pure . mapMaybe f

iwither ∷ (WitherableWithIndex i t, Applicative f) ⇒ (i → a → f (Maybe b)) → t a → f (t b) Source #

Effectful imapMaybe.

iwither ( i -> pure . f i) ≡ pure . imapMaybe f

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.

hoistMaybeApplicative m ⇒ Maybe b → MaybeT m b #

Convert a Maybe computation to MaybeT.

NOTE: This is also defined (& exported) in transformers-0.6.0.0, so should be removed once we upgrade to it.

Orphan instances

(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # 
Instance details

(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # 
Instance details