atlas-cardano-0.3.0: Application backend for Plutus smart contracts on Cardano
Copyright(c) 2023 GYELD GMBH
LicenseApache 2.0
Maintainer[email protected]
Stabilitydevelop
Safe 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 GYDatumHash # 
Instance details

Defined in GeniusYield.Types.Datum

IsString GYExtendedPaymentSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYPaymentSigningKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYPaymentVerificationKey # 
Instance details

Defined in GeniusYield.Types.Key

IsString GYLogNamespace # 
Instance details

Defined in GeniusYield.Types.Logging

IsString LogSrc # 
Instance details

Defined in GeniusYield.Types.Logging

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