Copyright | (c) 2023 GYELD GMBH |
---|---|
License | Apache 2.0 |
Maintainer | support@geniusyield.co |
Stability | develop |
Safe Haskell | None |
Language | Haskell2010 |
GeniusYield.Imports
Contents
Description
Synopsis
- coerce ∷ ∀ (k ∷ RuntimeRep) (a ∷ TYPE k) (b ∷ TYPE k). Coercible a b ⇒ a → b
- guard ∷ Alternative f ⇒ Bool → f ()
- join ∷ Monad m ⇒ m (m a) → m a
- class IsString a where
- fromString ∷ String → a
- liftA2 ∷ Applicative f ⇒ (a → b → c) → f a → f b → f c
- toList ∷ Foldable t ⇒ t a → [a]
- foldl' ∷ Foldable t ⇒ (b → a → b) → b → t a → b
- class Generic a
- data Natural
- type Type = Type
- data Constraint
- data CallStack
- class Contravariant (f ∷ Type → Type) where
- absurd ∷ Void → a
- data Void
- second ∷ Bifunctor p ⇒ (b → c) → p a b → p a c
- bimap ∷ Bifunctor p ⇒ (a → b) → (c → d) → p a c → p b d
- first ∷ Bifunctor p ⇒ (a → b) → p a c → p b c
- printf ∷ PrintfType r ⇒ String → r
- class PrintfArg a where
- formatArg ∷ a → FieldFormatter
- parseFormat ∷ a → ModifierParser
- unless ∷ Applicative f ⇒ Bool → f () → f ()
- foldM ∷ (Foldable t, Monad m) ⇒ (b → a → m b) → b → t a → m b
- forM ∷ (Traversable t, Monad m) ⇒ t a → (a → m b) → m (t b)
- newtype Identity a = Identity {
- runIdentity ∷ a
- throwIO ∷ Exception e ⇒ e → IO a
- catch ∷ Exception e ⇒ IO a → (e → IO a) → IO a
- class (Typeable e, Show e) ⇒ Exception e
- newtype Const a (b ∷ k) = Const {
- getConst ∷ a
- find ∷ Foldable t ⇒ (a → Bool) → t a → Maybe a
- minimumBy ∷ Foldable t ⇒ (a → a → Ordering) → t a → a
- maximumBy ∷ Foldable t ⇒ (a → a → Ordering) → t a → a
- forM_ ∷ (Foldable t, Monad m) ⇒ t a → (a → m b) → m ()
- sortBy ∷ (a → a → Ordering) → [a] → [a]
- fromRight ∷ b → Either a b → b
- data Proxy (t ∷ k) = Proxy
- data (a ∷ k) :~: (b ∷ k) where
- isAlphaNum ∷ Char → Bool
- isHexDigit ∷ Char → Bool
- fromMaybe ∷ a → Maybe a → a
- isJust ∷ Maybe a → Bool
- on ∷ (b → b → c) → (a → b) → a → a → c
- void ∷ Functor f ⇒ f a → f ()
- ap ∷ Monad m ⇒ m (a → b) → m a → m b
- when ∷ Applicative f ⇒ Bool → f () → f ()
- type HasCallStack = ?callStack ∷ CallStack
- data Map k a
- data Set a
- encodeUtf8 ∷ Text → ByteString
- data Text
- class FromJSON a where
- parseJSON ∷ Value → Parser a
- parseJSONList ∷ Value → Parser [a]
- class ToJSON a where
- toJSON ∷ a → Value
- toEncoding ∷ a → Encoding
- toJSONList ∷ [a] → Value
- toEncodingList ∷ [a] → Encoding
- data Some (tag ∷ k → Type) where
- rightToMaybe ∷ Either a b → Maybe b
- ifor_ ∷ (FoldableWithIndex i t, Applicative f) ⇒ t a → (i → a → f b) → f ()
- itoList ∷ FoldableWithIndex i f ⇒ f a → [(i, a)]
- withSome ∷ Some tag → (∀ (a ∷ k). tag a → b) → b
- catMaybes ∷ Filterable f ⇒ f (Maybe a) → f a
- mapMaybe ∷ Filterable f ⇒ (a → Maybe b) → f a → f b
- wither ∷ (Witherable t, Applicative f) ⇒ (a → f (Maybe b)) → t a → f (t b)
- iwither ∷ (WitherableWithIndex i t, Applicative f) ⇒ (i → a → f (Maybe b)) → t a → f (t b)
- pattern TODO ∷ () ⇒ HasCallStack ⇒ a
- findFirst ∷ Foldable f ⇒ (a → Maybe b) → f a → Maybe b
- decodeUtf8Lenient ∷ ByteString → Text
- lazyDecodeUtf8Lenient ∷ ByteString → Text
- hush ∷ Either e a → Maybe a
Documentation
coerce ∷ ∀ (k ∷ RuntimeRep) (a ∷ TYPE k) (b ∷ TYPE k). Coercible a b ⇒ a → b #
The function coerce
allows you to safely convert between values of
types that have the same representation with no run-time overhead. In the
simplest case you can use it instead of a newtype constructor, to go from
the newtype's concrete type to the abstract type. But it also works in
more complicated settings, e.g. converting a list of newtypes to a list of
concrete types.
This function is runtime-representation polymorphic, but the
RuntimeRep
type argument is marked as Inferred
, meaning
that it is not available for visible type application. This means
the typechecker will accept coerce @Int @Age 42
.
guard ∷ Alternative f ⇒ Bool → f () #
Conditional failure of Alternative
computations. Defined by
guard True =pure
() guard False =empty
Examples
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
otherwise. For example:Just
(x `div`
y)
>>> 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)
join ∷ Monad m ⇒ m (m a) → m a #
The join
function is the conventional monad join operator. It
is used to remove one level of monadic structure, projecting its
bound argument into the outer level.
'
' can be understood as the join
bssdo
expression
do bs <- bss bs
Examples
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
Class for string-like datastructures; used by the overloaded string extension (-XOverloadedStrings in GHC).
Methods
fromString ∷ String → a #
Instances
IsString ShortByteString | Beware: |
Defined in Data.ByteString.Short.Internal Methods | |
IsString ByteString | Beware: |
Defined in Data.ByteString.Lazy.Internal Methods fromString ∷ String → ByteString # | |
IsString ByteString | Beware: |
Defined in Data.ByteString.Internal Methods fromString ∷ String → ByteString # | |
IsString Doc | |
Defined in Text.PrettyPrint.HughesPJ Methods fromString ∷ String → Doc # | |
IsString Builder | |
Defined in Data.Text.Internal.Builder Methods fromString ∷ String → Builder # | |
IsString PraosNonce | |
Defined in Cardano.Api.ProtocolParameters Methods fromString ∷ String → PraosNonce # | |
IsString ScriptHash | |
Defined in Cardano.Api.Script Methods fromString ∷ String → ScriptHash # | |
IsString TextEnvelopeDescr | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods fromString ∷ String → TextEnvelopeDescr # | |
IsString TextEnvelopeType | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods fromString ∷ String → TextEnvelopeType # | |
IsString TxId | |
Defined in Cardano.Api.TxIn Methods fromString ∷ String → TxId # | |
IsString AssetName | |
Defined in Cardano.Api.Value Methods fromString ∷ String → AssetName # | |
IsString PolicyId | |
Defined in Cardano.Api.Value Methods fromString ∷ String → PolicyId # | |
IsString Value | |
Defined in Data.Aeson.Types.Internal Methods fromString ∷ String → Value # | |
IsString Key | |
Defined in Data.Aeson.Key Methods fromString ∷ String → Key # | |
IsString IPv6 | |
Defined in Data.IP.Addr Methods fromString ∷ String → IPv6 # | |
IsString IPv4 | |
Defined in Data.IP.Addr Methods fromString ∷ String → IPv4 # | |
IsString ByteArray | |
Defined in Codec.CBOR.ByteArray Methods fromString ∷ String → ByteArray # | |
IsString ShortText | |
Defined in Data.Text.Short.Internal Methods fromString ∷ String → ShortText # | |
IsString RequestBody | |
Defined in Network.HTTP.Client.Types Methods fromString ∷ String → RequestBody # | |
IsString Alphabet | |
Defined in Data.ByteString.Base58.Internal Methods fromString ∷ String → Alphabet # | |
IsString ByteString64 | |
Defined in Data.ByteString.Base64.Type Methods fromString ∷ String → ByteString64 # | |
IsString String | |
Defined in Basement.UTF8.Base Methods fromString ∷ String0 → String # | |
IsString AsciiString | |
Defined in Basement.Types.AsciiString Methods fromString ∷ String → AsciiString # | |
IsString PubKeyHash | |
Defined in Plutus.V1.Ledger.Crypto Methods fromString ∷ String → PubKeyHash # | |
IsString CurrencySymbol | |
Defined in Plutus.V1.Ledger.Value Methods fromString ∷ String → CurrencySymbol # | |
IsString TokenName | |
Defined in Plutus.V1.Ledger.Value Methods fromString ∷ String → TokenName # | |
IsString DatumHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → DatumHash # | |
IsString ValidatorHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → ValidatorHash # | |
IsString TxId | |
Defined in Plutus.V1.Ledger.Tx Methods fromString ∷ String → TxId # | |
IsString SlicedByteArray | |
Defined in Codec.CBOR.ByteArray.Sliced Methods fromString ∷ String → SlicedByteArray # | |
IsString GroupName | |
Defined in Hedgehog.Internal.Property Methods fromString ∷ String → GroupName # | |
IsString LabelName | |
Defined in Hedgehog.Internal.Property Methods fromString ∷ String → LabelName # | |
IsString PropertyName | |
Defined in Hedgehog.Internal.Property Methods fromString ∷ String → PropertyName # | |
IsString Skip | |
Defined in Hedgehog.Internal.Property Methods fromString ∷ String → Skip # | |
IsString UnliftingError | |
Defined in PlutusCore.Evaluation.Machine.Exception Methods fromString ∷ String → UnliftingError # | |
IsString LedgerBytes | |
Defined in Plutus.V1.Ledger.Bytes Methods fromString ∷ String → LedgerBytes # | |
IsString MintingPolicyHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → MintingPolicyHash # | |
IsString RedeemerHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → RedeemerHash # | |
IsString ScriptHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → ScriptHash # | |
IsString StakeValidatorHash | |
Defined in Plutus.V1.Ledger.Scripts Methods fromString ∷ String → StakeValidatorHash # | |
IsString MediaType | |
Defined in Network.HTTP.Media.MediaType.Internal Methods fromString ∷ String → MediaType # | |
IsString Environment | |
Defined in Katip.Core Methods fromString ∷ String → Environment # | |
IsString LogStr | |
Defined in Katip.Core Methods fromString ∷ String → LogStr # | |
IsString Namespace | |
Defined in Katip.Core Methods fromString ∷ String → Namespace # | |
IsString IP | |
Defined in Data.IP.Addr Methods fromString ∷ String → IP # | |
IsString IPRange | |
Defined in Data.IP.Range Methods fromString ∷ String → IPRange # | |
IsString Query | |
Defined in Database.PostgreSQL.Simple.Types Methods fromString ∷ String → Query # | |
IsString Identifier | |
Defined in Database.PostgreSQL.Simple.Types Methods fromString ∷ String → Identifier # | |
IsString QualifiedIdentifier | |
Defined in Database.PostgreSQL.Simple.Types Methods fromString ∷ String → QualifiedIdentifier # | |
IsString GYDatumHash # | |
Defined in GeniusYield.Types.Datum Methods fromString ∷ String → GYDatumHash # | |
IsString LogSrc # | |
Defined in GeniusYield.Types.Logging Methods fromString ∷ String → LogSrc # | |
IsString GYLogNamespace # | |
Defined in GeniusYield.Types.Logging Methods | |
IsString Host | |
Defined in Data.Swagger.Internal Methods fromString ∷ String → Host # | |
IsString License | |
Defined in Data.Swagger.Internal Methods fromString ∷ String → License # | |
IsString Response | |
Defined in Data.Swagger.Internal Methods fromString ∷ String → Response # | |
IsString Tag | |
Defined in Data.Swagger.Internal Methods fromString ∷ String → Tag # | |
IsString GYPubKeyHash # | |
Defined in GeniusYield.Types.PubKeyHash Methods | |
IsString GYExtendedPaymentSigningKey # | |
Defined in GeniusYield.Types.Key Methods | |
IsString GYPaymentSigningKey # | |
Defined in GeniusYield.Types.Key Methods | |
IsString GYPaymentVerificationKey # | |
Defined in GeniusYield.Types.Key Methods | |
IsString GYMintingPolicyId # |
|
Defined in GeniusYield.Types.Script Methods | |
IsString GYValidatorHash # |
|
Defined in GeniusYield.Types.Script Methods | |
IsString GYAddressBech32 # | |
Defined in GeniusYield.Types.Address Methods | |
IsString GYTime # |
|
Defined in GeniusYield.Types.Time Methods fromString ∷ String → GYTime # | |
IsString GYTxId # |
|
Defined in GeniusYield.Types.Tx Methods fromString ∷ String → GYTxId # | |
IsString GYTxOutRef # |
|
Defined in GeniusYield.Types.TxOutRef Methods fromString ∷ String → GYTxOutRef # | |
IsString GYTokenName # | Does NOT UTF8-encode. |
Defined in GeniusYield.Types.Value Methods fromString ∷ String → GYTokenName # | |
IsString GYAssetClass # | |
Defined in GeniusYield.Types.Value Methods | |
a ~ Char ⇒ IsString [a] |
Since: base-2.1 |
Defined in Data.String Methods fromString ∷ String → [a] # | |
IsString a ⇒ IsString (Identity a) | Since: base-4.9.0.0 |
Defined in Data.String Methods fromString ∷ String → Identity a # | |
a ~ Char ⇒ IsString (Seq a) | Since: containers-0.5.7 |
Defined in Data.Sequence.Internal Methods fromString ∷ String → Seq a # | |
IsString (Doc a) | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Methods fromString ∷ String → Doc a # | |
IsString (Hash BlockHeader) | |
Defined in Cardano.Api.Block Methods fromString ∷ String → Hash BlockHeader # | |
IsString (Hash ByronKey) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → Hash ByronKey # | |
IsString (Hash ByronKeyLegacy) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → Hash ByronKeyLegacy # | |
IsString (Hash GenesisDelegateExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash GenesisDelegateExtendedKey # | |
IsString (Hash GenesisDelegateKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash GenesisDelegateKey # | |
IsString (Hash GenesisExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash GenesisExtendedKey # | |
IsString (Hash GenesisKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash GenesisKey # | |
IsString (Hash GenesisUTxOKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash GenesisUTxOKey # | |
IsString (Hash PaymentExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash PaymentExtendedKey # | |
IsString (Hash PaymentKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash PaymentKey # | |
IsString (Hash StakeExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash StakeExtendedKey # | |
IsString (Hash StakeKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash StakeKey # | |
IsString (Hash ScriptData) | |
Defined in Cardano.Api.ScriptData Methods fromString ∷ String → Hash ScriptData # | |
IsString (Hash StakePoolKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → Hash StakePoolKey # | |
IsString (Hash VrfKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → Hash VrfKey # | |
IsString (Hash KesKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → Hash KesKey # | |
IsString (SigningKey ByronKey) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → SigningKey ByronKey # | |
IsString (SigningKey ByronKeyLegacy) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → SigningKey ByronKeyLegacy # | |
IsString (SigningKey GenesisDelegateExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey GenesisDelegateExtendedKey # | |
IsString (SigningKey GenesisDelegateKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey GenesisDelegateKey # | |
IsString (SigningKey GenesisExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey GenesisExtendedKey # | |
IsString (SigningKey GenesisKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey GenesisKey # | |
IsString (SigningKey GenesisUTxOKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey GenesisUTxOKey # | |
IsString (SigningKey PaymentExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey PaymentExtendedKey # | |
IsString (SigningKey PaymentKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey PaymentKey # | |
IsString (SigningKey StakeExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey StakeExtendedKey # | |
IsString (SigningKey StakeKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey StakeKey # | |
IsString (SigningKey StakePoolKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → SigningKey StakePoolKey # | |
IsString (SigningKey VrfKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → SigningKey VrfKey # | |
IsString (SigningKey KesKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → SigningKey KesKey # | |
IsString (VerificationKey ByronKey) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → VerificationKey ByronKey # | |
IsString (VerificationKey ByronKeyLegacy) | |
Defined in Cardano.Api.KeysByron Methods fromString ∷ String → VerificationKey ByronKeyLegacy # | |
IsString (VerificationKey GenesisDelegateExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey GenesisDelegateExtendedKey # | |
IsString (VerificationKey GenesisDelegateKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey GenesisDelegateKey # | |
IsString (VerificationKey GenesisExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey GenesisExtendedKey # | |
IsString (VerificationKey GenesisKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey GenesisKey # | |
IsString (VerificationKey GenesisUTxOKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey GenesisUTxOKey # | |
IsString (VerificationKey PaymentExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey PaymentExtendedKey # | |
IsString (VerificationKey PaymentKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey PaymentKey # | |
IsString (VerificationKey StakeExtendedKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey StakeExtendedKey # | |
IsString (VerificationKey StakeKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey StakeKey # | |
IsString (VerificationKey StakePoolKey) | |
Defined in Cardano.Api.KeysShelley Methods fromString ∷ String → VerificationKey StakePoolKey # | |
IsString (VerificationKey VrfKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → VerificationKey VrfKey # | |
IsString (VerificationKey KesKey) | |
Defined in Cardano.Api.KeysPraos Methods fromString ∷ String → VerificationKey KesKey # | |
a ~ Char ⇒ IsString (DList a) | |
Defined in Data.DList.Internal Methods fromString ∷ String → DList a # | |
IsString (Doc ann) | |
Defined in Prettyprinter.Internal Methods fromString ∷ String → Doc ann # | |
KnownNat n ⇒ IsString (PinnedSizedBytes n) | |
Defined in Cardano.Crypto.PinnedSizedBytes Methods fromString ∷ String → PinnedSizedBytes n # | |
a ~ Char ⇒ IsString (DNonEmpty a) | |
Defined in Data.DList.DNonEmpty.Internal Methods fromString ∷ String → DNonEmpty a # | |
(IsString s, FoldCase s) ⇒ IsString (CI s) | |
Defined in Data.CaseInsensitive.Internal Methods fromString ∷ String → CI s # | |
IsString a ⇒ IsString (Graph a) | |
Defined in Algebra.Graph Methods fromString ∷ String → Graph a # | |
IsString a ⇒ IsString (AdjacencyMap a) | |
Defined in Algebra.Graph.AdjacencyMap Methods fromString ∷ String → AdjacencyMap a # | |
IsString a ⇒ IsString (Graph a) | |
Defined in Algebra.Graph.Undirected Methods fromString ∷ String → Graph a # | |
IsString a ⇒ IsString (AdjacencyMap a) | |
Defined in Algebra.Graph.NonEmpty.AdjacencyMap Methods fromString ∷ String → AdjacencyMap a # | |
IsString (Doc a) | |
Defined in Text.PrettyPrint.Annotated.WL Methods fromString ∷ String → Doc a # | |
IsString (AddrRange IPv6) | |
Defined in Data.IP.Range Methods fromString ∷ String → AddrRange IPv6 # | |
IsString (AddrRange IPv4) | |
Defined in Data.IP.Range Methods fromString ∷ String → AddrRange IPv4 # | |
(IsString a, Hashable a) ⇒ IsString (Hashed a) | |
Defined in Data.Hashable.Class Methods fromString ∷ String → Hashed a # | |
IsString a ⇒ IsString (Referenced a) | |
Defined in Data.Swagger.Internal Methods fromString ∷ String → Referenced a # | |
HashAlgorithm h ⇒ IsString (Hash h a) | |
Defined in Cardano.Crypto.Hash.Class Methods fromString ∷ String → Hash h a # | |
IsString a ⇒ IsString (AdjacencyMap e a) | |
Defined in Algebra.Graph.Labelled.AdjacencyMap Methods fromString ∷ String → AdjacencyMap e a # | |
IsString a ⇒ IsString (Graph e a) | |
Defined in Algebra.Graph.Labelled Methods fromString ∷ String → Graph e a # | |
IsString a ⇒ IsString (Const a b) | Since: base-4.9.0.0 |
Defined in Data.String Methods fromString ∷ String → Const a b # | |
IsString a ⇒ IsString (Tagged s a) | |
Defined in Data.Tagged Methods fromString ∷ String → Tagged s a # |
liftA2 ∷ Applicative f ⇒ (a → b → c) → f a → f b → f c #
Lift a binary function to actions.
Some functors support an implementation of liftA2
that is more
efficient than the default one. In particular, if fmap
is an
expensive operation, it is likely better to use liftA2
than to
fmap
over the structure and then use <*>
.
This became a typeclass method in 4.10.0.0. Prior to that, it was
a function defined in terms of <*>
and fmap
.
Using ApplicativeDo
: '
' can be understood
as the liftA2
f as bsdo
expression
do a <- as b <- bs pure (f a b)
toList ∷ Foldable t ⇒ t a → [a] #
List of elements of a structure, from left to right.
Since: base-4.8.0.0
foldl' ∷ Foldable t ⇒ (b → a → b) → b → t a → b #
Left-associative fold of a structure but with strict application of the operator.
This ensures that each step of the fold is forced to weak head normal
form before being applied, avoiding the collection of thunks that would
otherwise occur. This is often what you want to strictly reduce a finite
list to a single, monolithic result (e.g. length
).
For a general Foldable
structure this should be semantically identical
to,
foldl' f z =foldl'
f z .toList
Since: base-4.6.0.0
Representable types of kind *
.
This class is derivable in GHC with the DeriveGeneric
flag on.
A Generic
instance must satisfy the following laws:
from
.to
≡id
to
.from
≡id
Instances
Generic Bool | Since: base-4.6.0.0 |
Generic Ordering | Since: base-4.6.0.0 |
Generic Exp | |
Generic Match | |
Generic Clause | |
Generic Pat | |
Generic Type | |
Generic Dec | |
Generic Name | |
Generic FunDep | |
Generic InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep InjectivityAnn ∷ Type → Type # | |
Generic Overlap | |
Generic () | Since: base-4.6.0.0 |
Generic Void | Since: base-4.8.0.0 |
Generic Version | Since: base-4.9.0.0 |
Generic ExitCode | |
Generic All | Since: base-4.7.0.0 |
Generic Any | Since: base-4.7.0.0 |
Generic Fixity | Since: base-4.7.0.0 |
Generic Associativity | Since: base-4.7.0.0 |
Defined in GHC.Generics Associated Types type Rep Associativity ∷ Type → Type # | |
Generic SourceUnpackedness | Since: base-4.9.0.0 |
Defined in GHC.Generics Associated Types type Rep SourceUnpackedness ∷ Type → Type # Methods | |
Generic SourceStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Associated Types type Rep SourceStrictness ∷ Type → Type # Methods from ∷ SourceStrictness → Rep SourceStrictness x # to ∷ Rep SourceStrictness x → SourceStrictness # | |
Generic DecidedStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Associated Types type Rep DecidedStrictness ∷ Type → Type # Methods from ∷ DecidedStrictness → Rep DecidedStrictness x # to ∷ Rep DecidedStrictness x → DecidedStrictness # | |
Generic Extension | |
Generic ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type Associated Types type Rep ForeignSrcLang ∷ Type → Type # | |
Generic PrimType | |
Generic StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types Associated Types type Rep StgInfoTable ∷ Type → Type # | |
Generic ClosureType | |
Defined in GHC.Exts.Heap.ClosureTypes Associated Types type Rep ClosureType ∷ Type → Type # | |
Generic Doc | |
Generic TextDetails | |
Defined in Text.PrettyPrint.Annotated.HughesPJ Associated Types type Rep TextDetails ∷ Type → Type # | |
Generic Style | |
Generic Mode | |
Generic ModName | |
Generic PkgName | |
Generic Module | |
Generic OccName | |
Generic NameFlavour | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep NameFlavour ∷ Type → Type # | |
Generic NameSpace | |
Generic Loc | |
Generic Info | |
Generic ModuleInfo | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep ModuleInfo ∷ Type → Type # | |
Generic Fixity | |
Generic FixityDirection | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep FixityDirection ∷ Type → Type # Methods from ∷ FixityDirection → Rep FixityDirection x # to ∷ Rep FixityDirection x → FixityDirection # | |
Generic Lit | |
Generic Bytes | |
Generic Body | |
Generic Guard | |
Generic Stmt | |
Generic Range | |
Generic DerivClause | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep DerivClause ∷ Type → Type # | |
Generic DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep DerivStrategy ∷ Type → Type # | |
Generic TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep TypeFamilyHead ∷ Type → Type # | |
Generic TySynEqn | |
Generic Foreign | |
Generic Callconv | |
Generic Safety | |
Generic Pragma | |
Generic Inline | |
Generic RuleMatch | |
Generic Phases | |
Generic RuleBndr | |
Generic AnnTarget | |
Generic SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep SourceUnpackedness ∷ Type → Type # Methods | |
Generic SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep SourceStrictness ∷ Type → Type # Methods from ∷ SourceStrictness → Rep SourceStrictness x # to ∷ Rep SourceStrictness x → SourceStrictness # | |
Generic DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep DecidedStrictness ∷ Type → Type # Methods from ∷ DecidedStrictness → Rep DecidedStrictness x # to ∷ Rep DecidedStrictness x → DecidedStrictness # | |
Generic Con | |
Generic Bang | |
Generic PatSynDir | |
Generic PatSynArgs | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep PatSynArgs ∷ Type → Type # | |
Generic TyVarBndr | |
Generic FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Associated Types type Rep FamilyResultSig ∷ Type → Type # Methods from ∷ FamilyResultSig → Rep FamilyResultSig x # to ∷ Rep FamilyResultSig x → FamilyResultSig # | |
Generic TyLit | |
Generic Role | |
Generic AnnLookup | |
Generic PraosNonce | |
Generic EpochSlots | |
Generic BlockNo | |
Generic EpochNo | |
Generic SlotNo | |
Generic SystemStart | |
Generic NetworkMagic | |
Generic MempoolSizeAndCapacity | |
Generic EraMismatch | |
Generic Past | |
Generic EraParams | |
Generic SafeZone | |
Generic Bound | |
Generic EraEnd | |
Generic EraSummary | |
Generic ProtVer | |
Generic ByronPartialLedgerConfig | |
Generic BinaryBlockInfo | |
Generic TriggerHardFork | |
Generic MaxMajorProtVer | |
Generic PrefixLen | |
Generic Config | |
Generic CompactAddress | |
Generic RequiresNetworkMagic | |
Generic ProtocolParameters | |
Generic ProtocolVersion | |
Generic PBftSignatureThreshold | |
Generic ProtocolMagicId | |
Generic ChunkInfo | |
Generic CoreNodeId | |
Generic SoftwareVersion | |
Generic CompactRedeemVerificationKey | |
Generic Lovelace | |
Generic ChainValidationState | |
Generic VerificationKey | |
Generic GenesisHash | |
Generic CandidateProtocolUpdate | |
Generic SlotNumber | |
Generic Endorsement | |
Generic ByronHash | |
Generic Tx | |
Generic ByteSpan | |
Generic ByronTransition | |
Generic Map | |
Generic ScheduledDelegation | |
Generic EpochNumber | |
Generic State | |
Generic UTxO | |
Generic ByronOtherHeaderEnvelopeError | |
Generic PBftSelectView | |
Generic ToSign | |
Generic PraosEnvelopeError | |
Generic PositiveUnitInterval | |
Generic Network | |
Generic Coin | |
Generic PraosParams | |
Generic TPraosParams | |
Generic Nonce | |
Generic KESInfo | |
Generic ChainPredicateFailure | |
Generic Value | |
Generic AccountState | |
Generic Ptr | |
Generic DeltaCoin | |
Generic LogWeight | |
Generic Likelihood | |
Generic RewardType | |
Generic AlonzoMeasure | |
Generic ExUnits | |
Generic Globals | |
Generic StakePoolRelay | |
Generic RewardParams | |
Generic RewardInfoPool | |
Generic UnitInterval | |
Generic NonNegativeInterval | |
Generic ShelleyTransition | |
Generic SecurityParam | |
Generic TransitionInfo | |
Generic RelativeTime | |
Generic CostModels | |
Generic Prices | |
Generic AlonzoGenesis | |
Generic Metadatum | |
Generic Language | |
Generic CostModel | |
Generic Data | |
Generic ExCPU | |
Generic ExMemory | |
Generic ExBudget | |
Generic TyName | |
Generic Name | |
Generic Strictness | |
Generic Recursivity | |
Generic DeBruijn | |
Generic NamedDeBruijn | |
Generic NamedTyDeBruijn | |
Generic Index | |
Generic TyDeBruijn | |
Generic ParseError | |
Generic DefaultFun | |
Generic SourcePos | |
Generic FreeVariableError | |
Generic ConstructorInfo | |
Generic DatatypeInfo | |
Generic Desirability | |
Generic PoolMetadata | |
Generic IPv6 | |
Generic IPv4 | |
Generic FsPath | |
Generic Time | |
Generic ProtocolParameters | |
Generic SlotLength | |
Generic TimeInEra | |
Generic SlotInEra | |
Generic SlotInEpoch | |
Generic EpochSize | |
Generic IsEBB | |
Generic TicknPredicateFailure | |
Generic TicknState | |
Generic KESPeriod | |
Generic ActiveSlotCoeff | |
Generic ValidityInterval | |
Generic InputVRF | |
Generic EpochInEra | |
Generic TimeInSlot | |
Generic URIAuth | |
Generic URI | |
Generic BaseUrl | |
Generic Scheme | |
Generic ClientError | |
Generic RequestBody | |
Generic CabalSpecVersion | |
Generic Structure | |
Generic PError | |
Generic Position | |
Generic PWarnType | |
Generic PWarning | |
Generic Arch | |
Generic OS | |
Generic Platform | |
Generic AdjacencyIntMap | |
Generic Alphabet | |
Generic ByteString64 | |
Generic Address | |
Generic NetworkMagic | |
Generic AddrAttributes | |
Generic HDAddressPayload | |
Generic Address' | |
Generic PubKeyHash | |
Generic MIRPot | |
Generic Url | |
Generic SignKey | |
Generic VerKey | |
Generic XPub | |
Generic CekMachineCosts | |
Generic TxInWitness | |
Generic TxSigData | |
Generic SignTag | |
Generic IsValid | |
Generic LangDepView | |
Generic RdmrPtr | |
Generic TxIn | |
Generic XPub | |
Generic Point | |
Generic Proof | |
Generic Output | |
Generic RedeemVerificationKey | |
Generic RedeemSigningKey | |
Generic Tag | |
Generic EvaluationContext | |
Generic ScriptResult | |
Generic PlutusDebug | |
Generic ScriptFailure | |
Generic StakingCredential | |
Generic POSIXTime | |
Generic Address | |
Generic TxInInfo | |
Generic TxOut | |
Generic CurrencySymbol | |
Generic TokenName | |
Generic TxInfo | |
Generic TxInfo | |
Generic Credential | |
Generic DCert | |
Generic DatumHash | |
Generic Datum | |
Generic ValidatorHash | |
Generic ScriptPurpose | |
Generic Value | |
Generic TxId | |
Generic TxOutRef | |
Generic FailureDescription | |
Generic TagMismatchDescription | |
Generic DnsName | |
Generic Port | |
Generic PositiveInterval | |
Generic Seed | |
Generic ChainDifficulty | |
Generic Proof | |
Generic SscPayload | |
Generic ProposalBody | |
Generic SscProof | |
Generic EpochAndSlotCount | |
Generic TxProof | |
Generic CompactTxIn | |
Generic CompactTxOut | |
Generic State | |
Generic BlockCount | |
Generic UTxOConfiguration | |
Generic ApplicationName | |
Generic ApplicationVersion | |
Generic ProtocolUpdateProposal | |
Generic SoftwareUpdateProposal | |
Generic SlotCount | |
Generic TxOut | |
Generic AddrType | |
Generic CompactTxId | |
Generic Environment | |
Generic State | |
Generic State | |
Generic Environment | |
Generic UnparsedFields | |
Generic AddrSpendingData | |
Generic LovelacePortion | |
Generic TxFeePolicy | |
Generic TxSizeLinear | |
Generic GenesisData | |
Generic SoftforkRule | |
Generic GeneratedSecrets | |
Generic PoorSecret | |
Generic GenesisSpec | |
Generic FakeAvvmOptions | |
Generic InstallerHash | |
Generic SystemTag | |
Generic ProtocolParametersUpdate | |
Generic Environment | |
Generic RegistrationEnvironment | |
Generic Duration | |
Generic ChainChecksPParams | |
Generic ChainCode | |
Generic Histogram | |
Generic PerformanceEstimate | |
Generic StakeShare | |
Generic VotingPeriod | |
Generic Filler | |
Generic Half | |
Generic NewtonParam | |
Generic NewtonStep | |
Generic RiddersParam | |
Generic RiddersStep | |
Generic Tolerance | |
Generic Pos | |
Generic InvalidPosException | |
Generic MuxError | |
Generic SDUSize | |
Generic MaxSlotNo | |
Generic CurrentSlot | |
Generic NodeId | |
Generic PBftParams | |
Generic PBftMockVerKeyHash | |
Generic ChainType | |
Generic ScheduledGc | |
Generic DiskSnapshot | |
Generic SnapshotInterval | |
Generic ChunkNo | |
Generic CRC | |
Generic ChunkSize | |
Generic RelativeSlot | |
Generic ChunkSlot | |
Generic BlockOrEBB | |
Generic PrimaryIndex | |
Generic TraceCacheEvent | |
Generic BlockSize | |
Generic ValidationPolicy | |
Generic BlocksPerFile | |
Generic BlockOffset | |
Generic BlockSize | |
Generic Appender | |
Generic RegistryStatus | |
Generic Fingerprint | |
Generic PeerAdvertise | |
Generic FileDescriptor | |
Generic LocalAddress | |
Generic LocalSocket | |
Generic SatInt | |
Generic ModelAddedSizes | |
Generic ModelConstantOrLinear | |
Generic ModelConstantOrTwoArguments | |
Generic ModelFiveArguments | |
Generic ModelFourArguments | |
Generic ModelLinearSize | |
Generic ModelMaxSize | |
Generic ModelMinSize | |
Generic ModelMultipliedSizes | |
Generic ModelOneArgument | |
Generic ModelSixArguments | |
Generic ModelSubtractedSizes | |
Generic ModelThreeArguments | |
Generic ModelTwoArguments | |
Generic Support | |
Generic CkUserError | |
Generic CekUserError | |
Generic StepKind | |
Generic LedgerBytes | |
Generic ScriptContext | |
Generic MintingPolicy | |
Generic MintingPolicyHash | |
Generic Redeemer | |
Generic RedeemerHash | |
Generic Script | |
Generic ScriptError | |
Generic ScriptHash | |
Generic StakeValidator | |
Generic StakeValidatorHash | |
Generic Validator | |
Generic DiffMilliSeconds | |
Generic RedeemerPtr | |
Generic ScriptTag | |
Generic TxIn | |
Generic TxInType | |
Generic AssetClass | |
Generic ScriptContext | |
Generic TxInInfo | |
Generic TxOut | |
Generic OutputDatum | |
Generic CovLoc | |
Generic CoverageAnnotation | |
Generic CoverageData | |
Generic CoverageIndex | |
Generic CoverageMetadata | |
Generic CoverageReport | |
Generic Metadata | |
Generic StudentT | |
Generic ConstructorVariant | |
Generic DatatypeVariant | |
Generic FieldStrictness | |
Generic Strictness | |
Generic Unpackedness | |
Generic Specificity | |
Generic CompressionLevel | |
Generic CompressionStrategy | |
Generic Format | |
Generic MemoryLevel | |
Generic Method | |
Generic WindowBits | |
Generic Form | |
Generic AcceptHeader | |
Generic NoContent | |
Generic IsSecure | |
Generic Environment | |
Generic LogStr | |
Generic Namespace | |
Generic Severity | |
Generic Verbosity | |
Generic IP | |
Generic IPRange | |
Generic ConnectInfo | |
Generic Outcome | |
Generic Expr | |
Generic GYEra # | |
Generic ApiKeyLocation | |
Generic ApiKeyParams | |
Generic Contact | |
Generic Example | |
Generic ExternalDocs | |
Generic Header | |
Generic Host | |
Generic Info | |
Generic License | |
Generic NamedSchema | |
Generic OAuth2Flow | |
Generic OAuth2Params | |
Generic Operation | |
Generic Param | |
Generic ParamAnySchema | |
Generic ParamLocation | |
Generic ParamOtherSchema | |
Generic PathItem | |
Generic Response | |
Generic Responses | |
Generic Schema | |
Generic Scheme | |
Generic SecurityDefinitions | |
Generic SecurityScheme | |
Generic SecuritySchemeType | |
Generic Swagger | |
Generic Tag | |
Generic Xml | |
Generic GYRational # | |
Defined in GeniusYield.Types.Rational Associated Types type Rep GYRational ∷ Type → Type # | |
Generic GYAddress # | |
Generic GYAssetClass # | |
Defined in GeniusYield.Types.Value Associated Types type Rep GYAssetClass ∷ Type → Type # | |
Generic TimeSpec | |
Generic Clock | |
Generic CaseStyle | |
Generic BalanceInsufficientError | |
Generic UTxOBalanceSufficiencyInfo | |
Generic UnableToConstructChangeError | |
Generic TokenMap | |
Generic TokenPolicyId | |
Generic TokenName | |
Generic TokenQuantity | |
Generic TokenBundle | |
Generic AssetId | |
Generic Coin | |
Generic TokenBundleSizeAssessment | |
Generic TokenBundleSizeAssessor | |
Generic Asset | |
Generic SelectionConstraints | |
Generic SelectionParams | |
Generic SelectionReportDetailed | |
Generic SelectionReportSummarized | |
Generic SelectionSkeleton | |
Generic WalletUTxO | |
Generic SelectionCollateralRequirement | |
Generic TxOut | |
Generic TxIn | |
Generic SelectionReport | |
Generic Address | |
Generic UTxO | |
Generic AddressState | |
Generic FlatAssetQuantity | |
Generic NestedMapEntry | |
Generic NestedTokenQuantity | |
Generic AssetDecimals | |
Generic AssetLogo | |
Generic AssetMetadata | |
Generic AssetURL | |
Generic TokenFingerprint | |
Generic TxConstraints | |
Generic TxSize | |
Generic ComputeMinimumCollateralParams | |
Generic SelectionConstraints | |
Generic DeltaUTxO | |
Generic Percentage | |
Generic Ada | |
Generic Slot | |
Generic SlotConfig | |
Generic SlotConversionError | |
Generic Tx | |
Generic TxIn | |
Generic TxInType | |
Generic TxStripped | |
Generic MaestroUtxo # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroUtxo ∷ Type → Type # | |
Generic MaestroDatumOption # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroDatumOption ∷ Type → Type # Methods | |
Generic MaestroDatumOptionType # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroDatumOptionType ∷ Type → Type # Methods from ∷ MaestroDatumOptionType → Rep MaestroDatumOptionType x # to ∷ Rep MaestroDatumOptionType x → MaestroDatumOptionType # | |
Generic MaestroScript # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroScript ∷ Type → Type # | |
Generic MaestroScriptType # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroScriptType ∷ Type → Type # Methods from ∷ MaestroScriptType → Rep MaestroScriptType x # to ∷ Rep MaestroScriptType x → MaestroScriptType # | |
Generic MaestroAsset # | |
Defined in GeniusYield.Providers.Maestro Associated Types type Rep MaestroAsset ∷ Type → Type # | |
Generic [a] | Since: base-4.6.0.0 |
Generic (Maybe a) | Since: base-4.6.0.0 |
Generic (Par1 p) | Since: base-4.7.0.0 |
Generic (Complex a) | Since: base-4.9.0.0 |
Generic (Min a) | Since: base-4.9.0.0 |
Generic (Max a) | Since: base-4.9.0.0 |
Generic (First a) | Since: base-4.9.0.0 |
Generic (Last a) | Since: base-4.9.0.0 |
Generic (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Associated Types type Rep (WrappedMonoid m) ∷ Type → Type # Methods from ∷ WrappedMonoid m → Rep (WrappedMonoid m) x # to ∷ Rep (WrappedMonoid m) x → WrappedMonoid m # | |
Generic (Option a) | Since: base-4.9.0.0 |
Generic (ZipList a) | Since: base-4.7.0.0 |
Generic (Identity a) | Since: base-4.8.0.0 |
Generic (First a) | Since: base-4.7.0.0 |
Generic (Last a) | Since: base-4.7.0.0 |
Generic (Dual a) | Since: base-4.7.0.0 |
Generic (Endo a) | Since: base-4.7.0.0 |
Generic (Sum a) | Since: base-4.7.0.0 |
Generic (Product a) | Since: base-4.7.0.0 |
Generic (Down a) | Since: base-4.12.0.0 |
Generic (NonEmpty a) | Since: base-4.6.0.0 |
Generic (SCC vertex) | Since: containers-0.5.9 |
Generic (Tree a) | Since: containers-0.5.8 |
Generic (FingerTree a) | Since: containers-0.6.1 |
Defined in Data.Sequence.Internal Associated Types type Rep (FingerTree a) ∷ Type → Type # | |
Generic (Digit a) | Since: containers-0.6.1 |
Generic (Node a) | Since: containers-0.6.1 |
Generic (Elem a) | Since: containers-0.6.1 |
Generic (ViewL a) | Since: containers-0.5.8 |
Generic (ViewR a) | Since: containers-0.5.8 |
Generic (GenClosure b) | |
Defined in GHC.Exts.Heap.Closures Associated Types type Rep (GenClosure b) ∷ Type → Type # | |
Generic (Doc a) | |
Generic (TxOutValue era) | |
Generic (Header (ShelleyBlock proto era)) | |
Generic (Header ByronBlock) | |
Generic (HardForkLedgerConfig xs) | |
Generic (HardForkEnvelopeErr xs) | |
Generic (HardForkLedgerError xs) | |
Generic (HardForkApplyTxErr xs) | |
Generic (ConsensusConfig (TPraos c)) | |
Generic (ConsensusConfig (Praos c)) | |
Generic (ConsensusConfig (HardForkProtocol xs)) | |
Generic (ConsensusConfig (PBft c)) | |
Generic (I a) | |
Generic (WithOrigin t) | |
Generic (ShelleyHash crypto) | |
Generic (LedgerView crypto) | |
Generic (VerKeyDSIGN Ed25519DSIGN) | |
Generic (VerKeyDSIGN ByronDSIGN) | |
Generic (VerKeyDSIGN MockDSIGN) | |
Generic (VerKeyDSIGN EcdsaSecp256k1DSIGN) | |
Generic (VerKeyDSIGN Ed448DSIGN) | |
Generic (VerKeyDSIGN NeverDSIGN) | |
Generic (VerKeyDSIGN SchnorrSecp256k1DSIGN) | |
Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1 | |
Generic (VerKeyVRF PraosVRF) | |
Generic (VerKeyVRF MockVRF) | |
Generic (VerKeyVRF NeverVRF) | |
Generic (VerKeyVRF SimpleVRF) | |
Generic (TPraosState c) | |
Generic (IndividualPoolStake crypto) | |
Generic (TopLevelConfig blk) | |
Generic (AHeader a) | |
Generic (ShelleyPartialLedgerConfig era) | |
Generic (SingleEraInfo blk) | |
Generic (PraosChainSelectView c) | |
Generic (Point block) | |
Generic (PBftCannotForge c) | |
Generic (ExtLedgerState blk) | |
Generic (SignKeyDSIGN Ed25519DSIGN) | |
Generic (SignKeyDSIGN ByronDSIGN) | |
Generic (SignKeyDSIGN MockDSIGN) | |
Generic (SignKeyDSIGN EcdsaSecp256k1DSIGN) | |
Generic (SignKeyDSIGN Ed448DSIGN) | |
Generic (SignKeyDSIGN NeverDSIGN) | |
Generic (SignKeyDSIGN SchnorrSecp256k1DSIGN) | |
Defined in Cardano.Crypto.DSIGN.SchnorrSecp256k1 | |
Generic (HeaderState blk) | |
Generic (AnnTip blk) | |
Generic (PBftState c) | |
Generic (ATxAux a) | |
Generic (ACertificate a) | |
Generic (AProposal a) | |
Generic (AVote a) | |
Generic (ABlockOrBoundary a) | |
Generic (ExtLedgerCfg blk) | |
Generic (PBftLedgerView c) | |
Generic (PBftSigner c) | |
Generic (TipInfoIsEBB blk) | |
Generic (PBftIsLeader c) | |
Generic (PBftValidationErr c) | |
Generic (ABlockOrBoundaryHdr a) | |
Generic (ABoundaryHeader a) | |
Generic (ABoundaryBlock a) | |
Generic (BHeader crypto) | |
Generic (PrevHash crypto) | |
Generic (HeaderBody crypto) | |
Generic (PraosCanBeLeader c) | |
Generic (HeaderRaw crypto) | |
Generic (VerKeyKES (SingleKES d)) | |
Generic (VerKeyKES (SumKES h d)) | |
Generic (VerKeyKES (CompactSingleKES d)) | |
Generic (VerKeyKES (CompactSumKES h d)) | |
Generic (VerKeyKES (MockKES t)) | |
Generic (VerKeyKES NeverKES) | |
Generic (VerKeyKES (SimpleKES d t)) | |
Generic (SigKES (SingleKES d)) | |
Generic (SigKES (SumKES h d)) | |
Generic (SigKES (CompactSingleKES d)) | |
Generic (SigKES (CompactSumKES h d)) | |
Generic (SigKES (MockKES t)) | |
Generic (SigKES NeverKES) | |
Generic (SigKES (SimpleKES d t)) | |
Generic (PraosCannotForge c) | |
Generic (ShelleyLedgerConfig era) | |
Generic (ShelleyGenesisStaking crypto) | |
Generic (Addr crypto) | |
Generic (GenDelegPair crypto) | |
Generic (NewEpochState era) | |
Generic (ShelleyGenesis era) | |
Generic (CompactGenesis era) | |
Generic (PPUPState era) | |
Generic (StrictMaybe a) | |
Generic (PraosState c) | |
Generic (BHBody crypto) | |
Generic (TPraosIsLeader c) | |
Generic (TPraosToSign c) | |
Generic (TPraosCannotForge c) | |
Generic (DPState crypto) | |
Generic (PoolParams crypto) | |
Generic (FutureGenDeleg crypto) | |
Generic (DState crypto) | |
Generic (EpochState era) | |
Generic (TxIn crypto) | |
Generic (LedgerState era) | |
Generic (SnapShots crypto) | |
Generic (SnapShot crypto) | |
Generic (GenDelegs crypto) | |
Generic (IncrementalStake crypto) | |
Generic (InstantaneousRewards crypto) | |
Generic (NonMyopic crypto) | |
Generic (PState crypto) | |
Generic (ProposedPPUpdates era) | |
Generic (PulsingRewUpdate crypto) | |
Generic (Reward crypto) | |
Generic (RewardUpdate crypto) | |
Generic (Script era) | |
Generic (Stake crypto) | |
Generic (UTxO era) | |
Generic (UTxOState era) | |
Generic (Value crypto) | |
Generic (TxId crypto) | |
Generic (ABlock a) | |
Generic (WithTop a) | |
Generic (ExUnits' a) | |
Generic (Fix f) | |
Generic (RewardProvenance crypto) | |
Generic (ShelleyLedgerError era) | |
Generic (BlockTransitionError era) | |
Generic (HardForkValidationErr xs) | |
Generic (HeaderFields b) | |
Generic (ChainHash b) | |
Generic (BlocksMade crypto) | |
Generic (Update era) | |
Generic (AuxiliaryData era) | |
Generic (Timelock crypto) | |
Generic (TxBody era) | |
Generic (ValidatedTx era) | |
Generic (MemoBytes t) | |
Generic (TimelockRaw crypto) | |
Generic (AuxiliaryDataRaw era) | |
Generic (TxSeq era) | |
Generic (LedgerPredicateFailure era) | |
Generic (DelegsPredicateFailure era) | |
Generic (DelplPredicateFailure era) | |
Generic (DCert crypto) | |
Generic (Wdrl crypto) | |
Generic (ScriptHash crypto) | |
Generic (UtxoPredicateFailure era) | |
Generic (UtxowPredicateFailure era) | |
Generic (Data era) | |
Generic (AuxiliaryDataRaw era) | |
Generic (Doc ann) | |
Generic (Kind ann) | |
Generic (Version ann) | |
Generic (Normalized a) | |
Generic (ErrorItem t) | |
Generic (ErrorFancy e) | |
Generic (PosState s) | |
Generic (UniqueError ann) | |
Generic (RewardProvenancePool crypto) | |
Generic (RewardAcnt crypto) | |
Generic (Handle h) | |
Generic (ConnectionId addr) | |
Generic (Solo a) | |
Generic (SignKeyKES (SingleKES d)) | |
Generic (SignKeyKES (SumKES h d)) | |
Generic (SignKeyKES (CompactSingleKES d)) | |
Generic (SignKeyKES (CompactSumKES h d)) | |
Generic (SignKeyKES (MockKES t)) | |
Generic (SignKeyKES NeverKES) | |
Generic (SignKeyKES (SimpleKES d t)) | |
Generic (SigDSIGN Ed25519DSIGN) | |
Generic (SigDSIGN ByronDSIGN) | |
Generic (SigDSIGN MockDSIGN) | |
Generic (SigDSIGN EcdsaSecp256k1DSIGN) | |
Generic (SigDSIGN Ed448DSIGN) | |
Generic (SigDSIGN NeverDSIGN) | |
Generic (SigDSIGN SchnorrSecp256k1DSIGN) | |
Generic (ChainTransitionError crypto) | |
Generic (PrtclPredicateFailure crypto) | |
Generic (ChainDepState crypto) | |
Generic (OCert crypto) | |
Generic (PrtclState crypto) | |
Generic (TxBody era) | |
Generic (Metadata era) | |
Generic (MultiSig crypto) | |
Generic (TxSeq era) | |
Generic (BootstrapWitness crypto) | |
Generic (Sized a) | |
Generic (ScriptPurpose crypto) | |
Generic (TranslationError crypto) | |
Generic (PraosIsLeader c) | |
Generic (PraosToSign c) | |
Generic (PraosValidationErr c) | |
Generic (TxWitnessRaw era) | |
Generic (Maybe a) | |
Generic (HistoriedResponse body) | |
Generic (ClientM a) | |
Generic (ResponseF a) | |
Generic (Last' a) | |
Generic (Option' a) | |
Generic (Only a) | |
Generic (Graph a) | |
Generic (AdjacencyMap a) | |
Generic (Graph a) | |
Generic (AdjacencyMap a) | |
Generic (StakeReference crypto) | |
Generic (TickfPredicateFailure era) | |
Generic (Tip b) | |
Generic (SignKeyVRF PraosVRF) | |
Generic (SignKeyVRF MockVRF) | |
Generic (SignKeyVRF NeverVRF) | |
Generic (SignKeyVRF SimpleVRF) | |
Generic (MultiSigRaw crypto) | |
Generic (TxBodyRaw era) | |
Generic (TxBodyRaw era) | |
Generic (TxBodyRaw era) | |
Generic (TxBodyRaw era) | |
Generic (RedeemersRaw era) | |
Generic (TxDatsRaw era) | |
Generic (CertVRF PraosVRF) | |
Generic (CertVRF MockVRF) | |
Generic (CertVRF NeverVRF) | |
Generic (CertVRF SimpleVRF) | |
Generic (AProtocolMagic a) | |
Generic (RedeemSignature a) | |
Generic (Signature a) | |
Generic (CollectError crypto) | |
Generic (ScriptIntegrity era) | |
Generic (TxOutSource crypto) | |
Generic (Interval a) | |
Generic (AlonzoBbodyPredFail era) | |
Generic (BbodyPredicateFailure era) | |
Generic (UtxowPredicateFail era) | |
Generic (UtxoPredicateFailure era) | |
Generic (UtxosPredicateFailure era) | |
Generic (UtxoPredicateFailure era) | |
Generic (PpupPredicateFailure era) | |
Generic (WitHashes crypto) | |
Generic (PPUpdateEnv era) | |
Generic (ABoundaryBody a) | |
Generic (ABody a) | |
Generic (APayload a) | |
Generic (ABlockSignature a) | |
Generic (ATxPayload a) | |
Generic (APayload a) | |
Generic (MerkleRoot a) | |
Generic (MerkleNode a) | |
Generic (Attributes h) | |
Generic (MerkleTree a) | |
Generic (BootstrapAddress crypto) | |
Generic (GenesisCredential crypto) | |
Generic (GKeys crypto) | |
Generic (TickTransitionError era) | |
Generic (TxRaw era) | |
Generic (RewardSnapShot crypto) | |
Generic (RewardAns c) | |
Generic (FreeVars crypto) | |
Generic (PoolRewardInfo crypto) | |
Generic (LeaderOnlyReward crypto) | |
Generic (DelegPredicateFailure era) | |
Generic (PoolPredicateFailure era) | |
Generic (EpochPredicateFailure era) | |
Generic (PoolreapPredicateFailure era) | |
Generic (SnapPredicateFailure era) | |
Generic (UpecPredicateFailure era) | |
Generic (LedgersPredicateFailure era) | |
Generic (MirPredicateFailure era) | |
Generic (NewEpochPredicateFailure era) | |
Generic (NewppPredicateFailure era) | |
Generic (RupdPredicateFailure era) | |
Generic (TickEvent era) | |
Generic (TickPredicateFailure era) | |
Generic (DelegCert crypto) | |
Generic (Delegation crypto) | |
Generic (GenesisDelegCert crypto) | |
Generic (MIRCert crypto) | |
Generic (MIRTarget crypto) | |
Generic (PoolCert crypto) | |
Generic (StakeCreds crypto) | |
Generic (HashHeader crypto) | |
Generic (LastAppliedBlock crypto) | |
Generic (OcertPredicateFailure crypto) | |
Generic (OBftSlot crypto) | |
Generic (OverlayEnv crypto) | |
Generic (OverlayPredicateFailure crypto) | |
Generic (PrtclEnv crypto) | |
Generic (PrtlSeqFailure crypto) | |
Generic (UpdnPredicateFailure crypto) | |
Generic (Digit a) | |
Generic (PostAligned a) | |
Generic (PreAligned a) | |
Generic (Root a) | |
Generic (RealPoint blk) | |
Generic (HeaderStateHistory blk) | |
Generic (HeaderError blk) | |
Generic (HeaderEnvelopeError blk) | |
Generic (ExtValidationError blk) | |
Generic (InternalState blk) | |
Generic (TxTicket tx) | |
Generic (InvalidBlockReason blk) | |
Generic (KnownIntersectionState blk) | |
Generic (UnknownIntersectionState blk) | |
Generic (Anchor block) | |
Generic (WithFingerprint a) | |
Generic (LedgerDB l) | |
Generic (PBftCanBeLeader c) | |
Generic (StreamFrom blk) | |
Generic (StreamTo blk) | |
Generic (ResourceRegistry m) | |
Generic (Checkpoint l) | |
Generic (TraceEvent blk) | |
Generic (InvalidBlockInfo blk) | |
Generic (TraceAddBlockEvent blk) | |
Generic (TraceGCEvent blk) | |
Generic (InImmutableDBEnd blk) | |
Generic (TraceIteratorEvent blk) | |
Generic (TraceEvent blk) | |
Generic (TraceReplayEvent blk) | |
Generic (UpdateLedgerDbTraceEvent blk) | |
Generic (InitFailure blk) | |
Generic (InitLog blk) | |
Generic (LedgerDbCfg l) | |
Generic (FollowerRollState blk) | |
Generic (NewTipInfo blk) | |
Generic (TraceCopyToImmutableDBEvent blk) | |
Generic (TraceFollowerEvent blk) | |
Generic (TraceInitChainSelEvent blk) | |
Generic (TraceOpenEvent blk) | |
Generic (TraceValidationEvent blk) | |
Generic (TentativeState blk) | |
Generic (TraceEvent blk) | |
Generic (TraceEvent blk) | |
Generic (ImmutableDBError blk) | |
Generic (IteratorResult b) | |
Generic (MissingBlock blk) | |
Generic (Tip blk) | |
Generic (Cached blk) | |
Generic (CurrentChunkInfo blk) | |
Generic (PastChunkInfo blk) | |
Generic (Entry blk) | |
Generic (WithBlockSize a) | |
Generic (ResourceKey m) | |
Generic (BlockInfo blk) | |
Generic (FileInfo blk) | |
Generic (Index blk) | |
Generic (InternalBlockInfo blk) | |
Generic (RAWState st) | |
Generic (RegistryState m) | |
Generic (Resource m) | |
Generic (KESKey c) | |
Generic (KESState c) | |
Generic (TestAddress addr) | |
Generic (EvaluationResult a) | |
Generic (BuiltinCostModelBase f) | |
Generic (CostingFun model) | |
Generic (LR a) | |
Generic (RL a) | |
Generic (MachineError fun) | |
Generic (CekExTally fun) | |
Generic (TallyingSt fun) | |
Generic (ExBudgetCategory fun) | |
Generic (Extended a) | |
Generic (LowerBound a) | |
Generic (UpperBound a) | |
Generic (SimpleDocStream ann) | |
Generic (LinearTransform d) | |
Generic (Window a) | |
Generic (Doc a) | |
Generic (SimpleDoc a) | |
Generic (Item a) | |
Generic (AddrRange a) | |
Generic (ParamSchema t) | |
Generic (RunSelectionParams u) | |
Generic (SelectionBalanceError ctx) | |
Generic (SelectionConstraints ctx) | |
Generic (SelectionLimitReachedError ctx) | |
Generic (SelectionSkeleton ctx) | |
Generic (UTxOSelection u) | |
Generic (UTxOSelectionNonEmpty u) | |
Generic (SelectionOf change) | |
Generic (SelectionCollateralError ctx) | |
Generic (SelectionOutputCoinInsufficientError ctx) | |
Defined in Cardano.CoinSelection | |
Generic (SelectionOutputErrorInfo ctx) | |
Generic (SelectionOutputSizeExceedsLimitError ctx) | |
Defined in Cardano.CoinSelection | |
Generic (SelectionOutputTokenQuantityExceedsLimitError ctx) | |
Defined in Cardano.CoinSelection | |
Generic (Flat a) | |
Generic (Selection ctx) | |
Generic (Hash tag) | |
Generic (Nested a) | |
Generic (UTxOIndex u) | |
Generic (State u) | |
Generic (NonEmptySet a) | |
Generic (SelectionConstraints ctx) | |
Generic (SelectionParams ctx) | |
Generic (SelectionParams u) | |
Generic (SelectionCollateralError u) | |
Generic (SelectionResult u) | |
Generic (ShowFmt a) | |
Generic (NonRandom a) | |
Generic (Versioned a) | |
Generic (Either a b) | Since: base-4.6.0.0 |
Generic (V1 p) | Since: base-4.9.0.0 |
Generic (U1 p) | Since: base-4.7.0.0 |
Generic (a, b) | Since: base-4.6.0.0 |
Generic (Arg a b) | Since: base-4.9.0.0 |
Generic (WrappedMonad m a) | Since: base-4.7.0.0 |
Defined in Control.Applicative Associated Types type Rep (WrappedMonad m a) ∷ Type → Type # Methods from ∷ WrappedMonad m a → Rep (WrappedMonad m a) x # to ∷ Rep (WrappedMonad m a) x → WrappedMonad m a # | |
Generic (Proxy t) | Since: base-4.6.0.0 |
Generic (Current f blk) | |
Generic (ShelleyTip proto era) | |
Generic (KeyHash discriminator crypto) | |
Generic (Hash h a) | |
Generic (Block slot hash) | |
Generic (Annotated b a) | |
Generic (Bimap a b) | |
Generic (AbstractHash algo a) | |
Generic (SignedKES v a) | |
Generic (PraosFields c toSign) | |
Generic (VKey kd crypto) | |
Generic (TPraosFields c toSign) | |
Generic (Credential kr crypto) | |
Generic (PParams' f era) | |
Generic (PParams' f era) | |
Generic (PParams' f era) | |
Generic (Block h era) | |
Era era ⇒ Generic (WitnessSetHKD Identity era) | |
Generic (WitVKey kr crypto) | |
Generic (TyVarDecl tyname ann) | |
Generic (ParseError s e) | |
Generic (State s e) | |
Generic (ParseErrorBundle s e) | |
Generic (ErrorWithCause err cause) | |
Generic (WithMuxBearer peerid a) | |
Generic (CertifiedVRF v a) | |
Generic (Either a b) | |
Generic (Pair a b) | |
Generic (These a b) | |
Generic (These a b) | |
Generic (RequestF body path) | |
Generic (Cofree f a) | |
Generic (AdjacencyMap e a) | |
Generic (Graph e a) | |
Generic (Container b a) | |
Generic (ErrorContainer b e) | |
Generic (Unit f) | |
Generic (Void f) | |
Generic (ListN n a) | |
Generic (SignedDSIGN v a) | |
Generic (Map k v) | |
Generic (Validation e a) | |
Generic (BoundedRatio b a) | |
Generic (Of a b) | |
Generic (KeyPair kd crypto) | |
Generic (FingerTree v a) | |
Generic (SearchResult v a) | |
Generic (ViewL s a) | |
Generic (ViewR s a) | |
Generic (Node v a) | |
Generic (Tuple2 a b) | |
Generic (Free f a) | |
Generic (ListT m a) | |
Generic (FirstToFinish m a) | |
Generic (LastToFinish m a) | |
Generic (LastToFinishM m a) | |
Generic (PBftFields c toSign) | |
Generic (ChainDbEnv m blk) | |
Generic (LgrDB m blk) | |
Generic (ChainDbState m blk) | |
Generic (TraceChunkValidation blk validateTo) | |
Generic (InternalState blk h) | |
Generic (OpenState blk h) | |
Generic (ServerState txid tx) | |
Generic (EvaluationError user internal) | |
Generic (Def var val) | |
Generic (TypeErrorExt uni ann) | |
Generic (ListF a b) | |
Generic (NonEmptyF a b) | |
Generic (TreeF a b) | |
Generic (UVarDecl name ann) | |
Generic (SearchResult v a) | |
Generic (NoContentVerb method) | |
Generic (MakeChangeCriteria minCoinFor bundleSizeAssessor) | |
Defined in Cardano.CoinSelection.Balance | |
Generic (SelectionParamsOf f ctx) | |
Generic (SelectionResultOf f ctx) | |
Generic (NonEmptyMap k v) | |
Generic (Quantity unit a) | |
Generic (Rec1 f p) | Since: base-4.7.0.0 |
Generic (URec (Ptr ()) p) | Since: base-4.9.0.0 |
Generic (URec Char p) | Since: base-4.9.0.0 |
Generic (URec Double p) | Since: base-4.9.0.0 |
Generic (URec Float p) | |
Generic (URec Int p) | Since: base-4.9.0.0 |
Generic (URec Word p) | Since: base-4.9.0.0 |
Generic (a, b, c) | Since: base-4.6.0.0 |
Generic (WrappedArrow a b c) | Since: base-4.7.0.0 |
Defined in Control.Applicative Associated Types type Rep (WrappedArrow a b c) ∷ Type → Type # Methods from ∷ WrappedArrow a b c → Rep (WrappedArrow a b c) x # to ∷ Rep (WrappedArrow a b c) x → WrappedArrow a b c # | |
Generic (Kleisli m a b) | Since: base-4.14.0.0 |
Generic (Const a b) | Since: base-4.9.0.0 |
Generic (Ap f a) | Since: base-4.12.0.0 |
Generic (Alt f a) | Since: base-4.8.0.0 |
Generic (K a b) | |
Generic (Trip coin ptr pool) | |
Generic (WithBlockNo f a) | |
Generic (Tagged s b) | |
Generic (Type tyname uni ann) | |
Generic (Error uni fun ann) | |
Generic (KVVector kv vv a) | |
Generic (AnchoredSeq v a b) | |
Generic (These1 f g a) | |
Generic (Fix p a) | |
Generic (Join p a) | |
Generic (Tuple3 a b c) | |
Generic (CofreeF f a b) | |
Generic (FreeF f a b) | |
Generic (MeasuredWith v a b) | |
Generic (IteratorState m blk b) | |
Generic (FollowerState m blk b) | |
Generic (IteratorState m blk h) | |
Generic (IteratorStateOrExhausted m hash h) | |
Generic (InternalState m blk h) | |
Generic (OpenState m blk h) | |
Generic (TyDecl tyname uni ann) | |
Generic (K1 i c p) | Since: base-4.7.0.0 |
Generic ((f :+: g) p) | Since: base-4.7.0.0 |
Generic ((f :*: g) p) | Since: base-4.7.0.0 |
Generic (a, b, c, d) | Since: base-4.6.0.0 |
Generic (Product f g a) | Since: base-4.9.0.0 |
Generic (Sum f g a) | Since: base-4.9.0.0 |
Generic (Product2 f g x y) | |
Generic (UMap coin cred pool ptr) | |
Generic (VMap kv vv k v) | |
Generic (Program name uni fun ann) | |
Generic (Term name uni fun ann) | |
Generic (TypeError term uni fun ann) | |
Generic (Tuple4 a b c d) | |
Generic (MachineParameters machinecosts term uni fun) | |
Generic (Subst name uni fun a) | |
Generic (StreamBody' mods framing contentType a) | |
Defined in Servant.API.Stream | |
Generic (M1 i c f p) | Since: base-4.7.0.0 |
Generic ((f :.: g) p) | Since: base-4.7.0.0 |
Generic (a, b, c, d, e) | Since: base-4.6.0.0 |
Generic (Compose f g a) | Since: base-4.9.0.0 |
Generic ((f :.: g) p) | |
Generic (Term tyname name uni fun a) | |
Generic (Datatype tyname name uni fun a) | |
Generic (Program tyname name uni fun ann) | |
Generic (Binding tyname name uni fun a) | |
Generic (Term tyname name uni fun ann) | |
Generic (Program tyname name uni fun ann) | |
Generic (NormCheckError tyname name uni fun ann) | |
Defined in PlutusCore.Error | |
Generic (Clown f a b) | |
Generic (Flip p a b) | |
Generic (Joker g a b) | |
Generic (WrappedBifunctor p a b) | |
Generic (Subst tyname name uni fun a) | |
Generic (BindingGrp tyname name uni fun a) | |
Generic (Verb method statusCode contentTypes a) | |
Defined in Servant.API.Verbs | |
Generic (a, b, c, d, e, f) | Since: base-4.6.0.0 |
Generic (VarDecl tyname name uni fun ann) | |
Generic (Product f g a b) | |
Generic (Sum p q a b) | |
Generic (Stream method status framing contentType a) | |
Defined in Servant.API.Stream | |
Generic (a, b, c, d, e, f, g) | Since: base-4.6.0.0 |
Generic (Tannen f p a b) | |
Generic (Biff p f g a b) | |
Type representing arbitrary-precision non-negative integers.
>>>
2^100 :: Natural
1267650600228229401496703205376
Operations whose result would be negative
,throw
(Underflow
:: ArithException
)
>>>
-1 :: Natural
*** Exception: arithmetic underflow
Since: base-4.8.0.0
Instances
Enum Natural | Since: base-4.8.0.0 |
Defined in GHC.Enum | |
Eq Natural | Since: base-4.8.0.0 |
Integral Natural | Since: base-4.8.0.0 |
Num Natural | Note that Since: base-4.8.0.0 |
Ord Natural | Since: base-4.8.0.0 |
Read Natural | Since: base-4.8.0.0 |
Real Natural | Since: base-4.8.0.0 |
Defined in GHC.Real Methods toRational ∷ Natural → Rational # | |
Show Natural | Since: base-4.8.0.0 |
PrintfArg Natural | Since: base-4.8.0.0 |
Defined in Text.Printf | |
Bits Natural | Since: base-4.8.0 |
Defined in Data.Bits Methods (.&.) ∷ Natural → Natural → Natural # (.|.) ∷ Natural → Natural → Natural # xor ∷ Natural → Natural → Natural # complement ∷ Natural → Natural # shift ∷ Natural → Int → Natural # rotate ∷ Natural → Int → Natural # setBit ∷ Natural → Int → Natural # clearBit ∷ Natural → Int → Natural # complementBit ∷ Natural → Int → Natural # testBit ∷ Natural → Int → Bool # bitSizeMaybe ∷ Natural → Maybe Int # shiftL ∷ Natural → Int → Natural # unsafeShiftL ∷ Natural → Int → Natural # shiftR ∷ Natural → Int → Natural # unsafeShiftR ∷ Natural → Int → Natural # rotateL ∷ Natural → Int → Natural # | |
FromJSON Natural | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Natural | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Natural → Encoding # toJSONList ∷ [Natural] → Value # toEncodingList ∷ [Natural] → Encoding # | |
FromCBOR Natural | |
ToCBOR Natural | |
Defined in Cardano.Binary.ToCBOR Methods encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Natural → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Natural] → Size | |
NoThunks Natural | |
Serialise Natural | |
Defined in Codec.Serialise.Class | |
ToJSONKey Natural | |
Defined in Data.Aeson.Types.ToJSON | |
FromJSONKey Natural | |
Defined in Data.Aeson.Types.FromJSON | |
ToField Natural | |
Defined in Data.Csv.Conversion | |
Pretty Natural | |
Defined in Prettyprinter.Internal | |
Corecursive Natural | |
Defined in Data.Functor.Foldable Methods embed ∷ Base Natural Natural → Natural ana ∷ (a → Base Natural a) → a → Natural apo ∷ (a → Base Natural (Either Natural a)) → a → Natural postpro ∷ Recursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (a → Base Natural a) → a → Natural gpostpro ∷ (Recursive Natural, Monad m) ⇒ (∀ b. m (Base Natural b) → Base Natural (m b)) → (∀ c. Base Natural c → Base Natural c) → (a → Base Natural (m a)) → a → Natural | |
Recursive Natural | |
Defined in Data.Functor.Foldable Methods project ∷ Natural → Base Natural Natural cata ∷ (Base Natural a → a) → Natural → a para ∷ (Base Natural (Natural, a) → a) → Natural → a gpara ∷ (Corecursive Natural, Comonad w) ⇒ (∀ b. Base Natural (w b) → w (Base Natural b)) → (Base Natural (EnvT Natural w a) → a) → Natural → a prepro ∷ Corecursive Natural ⇒ (∀ b. Base Natural b → Base Natural b) → (Base Natural a → a) → Natural → a gprepro ∷ (Corecursive Natural, Comonad w) ⇒ (∀ b. Base Natural (w b) → w (Base Natural b)) → (∀ c. Base Natural c → Base Natural c) → (Base Natural (w a) → a) → Natural → a | |
Hashable Natural | |
Defined in Data.Hashable.Class | |
FromHttpApiData Natural | |
Defined in Web.Internal.HttpApiData | |
ToHttpApiData Natural | |
Defined in Web.Internal.HttpApiData Methods toUrlPiece ∷ Natural → Text toEncodedUrlPiece ∷ Natural → Builder toHeader ∷ Natural → ByteString toQueryParam ∷ Natural → Text | |
Subtractive Natural | |
FromField Natural | |
Defined in Data.Csv.Conversion Methods parseField ∷ Field → Parser Natural | |
UniformRange Natural | |
Defined in System.Random.Internal | |
Pretty Natural | |
Defined in Text.PrettyPrint.Annotated.WL | |
FromFormKey Natural | |
Defined in Web.Internal.FormUrlEncoded Methods | |
ToFormKey Natural | |
Defined in Web.Internal.FormUrlEncoded | |
ToParamSchema Natural | |
Defined in Data.Swagger.Internal.ParamSchema Methods toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy Natural → ParamSchema t | |
ToSchema Natural | |
Defined in Data.Swagger.Internal.Schema Methods declareNamedSchema ∷ Proxy Natural → Declare (Definitions Schema) NamedSchema | |
FromText Natural | |
Defined in Data.Text.Class | |
ToText Natural | |
Defined in Data.Text.Class | |
Lift Natural | |
PrettyDefaultBy config Natural ⇒ PrettyBy config Natural | |
Defined in Text.PrettyBy.Internal | |
DefaultPrettyBy config Natural | |
Defined in Text.PrettyBy.Internal Methods defaultPrettyBy ∷ config → Natural → Doc ann defaultPrettyListBy ∷ config → [Natural] → Doc ann | |
Buildable (Range Natural) | |
Defined in Cardano.Binary.ToCBOR | |
type Base Natural | |
Defined in Data.Functor.Foldable | |
type Difference Natural | |
Defined in Basement.Numerical.Subtractive | |
type IntBaseType Natural | |
Defined in Data.IntCast type IntBaseType Natural = 'BigWordTag |
data Constraint #
The kind of constraints, like Show a
CallStack
s are a lightweight method of obtaining a
partial call-stack at any point in the program.
A function can request its call-site with the HasCallStack
constraint.
For example, we can define
putStrLnWithCallStack :: HasCallStack => String -> IO ()
as a variant of putStrLn
that will get its call-site and print it,
along with the string given as argument. We can access the
call-stack inside putStrLnWithCallStack
with callStack
.
putStrLnWithCallStack :: HasCallStack => String -> IO () putStrLnWithCallStack msg = do putStrLn msg putStrLn (prettyCallStack callStack)
Thus, if we call putStrLnWithCallStack
we will get a formatted call-stack
alongside our string.
>>>
putStrLnWithCallStack "hello"
hello CallStack (from HasCallStack): putStrLnWithCallStack, called at <interactive>:2:1 in interactive:Ghci1
GHC solves HasCallStack
constraints in three steps:
- If there is a
CallStack
in scope -- i.e. the enclosing function has aHasCallStack
constraint -- GHC will append the new call-site to the existingCallStack
. - 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 aHasCallStack
constraint for the enclosing definition (subject to the monomorphism restriction). - If there is no
CallStack
in scope and the enclosing definition has an explicit type signature, GHC will solve theHasCallStack
constraint for the singletonCallStack
containing just the current call-site.
CallStack
s 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
IsList CallStack | Be aware that 'fromList . toList = id' only for unfrozen Since: base-4.9.0.0 |
Show CallStack | Since: base-4.9.0.0 |
NoThunks CallStack | |
type Item CallStack | |
type Code CallStack | |
type DatatypeInfoOf CallStack | |
Defined in Generics.SOP.Instances type DatatypeInfoOf CallStack = 'ADT "GHC.Stack.Types" "CallStack" '['Constructor "EmptyCallStack", 'Constructor "PushCallStack", 'Constructor "FreezeCallStack"] '['[] ∷ [StrictnessInfo], '['StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy, 'StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy, 'StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy], '['StrictnessInfo 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy]] |
class Contravariant (f ∷ Type → Type) where #
The class of contravariant functors.
Whereas in Haskell, one can think of a Functor
as containing or producing
values, a contravariant functor is a functor that can be thought of as
consuming values.
As an example, consider the type of predicate functions a -> Bool
. One
such predicate might be negative x = x < 0
, which
classifies integers as to whether they are negative. However, given this
predicate, we can re-use it in other situations, providing we have a way to
map values to integers. For instance, we can use the negative
predicate
on a person's bank balance to work out if they are currently overdrawn:
newtype Predicate a = Predicate { getPredicate :: a -> Bool } instance Contravariant Predicate where contramap f (Predicate p) = Predicate (p . f) | `- First, map the input... `----- then apply the predicate. overdrawn :: Predicate Person overdrawn = contramap personBankBalance negative
Any instance should be subject to the following laws:
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
Instances
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
Uninhabited data type
Since: base-4.8.0.0
Instances
Eq Void | Since: base-4.8.0.0 |
Data Void | Since: base-4.8.0.0 |
Defined in Data.Void Methods gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Void → c Void # gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c Void # dataTypeOf ∷ Void → DataType # dataCast1 ∷ Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c Void) # dataCast2 ∷ Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c Void) # gmapT ∷ (∀ b. Data b ⇒ b → b) → Void → Void # gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Void → r # gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Void → r # gmapQ ∷ (∀ d. Data d ⇒ d → u) → Void → [u] # gmapQi ∷ Int → (∀ d. Data d ⇒ d → u) → Void → u # gmapM ∷ Monad m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void # gmapMp ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void # gmapMo ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Void → m Void # | |
Ord Void | Since: base-4.8.0.0 |
Read Void | Reading a Since: base-4.8.0.0 |
Show Void | Since: base-4.8.0.0 |
Ix Void | Since: base-4.8.0.0 |
Generic Void | Since: base-4.8.0.0 |
Semigroup Void | Since: base-4.9.0.0 |
Exception Void | Since: base-4.8.0.0 |
Defined in Data.Void Methods toException ∷ Void → SomeException # fromException ∷ SomeException → Maybe Void # displayException ∷ Void → String # | |
FromJSON Void | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Void | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Void → Encoding # toJSONList ∷ [Void] → Value # toEncodingList ∷ [Void] → Encoding # | |
FromCBOR Void | |
ToCBOR Void | |
Defined in Cardano.Binary.ToCBOR Methods encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Void → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Void] → Size | |
NoThunks Void | |
Serialise Void | |
Defined in Codec.Serialise.Class | |
ToJSONKey Void | |
Defined in Data.Aeson.Types.ToJSON | |
FromJSONKey Void | |
Defined in Data.Aeson.Types.FromJSON | |
Pretty Void | |
Defined in Prettyprinter.Internal | |
FromData Void | |
Defined in PlutusTx.IsData.Class Methods fromBuiltinData ∷ BuiltinData → Maybe Void | |
ToData Void | |
Defined in PlutusTx.IsData.Class Methods toBuiltinData ∷ Void → BuiltinData | |
UnsafeFromData Void | |
Defined in PlutusTx.IsData.Class Methods unsafeFromBuiltinData ∷ BuiltinData → Void | |
Hashable Void | |
Defined in Data.Hashable.Class | |
ShowErrorComponent Void | |
Defined in Text.Megaparsec.Error | |
Buildable Void | |
Defined in Formatting.Buildable | |
FromHttpApiData Void | |
Defined in Web.Internal.HttpApiData | |
ToHttpApiData Void | |
Defined in Web.Internal.HttpApiData Methods toUrlPiece ∷ Void → Text toEncodedUrlPiece ∷ Void → Builder toHeader ∷ Void → ByteString toQueryParam ∷ Void → Text | |
Finite Void | |
Defined in System.Random.GFinite | |
FromFormKey Void | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey ∷ Text → Either Text Void | |
ToFormKey Void | |
Defined in Web.Internal.FormUrlEncoded | |
Lift Void | Since: template-haskell-2.15.0.0 |
PrettyDefaultBy config Void ⇒ PrettyBy config Void | |
Defined in Text.PrettyBy.Internal | |
DefaultPrettyBy config Void | |
Defined in Text.PrettyBy.Internal | |
FoldableWithIndex Void (V1 ∷ Type → Type) | |
FoldableWithIndex Void (U1 ∷ Type → Type) | |
FoldableWithIndex Void (Proxy ∷ Type → Type) | |
Defined in WithIndex | |
FunctorWithIndex Void (V1 ∷ Type → Type) | |
FunctorWithIndex Void (U1 ∷ Type → Type) | |
FunctorWithIndex Void (Proxy ∷ Type → Type) | |
TraversableWithIndex Void (V1 ∷ Type → Type) | |
TraversableWithIndex Void (U1 ∷ Type → Type) | |
TraversableWithIndex Void (Proxy ∷ Type → Type) | |
FilterableWithIndex Void (Proxy ∷ Type → Type) | |
WitherableWithIndex Void (Proxy ∷ Type → Type) | |
FoldableWithIndex Void (Const e ∷ Type → Type) | |
FoldableWithIndex Void (Constant e ∷ Type → Type) | |
FunctorWithIndex Void (Const e ∷ Type → Type) | |
FunctorWithIndex Void (Constant e ∷ Type → Type) | |
TraversableWithIndex Void (Const e ∷ Type → Type) | |
TraversableWithIndex Void (Constant e ∷ Type → Type) | |
FoldableWithIndex Void (K1 i c ∷ Type → Type) | |
Defined in WithIndex | |
FunctorWithIndex Void (K1 i c ∷ Type → Type) | |
TraversableWithIndex Void (K1 i c ∷ Type → Type) | |
type Rep Void | |
type Code Void | |
Defined in Generics.SOP.Instances | |
type DatatypeInfoOf Void | |
Defined in Generics.SOP.Instances type DatatypeInfoOf Void = 'ADT "Data.Void" "Void" ('[] ∷ [ConstructorInfo]) ('[] ∷ [[StrictnessInfo]]) |
printf ∷ PrintfType r ⇒ String → r #
Format a variable number of arguments with the C-style formatting string.
>>>
printf "%s, %d, %.4f" "hello" 123 pi
hello, 123, 3.1416
The return value is either String
or (
(which
should be IO
a)(
, but Haskell's type system
makes this hard).IO
())
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.
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
Methods
formatArg ∷ a → FieldFormatter #
Since: base-4.7.0.0
parseFormat ∷ a → ModifierParser #
Since: base-4.7.0.0
Instances
PrintfArg Char | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Double | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Float | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Int | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Int8 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Int16 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Int32 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Int64 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Integer | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Natural | Since: base-4.8.0.0 |
Defined in Text.Printf | |
PrintfArg Word | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Word8 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Word16 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Word32 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg Word64 | Since: base-2.1 |
Defined in Text.Printf | |
PrintfArg ShortText | |
Defined in Data.Text.Short.Internal | |
PrintfArg GYLogNamespace # |
|
Defined in GeniusYield.Types.Logging | |
PrintfArg GYPubKeyHash # |
|
Defined in GeniusYield.Types.PubKeyHash | |
PrintfArg GYPaymentSigningKey # |
|
Defined in GeniusYield.Types.Key | |
PrintfArg GYPaymentVerificationKey # |
|
Defined in GeniusYield.Types.Key | |
PrintfArg GYRational # |
|
Defined in GeniusYield.Types.Rational | |
PrintfArg GYValidatorHash # |
|
Defined in GeniusYield.Types.Script Methods | |
PrintfArg GYAddressBech32 # | |
Defined in GeniusYield.Types.Address Methods | |
PrintfArg GYAddress # | This instance is using for logging
|
Defined in GeniusYield.Types.Address | |
PrintfArg GYSlot # | |
Defined in GeniusYield.Types.Slot | |
PrintfArg GYTime # |
|
Defined in GeniusYield.Types.Time | |
PrintfArg GYTxId # |
|
Defined in GeniusYield.Types.Tx | |
PrintfArg GYTx # | |
Defined in GeniusYield.Types.Tx | |
PrintfArg GYTxOutRefCbor # | |
Defined in GeniusYield.Types.TxOutRef | |
PrintfArg GYTxOutRef # | |
Defined in GeniusYield.Types.TxOutRef | |
PrintfArg GYAssetClass # |
|
Defined in GeniusYield.Types.Value | |
PrintfArg GYValue # |
|
Defined in GeniusYield.Types.Value | |
PrintfArg GYUTxOs # | |
Defined in GeniusYield.Types.UTxO | |
IsChar c ⇒ PrintfArg [c] | Since: base-2.1 |
Defined in Text.Printf |
unless ∷ Applicative f ⇒ Bool → f () → f () #
The reverse of when
.
foldM ∷ (Foldable t, Monad m) ⇒ (b → a → m b) → b → t a → m b #
The foldM
function is analogous to foldl
, except that its result is
encapsulated in a monad. Note that foldM
works from left-to-right over
the list arguments. This could be an issue where (
and the `folded
function' are not commutative.>>
)
foldM f a1 [x1, x2, ..., xm] == do a2 <- f a1 x1 a3 <- f a2 x2 ... f am xm
If right-to-left evaluation is required, the input list should be reversed.
forM ∷ (Traversable t, Monad m) ⇒ t a → (a → m b) → m (t b) #
Identity functor and monad. (a non-strict monad)
Since: base-4.8.0.0
Constructors
Identity | |
Fields
|
Instances
Monad Identity | Since: base-4.8.0.0 |
Functor Identity | Since: base-4.8.0.0 |
MonadFix Identity | Since: base-4.8.0.0 |
Defined in Data.Functor.Identity | |
Applicative Identity | Since: base-4.8.0.0 |
Foldable Identity | Since: base-4.8.0.0 |
Defined in Data.Functor.Identity Methods fold ∷ Monoid m ⇒ Identity m → m # foldMap ∷ Monoid m ⇒ (a → m) → Identity a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Identity a → m # foldr ∷ (a → b → b) → b → Identity a → b # foldr' ∷ (a → b → b) → b → Identity a → b # foldl ∷ (b → a → b) → b → Identity a → b # foldl' ∷ (b → a → b) → b → Identity a → b # foldr1 ∷ (a → a → a) → Identity a → a # foldl1 ∷ (a → a → a) → Identity a → a # elem ∷ Eq a ⇒ a → Identity a → Bool # maximum ∷ Ord a ⇒ Identity a → a # minimum ∷ Ord a ⇒ Identity a → a # | |
Foldable Tree | |
Defined in Hedgehog.Internal.Tree Methods fold ∷ Monoid m ⇒ Tree m → m # foldMap ∷ Monoid m ⇒ (a → m) → Tree a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Tree a → m # foldr ∷ (a → b → b) → b → Tree a → b # foldr' ∷ (a → b → b) → b → Tree a → b # foldl ∷ (b → a → b) → b → Tree a → b # foldl' ∷ (b → a → b) → b → Tree a → b # foldr1 ∷ (a → a → a) → Tree a → a # foldl1 ∷ (a → a → a) → Tree a → a # elem ∷ Eq a ⇒ a → Tree a → Bool # maximum ∷ Ord a ⇒ Tree a → a # | |
Foldable Node | |
Defined in Hedgehog.Internal.Tree Methods fold ∷ Monoid m ⇒ Node m → m # foldMap ∷ Monoid m ⇒ (a → m) → Node a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Node a → m # foldr ∷ (a → b → b) → b → Node a → b # foldr' ∷ (a → b → b) → b → Node a → b # foldl ∷ (b → a → b) → b → Node a → b # foldl' ∷ (b → a → b) → b → Node a → b # foldr1 ∷ (a → a → a) → Node a → a # foldl1 ∷ (a → a → a) → Node a → a # elem ∷ Eq a ⇒ a → Node a → Bool # maximum ∷ Ord a ⇒ Node a → a # | |
Traversable Identity | Since: base-4.9.0.0 |
Traversable Tree | |
Defined in Hedgehog.Internal.Tree | |
Traversable Node | |
Defined in Hedgehog.Internal.Tree | |
Eq1 Identity | Since: base-4.9.0.0 |
Ord1 Identity | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Read1 Identity | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Show1 Identity | Since: base-4.9.0.0 |
HKDFunctor Identity | |
Hashable1 Identity | |
Defined in Data.Hashable.Class | |
FromJSON1 Identity | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Identity a) liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Identity a] | |
ToJSON1 Identity | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON ∷ (a → Value) → ([a] → Value) → Identity a → Value liftToJSONList ∷ (a → Value) → ([a] → Value) → [Identity a] → Value liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Identity a → Encoding liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Identity a] → Encoding | |
Representable Identity | |
FoldableWithIndex () Identity | |
Defined in WithIndex | |
FunctorWithIndex () Identity | |
TraversableWithIndex () Identity | |
Defined in WithIndex Methods itraverse ∷ Applicative f ⇒ (() → a → f b) → Identity a → f (Identity b) | |
MonadBaseControl Identity Identity | |
Defined in Control.Monad.Trans.Control Associated Types type StM Identity a | |
Sieve ReifiedGetter Identity | |
Defined in Control.Lens.Reified | |
Cosieve ReifiedGetter Identity | |
Defined in Control.Lens.Reified | |
HasField "_d" (PParams era) UnitInterval | |
Defined in Cardano.Ledger.Babbage.PParams | |
(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (WitnessSet era) (Set (WitVKey 'Witness c)) | |
Defined in Cardano.Ledger.Shelley.Tx | |
(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (WitnessSet era) (Map (ScriptHash c) script) | |
Defined in Cardano.Ledger.Shelley.Tx | |
PrettyDefaultBy config (Identity a) ⇒ PrettyBy config (Identity a) | |
Defined in Text.PrettyBy.Internal | |
PrettyBy config a ⇒ DefaultPrettyBy config (Identity a) | |
Defined in Text.PrettyBy.Internal Methods defaultPrettyBy ∷ config → Identity a → Doc ann defaultPrettyListBy ∷ config → [Identity a] → Doc ann | |
Unbox a ⇒ Vector Vector (Identity a) | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Identity a) → m (Vector (Identity a)) basicUnsafeThaw ∷ PrimMonad m ⇒ Vector (Identity a) → m (Mutable Vector (PrimState m) (Identity a)) basicLength ∷ Vector (Identity a) → Int basicUnsafeSlice ∷ Int → Int → Vector (Identity a) → Vector (Identity a) basicUnsafeIndexM ∷ Monad m ⇒ Vector (Identity a) → Int → m (Identity a) basicUnsafeCopy ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Identity a) → Vector (Identity a) → m () | |
Unbox a ⇒ MVector MVector (Identity a) | |
Defined in Data.Vector.Unboxed.Base Methods basicLength ∷ MVector s (Identity a) → Int basicUnsafeSlice ∷ Int → Int → MVector s (Identity a) → MVector s (Identity a) basicOverlaps ∷ MVector s (Identity a) → MVector s (Identity a) → Bool basicUnsafeNew ∷ PrimMonad m ⇒ Int → m (MVector (PrimState m) (Identity a)) basicInitialize ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → m () basicUnsafeReplicate ∷ PrimMonad m ⇒ Int → Identity a → m (MVector (PrimState m) (Identity a)) basicUnsafeRead ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Int → m (Identity a) basicUnsafeWrite ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Int → Identity a → m () basicClear ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → m () basicSet ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Identity a → m () basicUnsafeCopy ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → MVector (PrimState m) (Identity a) → m () basicUnsafeMove ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → MVector (PrimState m) (Identity a) → m () basicUnsafeGrow ∷ PrimMonad m ⇒ MVector (PrimState m) (Identity a) → Int → m (MVector (PrimState m) (Identity a)) | |
Bounded a ⇒ Bounded (Identity a) | Since: base-4.9.0.0 |
Enum a ⇒ Enum (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity | |
Eq a ⇒ Eq (Identity a) | Since: base-4.8.0.0 |
Floating a ⇒ Floating (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods exp ∷ Identity a → Identity a # log ∷ Identity a → Identity a # sqrt ∷ Identity a → Identity a # (**) ∷ Identity a → Identity a → Identity a # logBase ∷ Identity a → Identity a → Identity a # sin ∷ Identity a → Identity a # cos ∷ Identity a → Identity a # tan ∷ Identity a → Identity a # asin ∷ Identity a → Identity a # acos ∷ Identity a → Identity a # atan ∷ Identity a → Identity a # sinh ∷ Identity a → Identity a # cosh ∷ Identity a → Identity a # tanh ∷ Identity a → Identity a # asinh ∷ Identity a → Identity a # acosh ∷ Identity a → Identity a # atanh ∷ Identity a → Identity a # log1p ∷ Identity a → Identity a # expm1 ∷ Identity a → Identity a # | |
Fractional a ⇒ Fractional (Identity a) | Since: base-4.9.0.0 |
Integral a ⇒ Integral (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods quot ∷ Identity a → Identity a → Identity a # rem ∷ Identity a → Identity a → Identity a # div ∷ Identity a → Identity a → Identity a # mod ∷ Identity a → Identity a → Identity a # quotRem ∷ Identity a → Identity a → (Identity a, Identity a) # divMod ∷ Identity a → Identity a → (Identity a, Identity a) # | |
Num a ⇒ Num (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity | |
Ord a ⇒ Ord (Identity a) | Since: base-4.8.0.0 |
Defined in Data.Functor.Identity | |
Read a ⇒ Read (Identity a) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Real a ⇒ Real (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods toRational ∷ Identity a → Rational # | |
RealFloat a ⇒ RealFloat (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods floatRadix ∷ Identity a → Integer # floatDigits ∷ Identity a → Int # floatRange ∷ Identity a → (Int, Int) # decodeFloat ∷ Identity a → (Integer, Int) # encodeFloat ∷ Integer → Int → Identity a # significand ∷ Identity a → Identity a # scaleFloat ∷ Int → Identity a → Identity a # isInfinite ∷ Identity a → Bool # isDenormalized ∷ Identity a → Bool # isNegativeZero ∷ Identity a → Bool # | |
RealFrac a ⇒ RealFrac (Identity a) | Since: base-4.9.0.0 |
Show a ⇒ Show (Identity a) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Ix a ⇒ Ix (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods range ∷ (Identity a, Identity a) → [Identity a] # index ∷ (Identity a, Identity a) → Identity a → Int # unsafeIndex ∷ (Identity a, Identity a) → Identity a → Int # inRange ∷ (Identity a, Identity a) → Identity a → Bool # rangeSize ∷ (Identity a, Identity a) → Int # unsafeRangeSize ∷ (Identity a, Identity a) → Int # | |
IsString a ⇒ IsString (Identity a) | Since: base-4.9.0.0 |
Defined in Data.String Methods fromString ∷ String → Identity a # | |
Generic (Identity a) | Since: base-4.8.0.0 |
Semigroup a ⇒ Semigroup (Identity a) | Since: base-4.9.0.0 |
Monoid a ⇒ Monoid (Identity a) | Since: base-4.9.0.0 |
Storable a ⇒ Storable (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity | |
Bits a ⇒ Bits (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods (.&.) ∷ Identity a → Identity a → Identity a # (.|.) ∷ Identity a → Identity a → Identity a # xor ∷ Identity a → Identity a → Identity a # complement ∷ Identity a → Identity a # shift ∷ Identity a → Int → Identity a # rotate ∷ Identity a → Int → Identity a # setBit ∷ Identity a → Int → Identity a # clearBit ∷ Identity a → Int → Identity a # complementBit ∷ Identity a → Int → Identity a # testBit ∷ Identity a → Int → Bool # bitSizeMaybe ∷ Identity a → Maybe Int # isSigned ∷ Identity a → Bool # shiftL ∷ Identity a → Int → Identity a # unsafeShiftL ∷ Identity a → Int → Identity a # shiftR ∷ Identity a → Int → Identity a # unsafeShiftR ∷ Identity a → Int → Identity a # rotateL ∷ Identity a → Int → Identity a # | |
FiniteBits a ⇒ FiniteBits (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods finiteBitSize ∷ Identity a → Int # countLeadingZeros ∷ Identity a → Int # countTrailingZeros ∷ Identity a → Int # | |
NFData (Pulser c) | |
Defined in Cardano.Ledger.Shelley.RewardUpdate | |
FromJSON a ⇒ FromJSON (Identity a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams | |
ToJSON a ⇒ ToJSON (Identity a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Identity a → Encoding # toJSONList ∷ [Identity a] → Value # toEncodingList ∷ [Identity a] → Encoding # | |
ToJSON (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams Methods toJSON ∷ PParams era → Value # toEncoding ∷ PParams era → Encoding # toJSONList ∷ [PParams era] → Value # toEncodingList ∷ [PParams era] → Encoding # | |
(Typeable era, FromCBOR (Annotator (Script era)), ValidateScript era) ⇒ FromCBOR (Annotator (WitnessSetHKD Identity era)) | |
Era era ⇒ FromCBOR (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams | |
Era era ⇒ FromCBOR (PParams era) | |
Defined in Cardano.Ledger.Babbage.PParams | |
Era era ⇒ FromCBOR (PParams era) | |
Defined in Cardano.Ledger.Alonzo.PParams | |
Crypto c ⇒ FromCBOR (Pulser c) | |
Defined in Cardano.Ledger.Shelley.RewardUpdate | |
Era era ⇒ ToCBOR (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams Methods toCBOR ∷ PParams era → Encoding encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size | |
Era era ⇒ ToCBOR (PParams era) | |
Defined in Cardano.Ledger.Babbage.PParams Methods toCBOR ∷ PParams era → Encoding encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size | |
Era era ⇒ ToCBOR (PParams era) | |
Defined in Cardano.Ledger.Alonzo.PParams Methods toCBOR ∷ PParams era → Encoding encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (PParams era) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [PParams era] → Size | |
Crypto c ⇒ ToCBOR (Pulser c) | |
Defined in Cardano.Ledger.Shelley.RewardUpdate Methods toCBOR ∷ Pulser c → Encoding encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Pulser c) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Pulser c] → Size | |
NoThunks (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams | |
NoThunks (PParams era) | |
Defined in Cardano.Ledger.Babbage.PParams | |
NoThunks (PParams era) | |
Defined in Cardano.Ledger.Alonzo.PParams | |
Typeable c ⇒ NoThunks (Pulser c) | |
Defined in Cardano.Ledger.Shelley.RewardUpdate | |
Serialise a ⇒ Serialise (Identity a) | |
Defined in Codec.Serialise.Class Methods encode ∷ Identity a → Encoding decode ∷ Decoder s (Identity a) encodeList ∷ [Identity a] → Encoding decodeList ∷ Decoder s [Identity a] | |
ToJSONKey a ⇒ ToJSONKey (Identity a) | |
Defined in Data.Aeson.Types.ToJSON | |
Default (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams Methods def ∷ PParams era | |
Default (PParams era) | |
Defined in Cardano.Ledger.Babbage.PParams Methods def ∷ PParams era | |
Default (PParams era) | |
Defined in Cardano.Ledger.Alonzo.PParams Methods def ∷ PParams era | |
FromJSONKey a ⇒ FromJSONKey (Identity a) | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey ∷ FromJSONKeyFunction (Identity a) fromJSONKeyList ∷ FromJSONKeyFunction [Identity a] | |
ToField a ⇒ ToField (Identity a) | |
Defined in Data.Csv.Conversion | |
Pretty a ⇒ Pretty (Identity a) | |
Defined in Prettyprinter.Internal | |
Hashable a ⇒ Hashable (Identity a) | |
Defined in Data.Hashable.Class | |
Unbox a ⇒ Unbox (Identity a) | |
Defined in Data.Vector.Unboxed.Base | |
Prim a ⇒ Prim (Identity a) | |
Defined in Data.Primitive.Types Methods alignment# ∷ Identity a → Int# indexByteArray# ∷ ByteArray# → Int# → Identity a readByteArray# ∷ MutableByteArray# s → Int# → State# s → (# State# s, Identity a #) writeByteArray# ∷ MutableByteArray# s → Int# → Identity a → State# s → State# s setByteArray# ∷ MutableByteArray# s → Int# → Int# → Identity a → State# s → State# s indexOffAddr# ∷ Addr# → Int# → Identity a readOffAddr# ∷ Addr# → Int# → State# s → (# State# s, Identity a #) writeOffAddr# ∷ Addr# → Int# → Identity a → State# s → State# s setOffAddr# ∷ Addr# → Int# → Int# → Identity a → State# s → State# s | |
FromHttpApiData a ⇒ FromHttpApiData (Identity a) | |
Defined in Web.Internal.HttpApiData Methods parseUrlPiece ∷ Text → Either Text (Identity a) parseHeader ∷ ByteString → Either Text (Identity a) parseQueryParam ∷ Text → Either Text (Identity a) | |
ToHttpApiData a ⇒ ToHttpApiData (Identity a) | |
Defined in Web.Internal.HttpApiData Methods toUrlPiece ∷ Identity a → Text toEncodedUrlPiece ∷ Identity a → Builder toHeader ∷ Identity a → ByteString toQueryParam ∷ Identity a → Text | |
Ixed (Identity a) | |
Defined in Control.Lens.At | |
Wrapped (Identity a) | |
Defined in Control.Lens.Wrapped Associated Types type Unwrapped (Identity a) | |
MonoFoldable (Identity a) | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m ⇒ (Element (Identity a) → m) → Identity a → m ofoldr ∷ (Element (Identity a) → b → b) → b → Identity a → b ofoldl' ∷ (a0 → Element (Identity a) → a0) → a0 → Identity a → a0 otoList ∷ Identity a → [Element (Identity a)] oall ∷ (Element (Identity a) → Bool) → Identity a → Bool oany ∷ (Element (Identity a) → Bool) → Identity a → Bool olength64 ∷ Identity a → Int64 ocompareLength ∷ Integral i ⇒ Identity a → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element (Identity a) → f b) → Identity a → f () ofor_ ∷ Applicative f ⇒ Identity a → (Element (Identity a) → f b) → f () omapM_ ∷ Applicative m ⇒ (Element (Identity a) → m ()) → Identity a → m () oforM_ ∷ Applicative m ⇒ Identity a → (Element (Identity a) → m ()) → m () ofoldlM ∷ Monad m ⇒ (a0 → Element (Identity a) → m a0) → a0 → Identity a → m a0 ofoldMap1Ex ∷ Semigroup m ⇒ (Element (Identity a) → m) → Identity a → m ofoldr1Ex ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a) ofoldl1Ex' ∷ (Element (Identity a) → Element (Identity a) → Element (Identity a)) → Identity a → Element (Identity a) headEx ∷ Identity a → Element (Identity a) lastEx ∷ Identity a → Element (Identity a) unsafeHead ∷ Identity a → Element (Identity a) unsafeLast ∷ Identity a → Element (Identity a) maximumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a) minimumByEx ∷ (Element (Identity a) → Element (Identity a) → Ordering) → Identity a → Element (Identity a) | |
MonoTraversable (Identity a) | |
Defined in Data.MonoTraversable | |
MonoFunctor (Identity a) | |
MonoPointed (Identity a) | |
Defined in Data.MonoTraversable | |
FromField a ⇒ FromField (Identity a) | |
Defined in Data.Csv.Conversion Methods parseField ∷ Field → Parser (Identity a) | |
FromFormKey a ⇒ FromFormKey (Identity a) | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey ∷ Text → Either Text (Identity a) | |
ToFormKey a ⇒ ToFormKey (Identity a) | |
Defined in Web.Internal.FormUrlEncoded | |
FromField a ⇒ FromField (Identity a) | |
Defined in Database.PostgreSQL.Simple.FromField | |
ToField a ⇒ ToField (Identity a) | |
Defined in Database.PostgreSQL.Simple.ToField | |
ToParamSchema a ⇒ ToParamSchema (Identity a) | |
Defined in Data.Swagger.Internal.ParamSchema Methods toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Identity a) → ParamSchema t | |
ToSchema a ⇒ ToSchema (Identity a) | |
Defined in Data.Swagger.Internal.Schema Methods declareNamedSchema ∷ Proxy (Identity a) → Declare (Definitions Schema) NamedSchema | |
Ixed (Identity a) | |
Generic1 Identity | Since: base-4.8.0.0 |
t ~ Identity b ⇒ Rewrapped (Identity a) t | |
Defined in Control.Lens.Wrapped | |
Field1 (Identity a) (Identity b) a b | |
Defined in Control.Lens.Tuple | |
Eq (PParams' Identity era) | |
Eq (PParams' Identity era) | |
Eq (PParams' Identity era) | |
(Era era, TransWitnessSet Eq era) ⇒ Eq (WitnessSetHKD Identity era) | |
Show (PParams' Identity era) | |
Show (PParams' Identity era) | |
Show (PParams' Identity era) | |
(Era era, TransWitnessSet Show era) ⇒ Show (WitnessSetHKD Identity era) | |
Era era ⇒ Generic (WitnessSetHKD Identity era) | |
(Era era, AnnotatedData (Script era)) ⇒ Semigroup (WitnessSetHKD Identity era) | |
(Era era, AnnotatedData (Script era)) ⇒ Monoid (WitnessSetHKD Identity era) | |
NFData (PParams' Identity era) | |
Defined in Cardano.Ledger.Babbage.PParams | |
NFData (PParams' Identity era) | |
Defined in Cardano.Ledger.Shelley.PParams | |
NFData (PParams' Identity era) | |
Defined in Cardano.Ledger.Alonzo.PParams | |
(Era era, NFData (Script era), NFData (WitVKey 'Witness (Crypto era)), NFData (BootstrapWitness (Crypto era))) ⇒ NFData (WitnessSetHKD Identity era) | |
Defined in Cardano.Ledger.Shelley.Tx | |
Era era ⇒ ToCBOR (WitnessSetHKD Identity era) | |
Defined in Cardano.Ledger.Shelley.Tx Methods toCBOR ∷ WitnessSetHKD Identity era → Encoding encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (WitnessSetHKD Identity era) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [WitnessSetHKD Identity era] → Size | |
(Era era, TransWitnessSet NoThunks era) ⇒ NoThunks (WitnessSetHKD Identity era) | |
SafeToHash (WitnessSetHKD Identity era) | |
Defined in Cardano.Ledger.Shelley.Tx Methods originalBytes ∷ WitnessSetHKD Identity era → ByteString makeHashWithExplicitProxys ∷ HasAlgorithm c ⇒ Proxy c → Proxy index → WitnessSetHKD Identity era → SafeHash c index | |
type Rep Identity | |
Defined in Data.Functor.Rep type Rep Identity = () | |
type StM Identity a | |
Defined in Control.Monad.Trans.Control type StM Identity a = a | |
newtype MVector s (Identity a) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep (Identity a) | |
Defined in Data.Functor.Identity | |
type Element (Identity a) | |
Defined in Data.MonoTraversable type Element (Identity a) = a | |
newtype Vector (Identity a) | |
Defined in Data.Vector.Unboxed.Base | |
type Index (Identity a) | |
Defined in Control.Lens.At type Index (Identity a) = () | |
type IxValue (Identity a) | |
Defined in Control.Lens.At type IxValue (Identity a) = a | |
type Unwrapped (Identity a) | |
Defined in Control.Lens.Wrapped type Unwrapped (Identity a) = a | |
type Index (Identity a) | |
Defined in Optics.At.Core type Index (Identity a) = () | |
type IxValue (Identity a) | |
Defined in Optics.At.Core type IxValue (Identity a) = a | |
type IxKind (Identity a) | |
Defined in Optics.At.Core type IxKind (Identity a) = An_Iso | |
type Code (Identity a) | |
Defined in Generics.SOP.Instances type Code (Identity a) = '['[a]] | |
type DatatypeInfoOf (Identity a) | |
Defined in Generics.SOP.Instances type DatatypeInfoOf (Identity a) = 'Newtype "Data.Functor.Identity" "Identity" ('Record "Identity" '['FieldInfo "runIdentity"]) | |
type Rep1 Identity | |
Defined in Data.Functor.Identity | |
type TranslationError (AllegraEra c) WitnessSet | |
Defined in Cardano.Ledger.Allegra.Translation type TranslationError (AllegraEra c) WitnessSet = DecoderError | |
type TranslationError (MaryEra c) WitnessSet | |
Defined in Cardano.Ledger.Mary.Translation type TranslationError (MaryEra c) WitnessSet = DecoderError | |
type Rep (WitnessSetHKD Identity era) | |
Defined in Cardano.Ledger.Shelley.Tx type Rep (WitnessSetHKD Identity era) = D1 ('MetaData "WitnessSetHKD" "Cardano.Ledger.Shelley.Tx" "cardano-ledger-shelley-0.1.0.0-12f951fe75a25f7bc40871d31bb8c545d9acfab7381f00a7ecc45519383df4da" 'False) (C1 ('MetaCons "WitnessSet'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "addrWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (WitVKey 'Witness (Crypto era))))) :*: S1 ('MetaSel ('Just "scriptWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Map (ScriptHash (Crypto era)) (Script era))))) :*: (S1 ('MetaSel ('Just "bootWits'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HKD Identity (Set (BootstrapWitness (Crypto era))))) :*: S1 ('MetaSel ('Just "txWitsBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))) |
throwIO ∷ Exception e ⇒ e → IO a #
A variant of throw
that can only be used within the IO
monad.
Although throwIO
has a type that is an instance of the type of throw
, the
two functions are subtly different:
throw e `seq` x ===> throw e throwIO e `seq` x ===> x
The first example will cause the exception e
to be raised,
whereas the second one won't. In fact, throwIO
will only cause
an exception to be raised when it is used within the IO
monad.
The throwIO
variant should be used in preference to throw
to
raise an exception within the IO
monad because it guarantees
ordering with respect to other IO
operations, whereas throw
does not.
Arguments
∷ Exception e | |
⇒ IO a | The computation to run |
→ (e → IO a) | Handler to invoke if an exception is raised |
→ IO a |
This is the simplest of the exception-catching functions. It takes a single argument, runs it, and if an exception is raised the "handler" is executed, with the value of the exception passed as an argument. Otherwise, the result is returned as normal. For example:
catch (readFile f) (\e -> do let err = show (e :: IOException) hPutStr stderr ("Warning: Couldn't open " ++ f ++ ": " ++ err) return "")
Note that we have to give a type signature to e
, or the program
will not typecheck as the type is ambiguous. While it is possible
to catch exceptions of any type, see the section "Catching all
exceptions" (in Control.Exception) for an explanation of the problems with doing so.
For catching exceptions in pure (non-IO
) expressions, see the
function evaluate
.
Note that due to Haskell's unspecified evaluation order, an
expression may throw one of several possible exceptions: consider
the expression (error "urk") + (1 `div` 0)
. Does
the expression throw
ErrorCall "urk"
, or DivideByZero
?
The answer is "it might throw either"; the choice is
non-deterministic. If you are catching any type of exception then you
might catch either. If you are calling catch
with type
IO Int -> (ArithException -> IO Int) -> IO Int
then the handler may
get run with DivideByZero
as an argument, or an ErrorCall "urk"
exception may be propogated further up. If you call it again, you
might get a the opposite behaviour. This is ok, because catch
is an
IO
computation.
class (Typeable e, Show e) ⇒ Exception e #
Any type that you wish to throw or catch as an exception must be an
instance of the Exception
class. The simplest case is a new exception
type directly below the root:
data MyException = ThisException | ThatException deriving Show instance Exception MyException
The default method definitions in the Exception
class do what we need
in this case. You can now throw and catch ThisException
and
ThatException
as exceptions:
*Main> throw ThisException `catch` \e -> putStrLn ("Caught " ++ show (e :: MyException)) Caught ThisException
In more complicated examples, you may wish to define a whole hierarchy of exceptions:
--------------------------------------------------------------------- -- Make the root exception type for all the exceptions in a compiler data SomeCompilerException = forall e . Exception e => SomeCompilerException e instance Show SomeCompilerException where show (SomeCompilerException e) = show e instance Exception SomeCompilerException compilerExceptionToException :: Exception e => e -> SomeException compilerExceptionToException = toException . SomeCompilerException compilerExceptionFromException :: Exception e => SomeException -> Maybe e compilerExceptionFromException x = do SomeCompilerException a <- fromException x cast a --------------------------------------------------------------------- -- Make a subhierarchy for exceptions in the frontend of the compiler data SomeFrontendException = forall e . Exception e => SomeFrontendException e instance Show SomeFrontendException where show (SomeFrontendException e) = show e instance Exception SomeFrontendException where toException = compilerExceptionToException fromException = compilerExceptionFromException frontendExceptionToException :: Exception e => e -> SomeException frontendExceptionToException = toException . SomeFrontendException frontendExceptionFromException :: Exception e => SomeException -> Maybe e frontendExceptionFromException x = do SomeFrontendException a <- fromException x cast a --------------------------------------------------------------------- -- Make an exception type for a particular frontend compiler exception data MismatchedParentheses = MismatchedParentheses deriving Show instance Exception MismatchedParentheses where toException = frontendExceptionToException fromException = frontendExceptionFromException
We can now catch a MismatchedParentheses
exception as
MismatchedParentheses
, SomeFrontendException
or
SomeCompilerException
, but not other types, e.g. IOException
:
*Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: MismatchedParentheses)) Caught MismatchedParentheses *Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeFrontendException)) Caught MismatchedParentheses *Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: SomeCompilerException)) Caught MismatchedParentheses *Main> throw MismatchedParentheses `catch` \e -> putStrLn ("Caught " ++ show (e :: IOException)) *** Exception: MismatchedParentheses
Instances
The Const
functor.
Instances
Generic1 (Const a ∷ k → Type) | Since: base-4.9.0.0 |
ConstraintsB (Const a ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.ConstraintsB Associated Types type AllB c (Const a) | |
FunctorB (Const x ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.FunctorB | |
Monoid a ⇒ ApplicativeB (Const a ∷ (k → Type) → Type) | |
TraversableB (Const a ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.TraversableB Methods btraverse ∷ Applicative e ⇒ (∀ (a0 ∷ k0). f a0 → e (g a0)) → Const a f → e (Const a g) | |
FoldableWithIndex Void (Const e ∷ Type → Type) | |
FunctorWithIndex Void (Const e ∷ Type → Type) | |
TraversableWithIndex Void (Const e ∷ Type → Type) | |
PrettyDefaultBy config (Const a b) ⇒ PrettyBy config (Const a b) | |
Defined in Text.PrettyBy.Internal | |
PrettyBy config a ⇒ DefaultPrettyBy config (Const a b) | |
Defined in Text.PrettyBy.Internal Methods defaultPrettyBy ∷ config → Const a b → Doc ann defaultPrettyListBy ∷ config → [Const a b] → Doc ann | |
Unbox a ⇒ Vector Vector (Const a b) | |
Defined in Data.Vector.Unboxed.Base Methods basicUnsafeFreeze ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → m (Vector (Const a b)) basicUnsafeThaw ∷ PrimMonad m ⇒ Vector (Const a b) → m (Mutable Vector (PrimState m) (Const a b)) basicLength ∷ Vector (Const a b) → Int basicUnsafeSlice ∷ Int → Int → Vector (Const a b) → Vector (Const a b) basicUnsafeIndexM ∷ Monad m ⇒ Vector (Const a b) → Int → m (Const a b) basicUnsafeCopy ∷ PrimMonad m ⇒ Mutable Vector (PrimState m) (Const a b) → Vector (Const a b) → m () | |
Unbox a ⇒ MVector MVector (Const a b) | |
Defined in Data.Vector.Unboxed.Base Methods basicLength ∷ MVector s (Const a b) → Int basicUnsafeSlice ∷ Int → Int → MVector s (Const a b) → MVector s (Const a b) basicOverlaps ∷ MVector s (Const a b) → MVector s (Const a b) → Bool basicUnsafeNew ∷ PrimMonad m ⇒ Int → m (MVector (PrimState m) (Const a b)) basicInitialize ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → m () basicUnsafeReplicate ∷ PrimMonad m ⇒ Int → Const a b → m (MVector (PrimState m) (Const a b)) basicUnsafeRead ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (Const a b) basicUnsafeWrite ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → Const a b → m () basicClear ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → m () basicSet ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Const a b → m () basicUnsafeCopy ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m () basicUnsafeMove ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → MVector (PrimState m) (Const a b) → m () basicUnsafeGrow ∷ PrimMonad m ⇒ MVector (PrimState m) (Const a b) → Int → m (MVector (PrimState m) (Const a b)) | |
Bifunctor (Const ∷ Type → Type → Type) | Since: base-4.8.0.0 |
Eq2 (Const ∷ Type → Type → Type) | Since: base-4.9.0.0 |
Ord2 (Const ∷ Type → Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Read2 (Const ∷ Type → Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes Methods liftReadsPrec2 ∷ (Int → ReadS a) → ReadS [a] → (Int → ReadS b) → ReadS [b] → Int → ReadS (Const a b) # liftReadList2 ∷ (Int → ReadS a) → ReadS [a] → (Int → ReadS b) → ReadS [b] → ReadS [Const a b] # liftReadPrec2 ∷ ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec (Const a b) # liftReadListPrec2 ∷ ReadPrec a → ReadPrec [a] → ReadPrec b → ReadPrec [b] → ReadPrec [Const a b] # | |
Show2 (Const ∷ Type → Type → Type) | Since: base-4.9.0.0 |
FromJSON2 (Const ∷ Type → Type → Type) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON2 ∷ (Value → Parser a) → (Value → Parser [a]) → (Value → Parser b) → (Value → Parser [b]) → Value → Parser (Const a b) liftParseJSONList2 ∷ (Value → Parser a) → (Value → Parser [a]) → (Value → Parser b) → (Value → Parser [b]) → Value → Parser [Const a b] | |
ToJSON2 (Const ∷ Type → Type → Type) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → Const a b → Value liftToJSONList2 ∷ (a → Value) → ([a] → Value) → (b → Value) → ([b] → Value) → [Const a b] → Value liftToEncoding2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → Const a b → Encoding liftToEncodingList2 ∷ (a → Encoding) → ([a] → Encoding) → (b → Encoding) → ([b] → Encoding) → [Const a b] → Encoding | |
Biapplicative (Const ∷ Type → Type → Type) | |
Hashable2 (Const ∷ Type → Type → Type) | |
Defined in Data.Hashable.Class | |
Functor (Const m ∷ Type → Type) | Since: base-2.1 |
Monoid m ⇒ Applicative (Const m ∷ Type → Type) | Since: base-2.0.1 |
Foldable (Const m ∷ Type → Type) | Since: base-4.7.0.0 |
Defined in Data.Functor.Const Methods fold ∷ Monoid m0 ⇒ Const m m0 → m0 # foldMap ∷ Monoid m0 ⇒ (a → m0) → Const m a → m0 # foldMap' ∷ Monoid m0 ⇒ (a → m0) → Const m a → m0 # foldr ∷ (a → b → b) → b → Const m a → b # foldr' ∷ (a → b → b) → b → Const m a → b # foldl ∷ (b → a → b) → b → Const m a → b # foldl' ∷ (b → a → b) → b → Const m a → b # foldr1 ∷ (a → a → a) → Const m a → a # foldl1 ∷ (a → a → a) → Const m a → a # elem ∷ Eq a ⇒ a → Const m a → Bool # maximum ∷ Ord a ⇒ Const m a → a # | |
Traversable (Const m ∷ Type → Type) | Since: base-4.7.0.0 |
Contravariant (Const a ∷ Type → Type) | |
Eq a ⇒ Eq1 (Const a ∷ Type → Type) | Since: base-4.9.0.0 |
Ord a ⇒ Ord1 (Const a ∷ Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Read a ⇒ Read1 (Const a ∷ Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Show a ⇒ Show1 (Const a ∷ Type → Type) | Since: base-4.9.0.0 |
Hashable a ⇒ Hashable1 (Const a ∷ Type → Type) | |
Defined in Data.Hashable.Class | |
FromJSON a ⇒ FromJSON1 (Const a ∷ Type → Type) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON ∷ (Value → Parser a0) → (Value → Parser [a0]) → Value → Parser (Const a a0) liftParseJSONList ∷ (Value → Parser a0) → (Value → Parser [a0]) → Value → Parser [Const a a0] | |
ToJSON a ⇒ ToJSON1 (Const a ∷ Type → Type) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON ∷ (a0 → Value) → ([a0] → Value) → Const a a0 → Value liftToJSONList ∷ (a0 → Value) → ([a0] → Value) → [Const a a0] → Value liftToEncoding ∷ (a0 → Encoding) → ([a0] → Encoding) → Const a a0 → Encoding liftToEncodingList ∷ (a0 → Encoding) → ([a0] → Encoding) → [Const a a0] → Encoding | |
Filterable (Const r ∷ Type → Type) | |
Witherable (Const r ∷ Type → Type) | |
Defined in Witherable | |
Bounded a ⇒ Bounded (Const a b) | Since: base-4.9.0.0 |
Enum a ⇒ Enum (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const | |
Eq a ⇒ Eq (Const a b) | Since: base-4.9.0.0 |
Floating a ⇒ Floating (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods sqrt ∷ Const a b → Const a b # (**) ∷ Const a b → Const a b → Const a b # logBase ∷ Const a b → Const a b → Const a b # asin ∷ Const a b → Const a b # acos ∷ Const a b → Const a b # atan ∷ Const a b → Const a b # sinh ∷ Const a b → Const a b # cosh ∷ Const a b → Const a b # tanh ∷ Const a b → Const a b # asinh ∷ Const a b → Const a b # acosh ∷ Const a b → Const a b # atanh ∷ Const a b → Const a b # log1p ∷ Const a b → Const a b # expm1 ∷ Const a b → Const a b # | |
Fractional a ⇒ Fractional (Const a b) | Since: base-4.9.0.0 |
Integral a ⇒ Integral (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const | |
Num a ⇒ Num (Const a b) | Since: base-4.9.0.0 |
Ord a ⇒ Ord (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const | |
Read a ⇒ Read (Const a b) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Real a ⇒ Real (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods toRational ∷ Const a b → Rational # | |
RealFloat a ⇒ RealFloat (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods floatRadix ∷ Const a b → Integer # floatDigits ∷ Const a b → Int # floatRange ∷ Const a b → (Int, Int) # decodeFloat ∷ Const a b → (Integer, Int) # encodeFloat ∷ Integer → Int → Const a b # significand ∷ Const a b → Const a b # scaleFloat ∷ Int → Const a b → Const a b # isInfinite ∷ Const a b → Bool # isDenormalized ∷ Const a b → Bool # isNegativeZero ∷ Const a b → Bool # | |
RealFrac a ⇒ RealFrac (Const a b) | Since: base-4.9.0.0 |
Show a ⇒ Show (Const a b) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Ix a ⇒ Ix (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods range ∷ (Const a b, Const a b) → [Const a b] # index ∷ (Const a b, Const a b) → Const a b → Int # unsafeIndex ∷ (Const a b, Const a b) → Const a b → Int # inRange ∷ (Const a b, Const a b) → Const a b → Bool # rangeSize ∷ (Const a b, Const a b) → Int # unsafeRangeSize ∷ (Const a b, Const a b) → Int # | |
IsString a ⇒ IsString (Const a b) | Since: base-4.9.0.0 |
Defined in Data.String Methods fromString ∷ String → Const a b # | |
Generic (Const a b) | Since: base-4.9.0.0 |
Semigroup a ⇒ Semigroup (Const a b) | Since: base-4.9.0.0 |
Monoid a ⇒ Monoid (Const a b) | Since: base-4.9.0.0 |
Storable a ⇒ Storable (Const a b) | Since: base-4.9.0.0 |
Bits a ⇒ Bits (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods (.&.) ∷ Const a b → Const a b → Const a b # (.|.) ∷ Const a b → Const a b → Const a b # xor ∷ Const a b → Const a b → Const a b # complement ∷ Const a b → Const a b # shift ∷ Const a b → Int → Const a b # rotate ∷ Const a b → Int → Const a b # setBit ∷ Const a b → Int → Const a b # clearBit ∷ Const a b → Int → Const a b # complementBit ∷ Const a b → Int → Const a b # testBit ∷ Const a b → Int → Bool # bitSizeMaybe ∷ Const a b → Maybe Int # shiftL ∷ Const a b → Int → Const a b # unsafeShiftL ∷ Const a b → Int → Const a b # shiftR ∷ Const a b → Int → Const a b # unsafeShiftR ∷ Const a b → Int → Const a b # rotateL ∷ Const a b → Int → Const a b # | |
FiniteBits a ⇒ FiniteBits (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods finiteBitSize ∷ Const a b → Int # countLeadingZeros ∷ Const a b → Int # countTrailingZeros ∷ Const a b → Int # | |
FromJSON a ⇒ FromJSON (Const a b) | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON a ⇒ ToJSON (Const a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Const a b → Encoding # toJSONList ∷ [Const a b] → Value # toEncodingList ∷ [Const a b] → Encoding # | |
Serialise a ⇒ Serialise (Const a b) | |
Defined in Codec.Serialise.Class Methods decode ∷ Decoder s (Const a b) encodeList ∷ [Const a b] → Encoding decodeList ∷ Decoder s [Const a b] | |
(ToJSON a, ToJSONKey a) ⇒ ToJSONKey (Const a b) | |
Defined in Data.Aeson.Types.ToJSON | |
(FromJSON a, FromJSONKey a) ⇒ FromJSONKey (Const a b) | |
Defined in Data.Aeson.Types.FromJSON Methods fromJSONKey ∷ FromJSONKeyFunction (Const a b) fromJSONKeyList ∷ FromJSONKeyFunction [Const a b] | |
ToField a ⇒ ToField (Const a b) | |
Defined in Data.Csv.Conversion | |
Pretty a ⇒ Pretty (Const a b) | |
Defined in Prettyprinter.Internal | |
Hashable a ⇒ Hashable (Const a b) | |
Defined in Data.Hashable.Class | |
Unbox a ⇒ Unbox (Const a b) | |
Defined in Data.Vector.Unboxed.Base | |
Prim a ⇒ Prim (Const a b) | |
Defined in Data.Primitive.Types Methods alignment# ∷ Const a b → Int# indexByteArray# ∷ ByteArray# → Int# → Const a b readByteArray# ∷ MutableByteArray# s → Int# → State# s → (# State# s, Const a b #) writeByteArray# ∷ MutableByteArray# s → Int# → Const a b → State# s → State# s setByteArray# ∷ MutableByteArray# s → Int# → Int# → Const a b → State# s → State# s indexOffAddr# ∷ Addr# → Int# → Const a b readOffAddr# ∷ Addr# → Int# → State# s → (# State# s, Const a b #) writeOffAddr# ∷ Addr# → Int# → Const a b → State# s → State# s setOffAddr# ∷ Addr# → Int# → Int# → Const a b → State# s → State# s | |
FromHttpApiData a ⇒ FromHttpApiData (Const a b) | |
Defined in Web.Internal.HttpApiData Methods parseUrlPiece ∷ Text → Either Text (Const a b) parseHeader ∷ ByteString → Either Text (Const a b) parseQueryParam ∷ Text → Either Text (Const a b) | |
ToHttpApiData a ⇒ ToHttpApiData (Const a b) | |
Defined in Web.Internal.HttpApiData Methods toUrlPiece ∷ Const a b → Text toEncodedUrlPiece ∷ Const a b → Builder toHeader ∷ Const a b → ByteString toQueryParam ∷ Const a b → Text | |
Wrapped (Const a x) | |
Defined in Control.Lens.Wrapped Associated Types type Unwrapped (Const a x) | |
MonoFoldable (Const m a) | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m0 ⇒ (Element (Const m a) → m0) → Const m a → m0 ofoldr ∷ (Element (Const m a) → b → b) → b → Const m a → b ofoldl' ∷ (a0 → Element (Const m a) → a0) → a0 → Const m a → a0 otoList ∷ Const m a → [Element (Const m a)] oall ∷ (Element (Const m a) → Bool) → Const m a → Bool oany ∷ (Element (Const m a) → Bool) → Const m a → Bool ocompareLength ∷ Integral i ⇒ Const m a → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element (Const m a) → f b) → Const m a → f () ofor_ ∷ Applicative f ⇒ Const m a → (Element (Const m a) → f b) → f () omapM_ ∷ Applicative m0 ⇒ (Element (Const m a) → m0 ()) → Const m a → m0 () oforM_ ∷ Applicative m0 ⇒ Const m a → (Element (Const m a) → m0 ()) → m0 () ofoldlM ∷ Monad m0 ⇒ (a0 → Element (Const m a) → m0 a0) → a0 → Const m a → m0 a0 ofoldMap1Ex ∷ Semigroup m0 ⇒ (Element (Const m a) → m0) → Const m a → m0 ofoldr1Ex ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a) ofoldl1Ex' ∷ (Element (Const m a) → Element (Const m a) → Element (Const m a)) → Const m a → Element (Const m a) headEx ∷ Const m a → Element (Const m a) lastEx ∷ Const m a → Element (Const m a) unsafeHead ∷ Const m a → Element (Const m a) unsafeLast ∷ Const m a → Element (Const m a) maximumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a) minimumByEx ∷ (Element (Const m a) → Element (Const m a) → Ordering) → Const m a → Element (Const m a) | |
MonoTraversable (Const m a) | |
Defined in Data.MonoTraversable | |
MonoFunctor (Const m a) | |
Monoid m ⇒ MonoPointed (Const m a) | |
Defined in Data.MonoTraversable | |
FromField a ⇒ FromField (Const a b) | |
Defined in Data.Csv.Conversion Methods parseField ∷ Field → Parser (Const a b) | |
FromFormKey a ⇒ FromFormKey (Const a b) | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey ∷ Text → Either Text (Const a b) | |
ToFormKey a ⇒ ToFormKey (Const a b) | |
Defined in Web.Internal.FormUrlEncoded | |
FromField a ⇒ FromField (Const a b) | |
Defined in Database.PostgreSQL.Simple.FromField | |
ToField a ⇒ ToField (Const a b) | |
Defined in Database.PostgreSQL.Simple.ToField | |
t ~ Const a' x' ⇒ Rewrapped (Const a x) t | |
Defined in Control.Lens.Wrapped | |
type AllB (c ∷ k → Constraint) (Const a ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.ConstraintsB | |
type Rep1 (Const a ∷ k → Type) | |
Defined in Data.Functor.Const | |
newtype MVector s (Const a b) | |
Defined in Data.Vector.Unboxed.Base | |
type Rep (Const a b) | |
Defined in Data.Functor.Const | |
type Element (Const m a) | |
Defined in Data.MonoTraversable type Element (Const m a) = a | |
newtype Vector (Const a b) | |
Defined in Data.Vector.Unboxed.Base | |
type Unwrapped (Const a x) | |
Defined in Control.Lens.Wrapped type Unwrapped (Const a x) = a | |
type Code (Const a b) | |
Defined in Generics.SOP.Instances type Code (Const a b) = '['[a]] | |
type DatatypeInfoOf (Const a b) | |
Defined in Generics.SOP.Instances type DatatypeInfoOf (Const a b) = 'Newtype "Data.Functor.Const" "Const" ('Record "Const" '['FieldInfo "getConst"]) |
minimumBy ∷ Foldable t ⇒ (a → a → Ordering) → t a → a #
The least element of a non-empty structure with respect to the given comparison function.
maximumBy ∷ Foldable t ⇒ (a → a → Ordering) → t a → a #
The largest element of a non-empty structure with respect to the given comparison function.
fromRight ∷ b → Either a b → b #
Return the contents of a Right
-value or a default value otherwise.
Examples
Basic usage:
>>>
fromRight 1 (Right 3)
3>>>
fromRight 1 (Left "foo")
1
Since: base-4.10.0.0
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,
is a safer alternative to the
Proxy
:: Proxy
a
idiom.undefined
:: a
>>>
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
Generic1 (Proxy ∷ k → Type) | Since: base-4.6.0.0 |
ConstraintsB (Proxy ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.ConstraintsB Associated Types type AllB c Proxy | |
FunctorB (Proxy ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.FunctorB | |
ApplicativeB (Proxy ∷ (k → Type) → Type) | |
TraversableB (Proxy ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.TraversableB Methods btraverse ∷ Applicative e ⇒ (∀ (a ∷ k0). f a → e (g a)) → Proxy f → e (Proxy g) | |
DistributiveB (Proxy ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.DistributiveB | |
FoldableWithIndex Void (Proxy ∷ Type → Type) | |
Defined in WithIndex | |
FunctorWithIndex Void (Proxy ∷ Type → Type) | |
TraversableWithIndex Void (Proxy ∷ Type → Type) | |
FilterableWithIndex Void (Proxy ∷ Type → Type) | |
WitherableWithIndex Void (Proxy ∷ Type → Type) | |
Monad (Proxy ∷ Type → Type) | Since: base-4.7.0.0 |
Functor (Proxy ∷ Type → Type) | Since: base-4.7.0.0 |
Applicative (Proxy ∷ Type → Type) | Since: base-4.7.0.0 |
Foldable (Proxy ∷ Type → Type) | Since: base-4.7.0.0 |
Defined in Data.Foldable Methods fold ∷ Monoid m ⇒ Proxy m → m # foldMap ∷ Monoid m ⇒ (a → m) → Proxy a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Proxy a → m # foldr ∷ (a → b → b) → b → Proxy a → b # foldr' ∷ (a → b → b) → b → Proxy a → b # foldl ∷ (b → a → b) → b → Proxy a → b # foldl' ∷ (b → a → b) → b → Proxy a → b # foldr1 ∷ (a → a → a) → Proxy a → a # foldl1 ∷ (a → a → a) → Proxy a → a # elem ∷ Eq a ⇒ a → Proxy a → Bool # maximum ∷ Ord a ⇒ Proxy a → a # | |
Traversable (Proxy ∷ Type → Type) | Since: base-4.7.0.0 |
Contravariant (Proxy ∷ Type → Type) | |
Eq1 (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
Ord1 (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Read1 (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Show1 (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
Alternative (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
MonadPlus (Proxy ∷ Type → Type) | Since: base-4.9.0.0 |
Hashable1 (Proxy ∷ Type → Type) | |
Defined in Data.Hashable.Class | |
FromJSON1 (Proxy ∷ Type → Type) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Proxy a) liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Proxy a] | |
ToJSON1 (Proxy ∷ Type → Type) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON ∷ (a → Value) → ([a] → Value) → Proxy a → Value liftToJSONList ∷ (a → Value) → ([a] → Value) → [Proxy a] → Value liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Proxy a → Encoding liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Proxy a] → Encoding | |
Filterable (Proxy ∷ Type → Type) | |
Witherable (Proxy ∷ Type → Type) | |
Representable (Proxy ∷ Type → Type) | |
Bounded (Proxy t) | Since: base-4.7.0.0 |
Enum (Proxy s) | Since: base-4.7.0.0 |
Defined in Data.Proxy | |
Eq (Proxy s) | Since: base-4.7.0.0 |
Ord (Proxy s) | Since: base-4.7.0.0 |
Read (Proxy t) | Since: base-4.7.0.0 |
Show (Proxy s) | Since: base-4.7.0.0 |
Ix (Proxy s) | Since: base-4.7.0.0 |
Generic (Proxy t) | Since: base-4.6.0.0 |
Semigroup (Proxy s) | Since: base-4.9.0.0 |
Monoid (Proxy s) | Since: base-4.7.0.0 |
FromJSON (Proxy a) | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON (Proxy a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Proxy a → Encoding # toJSONList ∷ [Proxy a] → Value # toEncodingList ∷ [Proxy a] → Encoding # | |
Serialise (Proxy a) | |
Defined in Codec.Serialise.Class | |
Hashable (Proxy a) | |
Defined in Data.Hashable.Class | |
MonoFoldable (Proxy a) | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m ⇒ (Element (Proxy a) → m) → Proxy a → m ofoldr ∷ (Element (Proxy a) → b → b) → b → Proxy a → b ofoldl' ∷ (a0 → Element (Proxy a) → a0) → a0 → Proxy a → a0 otoList ∷ Proxy a → [Element (Proxy a)] oall ∷ (Element (Proxy a) → Bool) → Proxy a → Bool oany ∷ (Element (Proxy a) → Bool) → Proxy a → Bool ocompareLength ∷ Integral i ⇒ Proxy a → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element (Proxy a) → f b) → Proxy a → f () ofor_ ∷ Applicative f ⇒ Proxy a → (Element (Proxy a) → f b) → f () omapM_ ∷ Applicative m ⇒ (Element (Proxy a) → m ()) → Proxy a → m () oforM_ ∷ Applicative m ⇒ Proxy a → (Element (Proxy a) → m ()) → m () ofoldlM ∷ Monad m ⇒ (a0 → Element (Proxy a) → m a0) → a0 → Proxy a → m a0 ofoldMap1Ex ∷ Semigroup m ⇒ (Element (Proxy a) → m) → Proxy a → m ofoldr1Ex ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a) ofoldl1Ex' ∷ (Element (Proxy a) → Element (Proxy a) → Element (Proxy a)) → Proxy a → Element (Proxy a) headEx ∷ Proxy a → Element (Proxy a) lastEx ∷ Proxy a → Element (Proxy a) unsafeHead ∷ Proxy a → Element (Proxy a) unsafeLast ∷ Proxy a → Element (Proxy a) maximumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a) minimumByEx ∷ (Element (Proxy a) → Element (Proxy a) → Ordering) → Proxy a → Element (Proxy a) | |
MonoTraversable (Proxy a) | |
Defined in Data.MonoTraversable | |
MonoFunctor (Proxy a) | |
MonoPointed (Proxy a) | |
Defined in Data.MonoTraversable | |
type AllB (c ∷ k → Constraint) (Proxy ∷ (k → Type) → Type) | |
Defined in Barbies.Internal.ConstraintsB | |
type Rep1 (Proxy ∷ k → Type) | |
type Rep (Proxy ∷ Type → Type) | |
Defined in Data.Functor.Rep | |
type Rep (Proxy t) | |
type Element (Proxy a) | |
Defined in Data.MonoTraversable type Element (Proxy a) = a | |
type Code (Proxy t) | |
Defined in Generics.SOP.Instances | |
type DatatypeInfoOf (Proxy t) | |
Defined in Generics.SOP.Instances type DatatypeInfoOf (Proxy t) = 'ADT "Data.Proxy" "Proxy" '['Constructor "Proxy"] '['[] ∷ [StrictnessInfo]] |
data (a ∷ k) :~: (b ∷ k) where infix 4 #
Propositional equality. If a :~: b
is inhabited by some terminating
value, then the type a
is the same as the type b
. To use this equality
in practice, pattern-match on the a :~: b
to get out the Refl
constructor;
in the body of the pattern-match, the compiler knows that a ~ b
.
Since: base-4.7.0.0
Instances
TestEquality ((:~:) a ∷ k → Type) | Since: base-4.7.0.0 |
Defined in Data.Type.Equality | |
GShow ((:~:) a ∷ k → Type) | |
Defined in Data.GADT.Internal Methods gshowsPrec ∷ ∀ (a0 ∷ k0). Int → (a :~: a0) → ShowS | |
GEq ((:~:) a ∷ k → Type) | |
GCompare ((:~:) a ∷ k → Type) | |
Defined in Data.GADT.Internal | |
GRead ((:~:) a ∷ k → Type) | |
Defined in Data.GADT.Internal Methods greadsPrec ∷ Int → GReadS ((:~:) a) | |
a ~ b ⇒ Bounded (a :~: b) | Since: base-4.7.0.0 |
a ~ b ⇒ Enum (a :~: b) | Since: base-4.7.0.0 |
Eq (a :~: b) | Since: base-4.7.0.0 |
Ord (a :~: b) | Since: base-4.7.0.0 |
Defined in Data.Type.Equality | |
a ~ b ⇒ Read (a :~: b) | Since: base-4.7.0.0 |
Show (a :~: b) | Since: base-4.7.0.0 |
isAlphaNum ∷ Char → Bool #
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.
isHexDigit ∷ Char → Bool #
Selects ASCII hexadecimal digits,
i.e. '0'
..'9'
, 'a'
..'f'
, 'A'
..'F'
.
The fromMaybe
function takes a default value and and Maybe
value. If the Maybe
is Nothing
, it returns the default values;
otherwise, it returns the value contained in the Maybe
.
Examples
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
void ∷ Functor f ⇒ f a → f () #
discards or ignores the result of evaluation, such
as the return value of an void
valueIO
action.
Using ApplicativeDo
: '
' can be understood as the
void
asdo
expression
do as pure ()
with an inferred Functor
constraint.
Examples
Replace the contents of a
with unit:Maybe
Int
>>>
void Nothing
Nothing>>>
void (Just 3)
Just ()
Replace the contents of an
with unit, resulting in an Either
Int
Int
: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
when ∷ Applicative f ⇒ Bool → f () → f () #
Conditional execution of Applicative
expressions. For example,
when debug (putStrLn "Debugging")
will output the string Debugging
if the Boolean value debug
is True
, and otherwise do nothing.
type HasCallStack = ?callStack ∷ CallStack #
Request a CallStack.
NOTE: The implicit parameter ?callStack :: CallStack
is an
implementation detail and should not be considered part of the
CallStack
API, we may decide to change the implementation in the
future.
Since: base-4.9.0.0
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
Bifoldable Map | Since: containers-0.6.3.1 |
Eq2 Map | Since: containers-0.5.9 |
Ord2 Map | Since: containers-0.5.9 |
Defined in Data.Map.Internal | |
Show2 Map | Since: containers-0.5.9 |
BiPolyMap Map | |
Defined in Data.Containers Associated Types type BPMKeyConstraint Map key Methods mapKeysWith ∷ (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) ⇒ (v → v → v) → (k1 → k2) → Map k1 v → Map k2 v | |
Hashable2 Map | |
Defined in Data.Hashable.Class | |
(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (Tx era) (Map (ScriptHash c) script) | |
Defined in Cardano.Ledger.Shelley.Tx | |
(c ~ Crypto era, script ~ Script era, Witnesses era ~ WitnessSet era) ⇒ HasField "scriptWits" (WitnessSet era) (Map (ScriptHash c) script) | |
Defined in Cardano.Ledger.Shelley.Tx | |
(c ~ Crypto era, script ~ Script era) ⇒ HasField "scriptWits" (ValidatedTx era) (Map (ScriptHash c) script) | |
Defined in Cardano.Ledger.Alonzo.Tx | |
(Script era ~ script, Crypto era ~ crypto) ⇒ HasField "scriptWits" (TxWitness era) (Map (ScriptHash crypto) script) | |
Defined in Cardano.Ledger.Alonzo.TxWitness | |
c ~ Crypto era ⇒ HasField "txdatahash" (ValidatedTx era) (Map (DataHash c) (Data era)) | |
Defined in Cardano.Ledger.Alonzo.Tx | |
(Script era ~ script, Crypto era ~ crypto) ⇒ HasField "txscripts" (TxWitness era) (Map (ScriptHash crypto) script) | |
Defined in Cardano.Ledger.Alonzo.TxWitness | |
FoldableWithIndex k (Map k) | |
FunctorWithIndex k (Map k) | |
TraversableWithIndex k (Map k) | |
Defined in WithIndex Methods itraverse ∷ Applicative f ⇒ (k → a → f b) → Map k a → f (Map k b) | |
FilterableWithIndex k (Map k) | |
WitherableWithIndex k (Map k) | |
Ord k ⇒ Indexable k (Map k v) | |
Functor (Map k) | |
Foldable (Map k) | Folds in order of increasing key. |
Defined in Data.Map.Internal Methods fold ∷ Monoid m ⇒ Map k m → m # foldMap ∷ Monoid m ⇒ (a → m) → Map k a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Map k a → m # foldr ∷ (a → b → b) → b → Map k a → b # foldr' ∷ (a → b → b) → b → Map k a → b # foldl ∷ (b → a → b) → b → Map k a → b # foldl' ∷ (b → a → b) → b → Map k a → b # foldr1 ∷ (a → a → a) → Map k a → a # foldl1 ∷ (a → a → a) → Map k a → a # elem ∷ Eq a ⇒ a → Map k a → Bool # maximum ∷ Ord a ⇒ Map k a → a # | |
Traversable (Map k) | Traverses in order of increasing key. |
Eq k ⇒ Eq1 (Map k) | Since: containers-0.5.9 |
Ord k ⇒ Ord1 (Map k) | Since: containers-0.5.9 |
Defined in Data.Map.Internal | |
(Ord k, Read k) ⇒ Read1 (Map k) | Since: containers-0.5.9 |
Show k ⇒ Show1 (Map k) | Since: containers-0.5.9 |
Hashable k ⇒ Hashable1 (Map k) | |
Defined in Data.Hashable.Class | |
(FromJSONKey k, Ord k) ⇒ FromJSON1 (Map k) | |
Defined in Data.Aeson.Types.FromJSON Methods liftParseJSON ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser (Map k a) liftParseJSONList ∷ (Value → Parser a) → (Value → Parser [a]) → Value → Parser [Map k a] | |
ToJSONKey k ⇒ ToJSON1 (Map k) | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON ∷ (a → Value) → ([a] → Value) → Map k a → Value liftToJSONList ∷ (a → Value) → ([a] → Value) → [Map k a] → Value liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Map k a → Encoding liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Map k a] → Encoding | |
Filterable (Map k) | |
Witherable (Map k) | |
Ord key ⇒ PolyMap (Map key) | |
Defined in Data.Containers Methods differenceMap ∷ Map key value1 → Map key value2 → Map key value1 intersectionMap ∷ Map key value1 → Map key value2 → Map key value1 intersectionWithMap ∷ (value1 → value2 → value3) → Map key value1 → Map key value2 → Map key value3 | |
Embed (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) | |
Defined in Cardano.Ledger.PoolDistr | |
Embed (StakeCreds era) (Map (Credential 'Staking era) SlotNo) | |
Defined in Cardano.Ledger.Shelley.TxBody | |
HasExp (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) | |
Defined in Cardano.Ledger.PoolDistr | |
HasExp (StakeCreds era) (Map (Credential 'Staking era) SlotNo) | |
Defined in Cardano.Ledger.Shelley.TxBody | |
Ord k ⇒ IsList (Map k v) | Since: containers-0.5.6.2 |
(Eq k, Eq a) ⇒ Eq (Map k a) | |
(Data k, Data a, Ord k) ⇒ Data (Map k a) | |
Defined in Data.Map.Internal Methods gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Map k a → c (Map k a) # gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Map k a) # dataTypeOf ∷ Map k a → DataType # dataCast1 ∷ Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Map k a)) # dataCast2 ∷ Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Map k a)) # gmapT ∷ (∀ b. Data b ⇒ b → b) → Map k a → Map k a # gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r # gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Map k a → r # gmapQ ∷ (∀ d. Data d ⇒ d → u) → Map k a → [u] # gmapQi ∷ Int → (∀ d. Data d ⇒ d → u) → Map k a → u # gmapM ∷ Monad m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) # gmapMp ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) # gmapMo ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Map k a → m (Map k a) # | |
(Ord k, Ord v) ⇒ Ord (Map k v) | |
(Ord k, Read k, Read e) ⇒ Read (Map k e) | |
(Show k, Show a) ⇒ Show (Map k a) | |
Ord k ⇒ Semigroup (Map k v) | |
Ord k ⇒ Monoid (Map k v) | |
(NFData k, NFData a) ⇒ NFData (Map k a) | |
Defined in Data.Map.Internal | |
(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) | |
Defined in Data.Aeson.Types.FromJSON | |
(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Map k v → Encoding # toJSONList ∷ [Map k v] → Value # toEncodingList ∷ [Map k v] → Encoding # | |
(Ord k, FromCBOR k, FromCBOR v) ⇒ FromCBOR (Map k v) | |
(Ord k, ToCBOR k, ToCBOR v) ⇒ ToCBOR (Map k v) | |
Defined in Cardano.Binary.ToCBOR Methods encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Map k v) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Map k v] → Size | |
(NoThunks k, NoThunks v) ⇒ NoThunks (Map k v) | |
(Ord k, Serialise k, Serialise v) ⇒ Serialise (Map k v) | |
Defined in Codec.Serialise.Class | |
(Ord k, FromCBOR k, FromCBOR v) ⇒ FromSharedCBOR (Map k v) | |
(Hashable k, Hashable v) ⇒ Hashable (Map k v) | |
Defined in Data.Hashable.Class | |
(Structured k, Structured v) ⇒ Structured (Map k v) | |
Defined in Distribution.Utils.Structured | |
Ord k ⇒ At (Map k a) | |
Ord k ⇒ Ixed (Map k a) | |
Defined in Control.Lens.At | |
Ord k ⇒ Wrapped (Map k a) | |
Defined in Control.Lens.Wrapped Associated Types type Unwrapped (Map k a) | |
Ord k ⇒ HasKeysSet (Map k v) | |
Defined in Data.Containers Associated Types type KeySet (Map k v) | |
Ord key ⇒ IsMap (Map key value) | |
Defined in Data.Containers Associated Types type MapValue (Map key value) Methods lookup ∷ ContainerKey (Map key value) → Map key value → Maybe (MapValue (Map key value)) insertMap ∷ ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value deleteMap ∷ ContainerKey (Map key value) → Map key value → Map key value singletonMap ∷ ContainerKey (Map key value) → MapValue (Map key value) → Map key value mapFromList ∷ [(ContainerKey (Map key value), MapValue (Map key value))] → Map key value mapToList ∷ Map key value → [(ContainerKey (Map key value), MapValue (Map key value))] findWithDefault ∷ MapValue (Map key value) → ContainerKey (Map key value) → Map key value → MapValue (Map key value) insertWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value insertWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → Map key value insertLookupWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → MapValue (Map key value) → Map key value → (Maybe (MapValue (Map key value)), Map key value) adjustMap ∷ (MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value adjustWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → ContainerKey (Map key value) → Map key value → Map key value updateMap ∷ (MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value updateWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value updateLookupWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → (Maybe (MapValue (Map key value)), Map key value) alterMap ∷ (Maybe (MapValue (Map key value)) → Maybe (MapValue (Map key value))) → ContainerKey (Map key value) → Map key value → Map key value unionWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value → Map key value unionWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value → Map key value unionsWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → [Map key value] → Map key value mapWithKey ∷ (ContainerKey (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → Map key value → Map key value omapKeysWith ∷ (MapValue (Map key value) → MapValue (Map key value) → MapValue (Map key value)) → (ContainerKey (Map key value) → ContainerKey (Map key value)) → Map key value → Map key value filterMap ∷ (MapValue (Map key value) → Bool) → Map key value → Map key value | |
Ord k ⇒ SetContainer (Map k v) | |
Defined in Data.Containers Associated Types type ContainerKey (Map k v) | |
MonoFoldable (Map k v) | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m ⇒ (Element (Map k v) → m) → Map k v → m ofoldr ∷ (Element (Map k v) → b → b) → b → Map k v → b ofoldl' ∷ (a → Element (Map k v) → a) → a → Map k v → a otoList ∷ Map k v → [Element (Map k v)] oall ∷ (Element (Map k v) → Bool) → Map k v → Bool oany ∷ (Element (Map k v) → Bool) → Map k v → Bool ocompareLength ∷ Integral i ⇒ Map k v → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element (Map k v) → f b) → Map k v → f () ofor_ ∷ Applicative f ⇒ Map k v → (Element (Map k v) → f b) → f () omapM_ ∷ Applicative m ⇒ (Element (Map k v) → m ()) → Map k v → m () oforM_ ∷ Applicative m ⇒ Map k v → (Element (Map k v) → m ()) → m () ofoldlM ∷ Monad m ⇒ (a → Element (Map k v) → m a) → a → Map k v → m a ofoldMap1Ex ∷ Semigroup m ⇒ (Element (Map k v) → m) → Map k v → m ofoldr1Ex ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v) ofoldl1Ex' ∷ (Element (Map k v) → Element (Map k v) → Element (Map k v)) → Map k v → Element (Map k v) headEx ∷ Map k v → Element (Map k v) lastEx ∷ Map k v → Element (Map k v) unsafeHead ∷ Map k v → Element (Map k v) unsafeLast ∷ Map k v → Element (Map k v) maximumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v) minimumByEx ∷ (Element (Map k v) → Element (Map k v) → Ordering) → Map k v → Element (Map k v) | |
MonoTraversable (Map k v) | |
Defined in Data.MonoTraversable | |
MonoFunctor (Map k v) | |
Ord k ⇒ GrowingAppend (Map k v) | |
Defined in Data.MonoTraversable | |
(Ord k, FromFormKey k, FromHttpApiData v) ⇒ FromForm (Map k [v]) | |
Defined in Web.Internal.FormUrlEncoded | |
(ToFormKey k, ToHttpApiData v) ⇒ ToForm (Map k [v]) | |
Defined in Web.Internal.FormUrlEncoded | |
(FromField a, FromField b, Ord a) ⇒ FromNamedRecord (Map a b) | |
Defined in Data.Csv.Conversion Methods parseNamedRecord ∷ NamedRecord → Parser (Map a b) | |
(ToField a, ToField b, Ord a) ⇒ ToNamedRecord (Map a b) | |
Defined in Data.Csv.Conversion Methods toNamedRecord ∷ Map a b → NamedRecord | |
(ToJSONKey k, ToSchema k, ToSchema v) ⇒ ToSchema (Map k v) | |
Defined in Data.Swagger.Internal.Schema Methods declareNamedSchema ∷ Proxy (Map k v) → Declare (Definitions Schema) NamedSchema | |
Ord k ⇒ At (Map k a) | |
Ord k ⇒ Ixed (Map k a) | |
(t ~ Map k' a', Ord k) ⇒ Rewrapped (Map k a) t | |
Defined in Control.Lens.Wrapped | |
Ord k ⇒ Rewrapped (Map k a) (MonoidalMap k a) | |
Defined in Data.Map.Monoidal | |
Ord k ⇒ Rewrapped (MonoidalMap k a) (Map k a) | |
Defined in Data.Map.Monoidal | |
Newtype (MonoidalMap k a) (Map k a) | |
Defined in Data.Map.Monoidal | |
type BPMKeyConstraint Map key | |
Defined in Data.Containers | |
type Item (Map k v) | |
Defined in Data.Map.Internal | |
type Share (Map k v) | |
type Element (Map k v) | |
Defined in Data.MonoTraversable type Element (Map k v) = v | |
type ContainerKey (Map k v) | |
Defined in Data.Containers type ContainerKey (Map k v) = k | |
type MapValue (Map key value) | |
Defined in Data.Containers type MapValue (Map key value) = value | |
type Index (Map k a) | |
Defined in Control.Lens.At type Index (Map k a) = k | |
type IxValue (Map k a) | |
Defined in Control.Lens.At type IxValue (Map k a) = a | |
type Unwrapped (Map k a) | |
Defined in Control.Lens.Wrapped type Unwrapped (Map k a) = [(k, a)] | |
type KeySet (Map k v) | |
Defined in Data.Containers | |
type Index (Map k a) | |
Defined in Optics.At.Core type Index (Map k a) = k | |
type IxValue (Map k a) | |
Defined in Optics.At.Core type IxValue (Map k a) = a | |
type IxKind (Map k a) | |
Defined in Optics.At.Core type IxKind (Map k a) = An_AffineTraversal |
A set of values a
.
Instances
Foldable Set | Folds in order of increasing key. |
Defined in Data.Set.Internal Methods foldMap ∷ Monoid m ⇒ (a → m) → Set a → m # foldMap' ∷ Monoid m ⇒ (a → m) → Set a → m # foldr ∷ (a → b → b) → b → Set a → b # foldr' ∷ (a → b → b) → b → Set a → b # foldl ∷ (b → a → b) → b → Set a → b # foldl' ∷ (b → a → b) → b → Set a → b # foldr1 ∷ (a → a → a) → Set a → a # foldl1 ∷ (a → a → a) → Set a → a # | |
Eq1 Set | Since: containers-0.5.9 |
Ord1 Set | Since: containers-0.5.9 |
Defined in Data.Set.Internal | |
Show1 Set | Since: containers-0.5.9 |
Hashable1 Set | |
Defined in Data.Hashable.Class | |
ToJSON1 Set | |
Defined in Data.Aeson.Types.ToJSON Methods liftToJSON ∷ (a → Value) → ([a] → Value) → Set a → Value liftToJSONList ∷ (a → Value) → ([a] → Value) → [Set a] → Value liftToEncoding ∷ (a → Encoding) → ([a] → Encoding) → Set a → Encoding liftToEncodingList ∷ (a → Encoding) → ([a] → Encoding) → [Set a] → Encoding | |
(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (Tx era) (Set (WitVKey 'Witness c)) | |
Defined in Cardano.Ledger.Shelley.Tx | |
(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "addrWits" (WitnessSet era) (Set (WitVKey 'Witness c)) | |
Defined in Cardano.Ledger.Shelley.Tx | |
c ~ Crypto era ⇒ HasField "addrWits" (ValidatedTx era) (Set (WitVKey 'Witness c)) | |
Defined in Cardano.Ledger.Alonzo.Tx | |
Crypto era ~ crypto ⇒ HasField "addrWits" (TxWitness era) (Set (WitVKey 'Witness crypto)) | |
Defined in Cardano.Ledger.Alonzo.TxWitness | |
(c ~ Crypto era, Witnesses era ~ WitnessSet era) ⇒ HasField "bootWits" (Tx era) (Set (BootstrapWitness c)) | |
Defined in Cardano.Ledger.Shelley.Tx | |
c ~ Crypto era ⇒ HasField "bootWits" (ValidatedTx era) (Set (BootstrapWitness c)) | |
Defined in Cardano.Ledger.Alonzo.Tx | |
Crypto era ~ c ⇒ HasField "collateral" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Alonzo.TxBody | |
Crypto era ~ c ⇒ HasField "collateral" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Babbage.TxBody | |
Crypto era ~ crypto ⇒ HasField "inputs" (TxBody era) (Set (TxIn crypto)) | |
Defined in Cardano.Ledger.ShelleyMA.TxBody | |
Crypto era ~ crypto ⇒ HasField "inputs" (TxBody era) (Set (TxIn crypto)) | |
Defined in Cardano.Ledger.Shelley.TxBody | |
Crypto era ~ c ⇒ HasField "inputs" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Alonzo.TxBody | |
Crypto era ~ c ⇒ HasField "inputs" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Babbage.TxBody | |
MAClass ma c ⇒ HasField "minted" (TxBody (ShelleyMAEra ma c)) (Set (ScriptHash c)) | |
Defined in Cardano.Ledger.ShelleyMA | |
c ~ Crypto era ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) | |
Defined in Cardano.Ledger.Shelley.TxBody | |
Crypto era ~ c ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) | |
Defined in Cardano.Ledger.Alonzo.TxBody | |
Crypto era ~ c ⇒ HasField "minted" (TxBody era) (Set (ScriptHash c)) | |
Defined in Cardano.Ledger.Babbage.TxBody | |
Crypto era ~ crypto ⇒ HasField "referenceInputs" (TxBody era) (Set (TxIn crypto)) | |
Defined in Cardano.Ledger.Alonzo.TxBody | |
Crypto era ~ c ⇒ HasField "referenceInputs" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Babbage.TxBody | |
Crypto era ~ c ⇒ HasField "reqSignerHashes" (TxBody era) (Set (KeyHash 'Witness c)) | |
Defined in Cardano.Ledger.Alonzo.TxBody | |
Crypto era ~ c ⇒ HasField "reqSignerHashes" (TxBody era) (Set (KeyHash 'Witness c)) | |
Defined in Cardano.Ledger.Babbage.TxBody | |
c ~ Crypto era ⇒ HasField "txinputs_fee" (TxBody era) (Set (TxIn c)) | |
Defined in Cardano.Ledger.Shelley.TxBody | |
Ord k ⇒ Indexable k (Set k) | |
Ord a ⇒ IsList (Set a) | Since: containers-0.5.6.2 |
Eq a ⇒ Eq (Set a) | |
(Data a, Ord a) ⇒ Data (Set a) | |
Defined in Data.Set.Internal Methods gfoldl ∷ (∀ d b. Data d ⇒ c (d → b) → d → c b) → (∀ g. g → c g) → Set a → c (Set a) # gunfold ∷ (∀ b r. Data b ⇒ c (b → r) → c r) → (∀ r. r → c r) → Constr → c (Set a) # dataTypeOf ∷ Set a → DataType # dataCast1 ∷ Typeable t ⇒ (∀ d. Data d ⇒ c (t d)) → Maybe (c (Set a)) # dataCast2 ∷ Typeable t ⇒ (∀ d e. (Data d, Data e) ⇒ c (t d e)) → Maybe (c (Set a)) # gmapT ∷ (∀ b. Data b ⇒ b → b) → Set a → Set a # gmapQl ∷ (r → r' → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r # gmapQr ∷ ∀ r r'. (r' → r → r) → r → (∀ d. Data d ⇒ d → r') → Set a → r # gmapQ ∷ (∀ d. Data d ⇒ d → u) → Set a → [u] # gmapQi ∷ Int → (∀ d. Data d ⇒ d → u) → Set a → u # gmapM ∷ Monad m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) # gmapMp ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) # gmapMo ∷ MonadPlus m ⇒ (∀ d. Data d ⇒ d → m d) → Set a → m (Set a) # | |
Ord a ⇒ Ord (Set a) | |
(Read a, Ord a) ⇒ Read (Set a) | |
Show a ⇒ Show (Set a) | |
Ord a ⇒ Semigroup (Set a) | Since: containers-0.5.7 |
Ord a ⇒ Monoid (Set a) | |
NFData a ⇒ NFData (Set a) | |
Defined in Data.Set.Internal | |
(Ord a, FromJSON a) ⇒ FromJSON (Set a) | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON a ⇒ ToJSON (Set a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Set a → Encoding # toJSONList ∷ [Set a] → Value # toEncodingList ∷ [Set a] → Encoding # | |
(Ord a, FromCBOR a) ⇒ FromCBOR (Set a) | |
(Ord a, ToCBOR a) ⇒ ToCBOR (Set a) | |
Defined in Cardano.Binary.ToCBOR Methods encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy (Set a) → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Set a] → Size | |
NoThunks a ⇒ NoThunks (Set a) | |
(Ord a, Serialise a) ⇒ Serialise (Set a) | |
Defined in Codec.Serialise.Class | |
Hashable v ⇒ Hashable (Set v) | |
Defined in Data.Hashable.Class | |
Structured k ⇒ Structured (Set k) | |
Defined in Distribution.Utils.Structured | |
Ord k ⇒ At (Set k) | |
Ord a ⇒ Contains (Set a) | |
Defined in Control.Lens.At | |
Ord k ⇒ Ixed (Set k) | |
Defined in Control.Lens.At | |
Ord a ⇒ Wrapped (Set a) | |
Defined in Control.Lens.Wrapped Associated Types type Unwrapped (Set a) | |
Ord element ⇒ IsSet (Set element) | |
Defined in Data.Containers Methods insertSet ∷ Element (Set element) → Set element → Set element deleteSet ∷ Element (Set element) → Set element → Set element singletonSet ∷ Element (Set element) → Set element setFromList ∷ [Element (Set element)] → Set element setToList ∷ Set element → [Element (Set element)] filterSet ∷ (Element (Set element) → Bool) → Set element → Set element | |
Ord element ⇒ SetContainer (Set element) | |
Defined in Data.Containers Associated Types type ContainerKey (Set element) Methods member ∷ ContainerKey (Set element) → Set element → Bool notMember ∷ ContainerKey (Set element) → Set element → Bool union ∷ Set element → Set element → Set element unions ∷ (MonoFoldable mono, Element mono ~ Set element) ⇒ mono → Set element difference ∷ Set element → Set element → Set element intersection ∷ Set element → Set element → Set element | |
Ord e ⇒ MonoFoldable (Set e) | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m ⇒ (Element (Set e) → m) → Set e → m ofoldr ∷ (Element (Set e) → b → b) → b → Set e → b ofoldl' ∷ (a → Element (Set e) → a) → a → Set e → a otoList ∷ Set e → [Element (Set e)] oall ∷ (Element (Set e) → Bool) → Set e → Bool oany ∷ (Element (Set e) → Bool) → Set e → Bool ocompareLength ∷ Integral i ⇒ Set e → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element (Set e) → f b) → Set e → f () ofor_ ∷ Applicative f ⇒ Set e → (Element (Set e) → f b) → f () omapM_ ∷ Applicative m ⇒ (Element (Set e) → m ()) → Set e → m () oforM_ ∷ Applicative m ⇒ Set e → (Element (Set e) → m ()) → m () ofoldlM ∷ Monad m ⇒ (a → Element (Set e) → m a) → a → Set e → m a ofoldMap1Ex ∷ Semigroup m ⇒ (Element (Set e) → m) → Set e → m ofoldr1Ex ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e) ofoldl1Ex' ∷ (Element (Set e) → Element (Set e) → Element (Set e)) → Set e → Element (Set e) headEx ∷ Set e → Element (Set e) lastEx ∷ Set e → Element (Set e) unsafeHead ∷ Set e → Element (Set e) unsafeLast ∷ Set e → Element (Set e) maximumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e) minimumByEx ∷ (Element (Set e) → Element (Set e) → Ordering) → Set e → Element (Set e) | |
Ord v ⇒ GrowingAppend (Set v) | |
Defined in Data.MonoTraversable | |
MonoPointed (Set a) | |
Defined in Data.MonoTraversable | |
ToParamSchema a ⇒ ToParamSchema (Set a) | |
Defined in Data.Swagger.Internal.ParamSchema Methods toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy (Set a) → ParamSchema t | |
ToSchema a ⇒ ToSchema (Set a) | |
Defined in Data.Swagger.Internal.Schema Methods declareNamedSchema ∷ Proxy (Set a) → Declare (Definitions Schema) NamedSchema | |
Ord k ⇒ At (Set k) | |
Ord k ⇒ Ixed (Set k) | |
Ord a ⇒ Contains (Set a) | |
Defined in Optics.At.Core | |
(t ~ Set a', Ord a) ⇒ Rewrapped (Set a) t | |
Defined in Control.Lens.Wrapped | |
type Item (Set a) | |
Defined in Data.Set.Internal | |
type Element (Set e) | |
Defined in Data.MonoTraversable type Element (Set e) = e | |
type ContainerKey (Set element) | |
Defined in Data.Containers type ContainerKey (Set element) = element | |
type Index (Set a) | |
Defined in Control.Lens.At type Index (Set a) = a | |
type IxValue (Set k) | |
Defined in Control.Lens.At type IxValue (Set k) = () | |
type Unwrapped (Set a) | |
Defined in Control.Lens.Wrapped type Unwrapped (Set a) = [a] | |
type Index (Set a) | |
Defined in Optics.At.Core type Index (Set a) = a | |
type IxValue (Set k) | |
Defined in Optics.At.Core type IxValue (Set k) = () | |
type IxKind (Set k) | |
Defined in Optics.At.Core type IxKind (Set k) = An_AffineTraversal |
encodeUtf8 ∷ Text → ByteString #
Encode text using UTF-8 encoding.
A space efficient, packed, unboxed Unicode text type.
Instances
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Text → Encoding # toJSONList ∷ [Text] → Value # toEncodingList ∷ [Text] → Encoding # | |
FromCBOR Text | |
ToCBOR Text | |
Defined in Cardano.Binary.ToCBOR Methods encodedSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy Text → Size encodedListSizeExpr ∷ (∀ t. ToCBOR t ⇒ Proxy t → Size) → Proxy [Text] → Size | |
NoThunks Text | |
Serialise Text | |
Defined in Codec.Serialise.Class | |
ToJSONKey Text | |
Defined in Data.Aeson.Types.ToJSON | |
FromJSONKey Text | |
Defined in Data.Aeson.Types.FromJSON | |
ToField Text | |
Defined in Data.Csv.Conversion | |
Pretty Text | |
Defined in Prettyprinter.Internal | |
Stream Text | |
Defined in Text.Megaparsec.Stream Methods tokenToChunk ∷ Proxy Text → Token Text → Tokens Text tokensToChunk ∷ Proxy Text → [Token Text] → Tokens Text chunkToTokens ∷ Proxy Text → Tokens Text → [Token Text] chunkLength ∷ Proxy Text → Tokens Text → Int chunkEmpty ∷ Proxy Text → Tokens Text → Bool take1_ ∷ Text → Maybe (Token Text, Text) takeN_ ∷ Int → Text → Maybe (Tokens Text, Text) takeWhile_ ∷ (Token Text → Bool) → Text → (Tokens Text, Text) | |
Hashable Text | |
Defined in Data.Hashable.Class | |
Buildable Text | |
Defined in Formatting.Buildable | |
Structured Text | |
Defined in Distribution.Utils.Structured | |
Chunk Text | |
Defined in Data.Attoparsec.Internal.Types Associated Types type ChunkElem Text Methods pappendChunk ∷ State Text → Text → State Text atBufferEnd ∷ Text → State Text → Pos bufferElemAt ∷ Text → Pos → State Text → Maybe (ChunkElem Text, Int) chunkElemToChar ∷ Text → ChunkElem Text → Char | |
FromHttpApiData Text | |
Defined in Web.Internal.HttpApiData | |
ToHttpApiData Text | |
Defined in Web.Internal.HttpApiData Methods toUrlPiece ∷ Text → Text toEncodedUrlPiece ∷ Text → Builder toHeader ∷ Text → ByteString toQueryParam ∷ Text → Text | |
Ixed Text | |
Defined in Control.Lens.At | |
VisualStream Text | |
Defined in Text.Megaparsec.Stream | |
TraversableStream Text | |
Defined in Text.Megaparsec.Stream Methods reachOffset ∷ Int → PosState Text → (Maybe String, PosState Text) reachOffsetNoLine ∷ Int → PosState Text → PosState Text | |
MonoZip Text | |
MonoFoldable Text | |
Defined in Data.MonoTraversable Methods ofoldMap ∷ Monoid m ⇒ (Element Text → m) → Text → m ofoldr ∷ (Element Text → b → b) → b → Text → b ofoldl' ∷ (a → Element Text → a) → a → Text → a otoList ∷ Text → [Element Text] oall ∷ (Element Text → Bool) → Text → Bool oany ∷ (Element Text → Bool) → Text → Bool ocompareLength ∷ Integral i ⇒ Text → i → Ordering otraverse_ ∷ Applicative f ⇒ (Element Text → f b) → Text → f () ofor_ ∷ Applicative f ⇒ Text → (Element Text → f b) → f () omapM_ ∷ Applicative m ⇒ (Element Text → m ()) → Text → m () oforM_ ∷ Applicative m ⇒ Text → (Element Text → m ()) → m () ofoldlM ∷ Monad m ⇒ (a → Element Text → m a) → a → Text → m a ofoldMap1Ex ∷ Semigroup m ⇒ (Element Text → m) → Text → m ofoldr1Ex ∷ (Element Text → Element Text → Element Text) → Text → Element Text ofoldl1Ex' ∷ (Element Text → Element Text → Element Text) → Text → Element Text unsafeHead ∷ Text → Element Text unsafeLast ∷ Text → Element Text maximumByEx ∷ (Element Text → Element Text → Ordering) → Text → Element Text minimumByEx ∷ (Element Text → Element Text → Ordering) → Text → Element Text | |
MonoTraversable Text | |
Defined in Data.MonoTraversable | |
MonoFunctor Text | |
GrowingAppend Text | |
Defined in Data.MonoTraversable | |
MonoPointed Text | |
Defined in Data.MonoTraversable | |
IsSequence Text | |
Defined in Data.Sequences Methods fromList ∷ [Element Text] → Text lengthIndex ∷ Text → Index Text break ∷ (Element Text → Bool) → Text → (Text, Text) span ∷ (Element Text → Bool) → Text → (Text, Text) dropWhile ∷ (Element Text → Bool) → Text → Text takeWhile ∷ (Element Text → Bool) → Text → Text splitAt ∷ Index Text → Text → (Text, Text) unsafeSplitAt ∷ Index Text → Text → (Text, Text) take ∷ Index Text → Text → Text unsafeTake ∷ Index Text → Text → Text drop ∷ Index Text → Text → Text unsafeDrop ∷ Index Text → Text → Text dropEnd ∷ Index Text → Text → Text partition ∷ (Element Text → Bool) → Text → (Text, Text) uncons ∷ Text → Maybe (Element Text, Text) unsnoc ∷ Text → Maybe (Text, Element Text) filter ∷ (Element Text → Bool) → Text → Text filterM ∷ Monad m ⇒ (Element Text → m Bool) → Text → m Text replicate ∷ Index Text → Element Text → Text replicateM ∷ Monad m ⇒ Index Text → m (Element Text) → m Text groupBy ∷ (Element Text → Element Text → Bool) → Text → [Text] groupAllOn ∷ Eq b ⇒ (Element Text → b) → Text → [Text] subsequences ∷ Text → [Text] permutations ∷ Text → [Text] unsafeTail ∷ Text → Text unsafeInit ∷ Text → Text index ∷ Text → Index Text → Maybe (Element Text) indexEx ∷ Text → Index Text → Element Text unsafeIndex ∷ Text → Index Text → Element Text | |
SemiSequence Text | |
Defined in Data.Sequences Associated Types type Index Text | |
Textual Text | |
Defined in Data.Sequences | |
FromField Text | |
Defined in Data.Csv.Conversion Methods parseField ∷ Field → Parser Text | |
ExMemoryUsage Text | |
Defined in PlutusCore.Evaluation.Machine.ExMemory Methods memoryUsage ∷ Text → ExMemory | |
Pretty Text | |
Defined in Text.PrettyPrint.Annotated.WL | |
FromFormKey Text | |
Defined in Web.Internal.FormUrlEncoded Methods parseFormKey ∷ Text → Either Text Text | |
ToFormKey Text | |
Defined in Web.Internal.FormUrlEncoded | |
FoldCase Text | |
Defined in Data.CaseInsensitive.Internal | |
FromField Text | |
Defined in Database.PostgreSQL.Simple.FromField | |
ToField Text | |
Defined in Database.PostgreSQL.Simple.ToField | |
ToParamSchema Text | |
Defined in Data.Swagger.Internal.ParamSchema Methods toParamSchema ∷ ∀ (t ∷ SwaggerKind Type). Proxy Text → ParamSchema t | |
ToSchema Text | |
Defined in Data.Swagger.Internal.Schema Methods declareNamedSchema ∷ Proxy Text → Declare (Definitions Schema) NamedSchema | |
FromText Text | |
Defined in Data.Text.Class | |
ToText Text | |
Defined in Data.Text.Class | |
FromBuiltin BuiltinString Text | |
Defined in PlutusTx.Builtins.Class Methods fromBuiltin ∷ BuiltinString → Text | |
PrettyDefaultBy config Text ⇒ PrettyBy config Text | |
Defined in Text.PrettyBy.Internal | |
ToBuiltin Text BuiltinString | |
Defined in PlutusTx.Builtins.Class | |
DefaultPrettyBy config Text | |
Defined in Text.PrettyBy.Internal | |
NonDefaultPrettyBy ConstConfig Text | |
Defined in PlutusCore.Pretty.PrettyConst Methods nonDefaultPrettyBy ∷ ConstConfig → Text → Doc ann nonDefaultPrettyListBy ∷ ConstConfig → [Text] → Doc ann | |
LazySequence Text Text | |
Defined in Data.Sequences | |
Utf8 Text ByteString | |
Defined in Data.Sequences | |
StringConv String Text | |
Defined in Data.String.Conv | |
StringConv ByteString Text | |
Defined in Data.String.Conv Methods strConv ∷ Leniency → ByteString → Text | |
StringConv ByteString Text | |
Defined in Data.String.Conv Methods strConv ∷ Leniency → ByteString → Text | |
StringConv Text Text | |
Defined in Data.String.Conv | |
StringConv Text String | |
Defined in Data.String.Conv | |
StringConv Text ByteString | |
Defined in Data.String.Conv Methods strConv ∷ Leniency → Text → ByteString | |
StringConv Text ByteString | |
Defined in Data.String.Conv Methods strConv ∷ Leniency → Text → ByteString | |
StringConv Text Text | |
Defined in Data.String.Conv | |
StringConv Text Text | |
Defined in Data.String.Conv | |
HasDescription Response Text | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Response Text | |
HasName License Text | |
Defined in Data.Swagger.Lens | |
HasName Param Text | |
Defined in Data.Swagger.Lens | |
HasName Tag TagName | |
Defined in Data.Swagger.Lens Methods name ∷ Lens' Tag TagName | |
HasTitle Info Text | |
Defined in Data.Swagger.Lens | |
HasVersion Info Text | |
Defined in Data.Swagger.Lens | |
HasConstantIn DefaultUni term ⇒ MakeKnownIn DefaultUni term Text | |
Defined in PlutusCore.Default.Universe | |
HasConstantIn DefaultUni term ⇒ ReadKnownIn DefaultUni term Text | |
Defined in PlutusCore.Default.Universe | |
HasDefinitions Swagger (Definitions Schema) | |
Defined in Data.Swagger.Lens Methods definitions ∷ Lens' Swagger (Definitions Schema) | |
HasDescription ExternalDocs (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' ExternalDocs (Maybe Text) | |
HasDescription Header (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Header (Maybe Text) | |
HasDescription Info (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Info (Maybe Text) | |
HasDescription Operation (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Operation (Maybe Text) | |
HasDescription Param (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Param (Maybe Text) | |
HasDescription Schema (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Schema (Maybe Text) | |
HasDescription SecurityScheme (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' SecurityScheme (Maybe Text) | |
HasDescription Tag (Maybe Text) | |
Defined in Data.Swagger.Lens Methods description ∷ Lens' Tag (Maybe Text) | |
HasDiscriminator Schema (Maybe Text) | |
Defined in Data.Swagger.Lens Methods discriminator ∷ Lens' Schema (Maybe Text) | |
HasEmail Contact (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasParamSchema s (ParamSchema t) ⇒ HasFormat s (Maybe Format) | |
Defined in Data.Swagger.Lens | |
HasName Contact (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasName NamedSchema (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasName Xml (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasNamespace Xml (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasOperationId Operation (Maybe Text) | |
Defined in Data.Swagger.Lens Methods operationId ∷ Lens' Operation (Maybe Text) | |
HasParameters Swagger (Definitions Param) | |
Defined in Data.Swagger.Lens Methods parameters ∷ Lens' Swagger (Definitions Param) | |
HasParamSchema s (ParamSchema t) ⇒ HasPattern s (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasPrefix Xml (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasRequired Schema [ParamName] | |
Defined in Data.Swagger.Lens Methods required ∷ Lens' Schema [ParamName] | |
HasResponses Swagger (Definitions Response) | |
Defined in Data.Swagger.Lens Methods responses ∷ Lens' Swagger (Definitions Response) | |
HasSummary Operation (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasTags Operation (InsOrdHashSet TagName) | |
Defined in Data.Swagger.Lens Methods tags ∷ Lens' Operation (InsOrdHashSet TagName) | |
HasTermsOfService Info (Maybe Text) | |
Defined in Data.Swagger.Lens Methods termsOfService ∷ Lens' Info (Maybe Text) | |
HasTitle Schema (Maybe Text) | |
Defined in Data.Swagger.Lens | |
HasHeaders Response (InsOrdHashMap HeaderName Header) | |
Defined in Data.Swagger.Lens Methods headers ∷ Lens' Response (InsOrdHashMap HeaderName Header) | |
HasProperties Schema (InsOrdHashMap Text (Referenced Schema)) | |
Defined in Data.Swagger.Lens Methods properties ∷ Lens' Schema (InsOrdHashMap Text (Referenced Schema)) | |
FromField (CI Text) | |
Defined in Database.PostgreSQL.Simple.FromField | |
ToField (CI Text) | |
Defined in Database.PostgreSQL.Simple.ToField | |
Contains DefaultUni Text | |
Defined in PlutusCore.Default.Universe | |
KnownBuiltinTypeAst DefaultUni Text ⇒ KnownTypeAst DefaultUni Text | |
Defined in PlutusCore.Default.Universe | |
MimeRender PlainText Text | |
Defined in Servant.API.ContentTypes Methods mimeRender ∷ Proxy PlainText → Text → ByteString | |
MimeUnrender PlainText Text | |
Defined in Servant.API.ContentTypes Methods mimeUnrender ∷ Proxy PlainText → ByteString → Either String Text mimeUnrenderWithType ∷ Proxy PlainText → MediaType → ByteString → Either String Text | |
HasFormat (ParamSchema t) (Maybe Format) | |
Defined in Data.Swagger.Lens | |
HasPattern (ParamSchema t) (Maybe Pattern) | |
Defined in Data.Swagger.Lens | |
type Item Text | |
type Token Text | |
Defined in Text.Megaparsec.Stream | |
type Tokens Text | |
Defined in Text.Megaparsec.Stream | |
type Element Text | |
Defined in Data.MonoTraversable | |
type State Text | |
Defined in Data.Attoparsec.Internal.Types type State Text = Buffer | |
type ChunkElem Text | |
Defined in Data.Attoparsec.Internal.Types | |
type Index Text | |
Defined in Control.Lens.At | |
type IxValue Text | |
Defined in Control.Lens.At | |
type Index Text | |
Defined in Data.Sequences | |
type Index Text | |
type IxValue Text | |
type IxKind Text | |
type ToBinds Text | |
Defined in PlutusCore.Default.Universe | |
type ToHoles Text | |
Defined in PlutusCore.Default.Universe |
Minimal complete definition
Nothing
Instances
FromJSON Bool | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Char | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Double | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Float | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Int | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Int8 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Int16 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Int32 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Int64 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Integer | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Natural | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Ordering | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Word | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Word8 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Word16 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Word32 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Word64 | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON () | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Void | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Version | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON CTime | |
Defined in Data.Aeson.Types.FromJSON | |
(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # | |
Defined in GeniusYield.Imports | |
FromJSON IntSet | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Text | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON ZonedTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON LocalTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON TimeOfDay | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser CalendarDiffTime # parseJSONList ∷ Value → Parser [CalendarDiffTime] # | |
FromJSON UTCTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON SystemTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON NominalDiffTime | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser NominalDiffTime # parseJSONList ∷ Value → Parser [NominalDiffTime] # | |
FromJSON DiffTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON DayOfWeek | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Day | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser CalendarDiffDays # parseJSONList ∷ Value → Parser [CalendarDiffDays] # | |
FromJSON StakeAddress | |
Defined in Cardano.Api.Address | |
FromJSON AnyCardanoEra | |
Defined in Cardano.Api.Eras | |
FromJSON CostModel | |
Defined in Cardano.Api.ProtocolParameters | |
FromJSON ExecutionUnitPrices | |
Defined in Cardano.Api.ProtocolParameters Methods parseJSON ∷ Value → Parser ExecutionUnitPrices # parseJSONList ∷ Value → Parser [ExecutionUnitPrices] # | |
FromJSON PraosNonce | |
Defined in Cardano.Api.ProtocolParameters | |
FromJSON AnyPlutusScriptVersion | |
Defined in Cardano.Api.Script Methods parseJSON ∷ Value → Parser AnyPlutusScriptVersion # parseJSONList ∷ Value → Parser [AnyPlutusScriptVersion] # | |
FromJSON ExecutionUnits | |
Defined in Cardano.Api.Script | |
FromJSON ScriptHash | |
Defined in Cardano.Api.Script | |
FromJSON ScriptInAnyLang | |
Defined in Cardano.Api.Script Methods parseJSON ∷ Value → Parser ScriptInAnyLang # parseJSONList ∷ Value → Parser [ScriptInAnyLang] # | |
FromJSON TextEnvelope | |
Defined in Cardano.Api.SerialiseTextEnvelope | |
FromJSON TextEnvelopeDescr | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods parseJSON ∷ Value → Parser TextEnvelopeDescr # parseJSONList ∷ Value → Parser [TextEnvelopeDescr] # | |
FromJSON TextEnvelopeType | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods parseJSON ∷ Value → Parser TextEnvelopeType # parseJSONList ∷ Value → Parser [TextEnvelopeType] # | |
FromJSON StakePoolMetadata | |
Defined in Cardano.Api.StakePoolMetadata Methods parseJSON ∷ Value → Parser StakePoolMetadata # parseJSONList ∷ Value → Parser [StakePoolMetadata] # | |
FromJSON TxId | |
Defined in Cardano.Api.TxIn | |
FromJSON TxIn | |
Defined in Cardano.Api.TxIn | |
FromJSON TxIx | |
Defined in Cardano.Api.TxIn | |
FromJSON AssetName | |
Defined in Cardano.Api.Value | |
FromJSON Lovelace | |
Defined in Cardano.Api.Value | |
FromJSON PolicyId | |
Defined in Cardano.Api.Value | |
FromJSON Quantity | |
Defined in Cardano.Api.Value | |
FromJSON Value | |
Defined in Cardano.Api.Value | |
FromJSON ValueNestedRep | |
Defined in Cardano.Api.Value | |
FromJSON EpochNo | |
Defined in Cardano.Slotting.Slot | |
FromJSON SlotNo | |
Defined in Cardano.Slotting.Slot | |
FromJSON ProtVer | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON RequiresNetworkMagic | |
Defined in Cardano.Crypto.ProtocolMagic Methods parseJSON ∷ Value → Parser RequiresNetworkMagic # parseJSONList ∷ Value → Parser [RequiresNetworkMagic] # | |
FromJSON ProtocolMagicId | |
Defined in Cardano.Crypto.ProtocolMagic Methods parseJSON ∷ Value → Parser ProtocolMagicId # parseJSONList ∷ Value → Parser [ProtocolMagicId] # | |
FromJSON CompactRedeemVerificationKey | |
Defined in Cardano.Crypto.Signing.Redeem.Compact Methods parseJSON ∷ Value → Parser CompactRedeemVerificationKey # parseJSONList ∷ Value → Parser [CompactRedeemVerificationKey] # | |
FromJSON VerificationKey | |
Defined in Cardano.Crypto.Signing.VerificationKey Methods parseJSON ∷ Value → Parser VerificationKey # parseJSONList ∷ Value → Parser [VerificationKey] # | |
FromJSON ProtocolMagic | |
Defined in Cardano.Crypto.ProtocolMagic | |
FromJSON PositiveUnitInterval | |
Defined in Cardano.Ledger.BaseTypes Methods parseJSON ∷ Value → Parser PositiveUnitInterval # parseJSONList ∷ Value → Parser [PositiveUnitInterval] # | |
FromJSON Network | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON Coin | |
Defined in Cardano.Ledger.Coin | |
FromJSON Nonce | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON Value | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Key | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON StakePoolRelay | |
Defined in Cardano.Ledger.Shelley.TxBody | |
FromJSON RewardParams | |
Defined in Cardano.Ledger.Shelley.API.Wallet | |
FromJSON RewardInfoPool | |
Defined in Cardano.Ledger.Shelley.API.Wallet | |
FromJSON UnitInterval | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON NonNegativeInterval | |
Defined in Cardano.Ledger.BaseTypes Methods parseJSON ∷ Value → Parser NonNegativeInterval # parseJSONList ∷ Value → Parser [NonNegativeInterval] # | |
FromJSON AlonzoGenesis | |
Defined in Cardano.Ledger.Alonzo.Genesis | |
FromJSON ExCPU | |
Defined in PlutusCore.Evaluation.Machine.ExMemory | |
FromJSON ExMemory | |
Defined in PlutusCore.Evaluation.Machine.ExMemory | |
FromJSON ExBudget | |
Defined in PlutusCore.Evaluation.Machine.ExBudget | |
FromJSON Desirability | |
Defined in Cardano.Ledger.Shelley.RewardProvenance | |
FromJSON PoolMetadata | |
Defined in Cardano.Ledger.Shelley.TxBody | |
FromJSON Scientific | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON ProtocolParameters | |
Defined in Cardano.Api.ProtocolParameters Methods parseJSON ∷ Value → Parser ProtocolParameters # parseJSONList ∷ Value → Parser [ProtocolParameters] # | |
FromJSON EpochSize | |
Defined in Cardano.Slotting.Slot | |
FromJSON DotNetTime | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Month | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON Quarter | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON QuarterOfYear | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON ShortText | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON UUID | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON BaseUrl | |
Defined in Servant.Client.Core.BaseUrl | |
FromJSON ByteString64 | |
Defined in Data.ByteString.Base64.Type | |
FromJSON Url | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON CekMachineCosts | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts Methods parseJSON ∷ Value → Parser CekMachineCosts # parseJSONList ∷ Value → Parser [CekMachineCosts] # | |
FromJSON RedeemVerificationKey | |
Defined in Cardano.Crypto.Signing.Redeem.VerificationKey Methods parseJSON ∷ Value → Parser RedeemVerificationKey # parseJSONList ∷ Value → Parser [RedeemVerificationKey] # | |
FromJSON DnsName | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON Port | |
Defined in Cardano.Ledger.BaseTypes | |
FromJSON PositiveInterval | |
Defined in Cardano.Ledger.BaseTypes Methods parseJSON ∷ Value → Parser PositiveInterval # parseJSONList ∷ Value → Parser [PositiveInterval] # | |
FromJSON PeerAdvertise | |
Defined in Ouroboros.Network.PeerSelection.Types | |
FromJSON SatInt | |
Defined in Data.SatInt | |
FromJSON ModelAddedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelAddedSizes # parseJSONList ∷ Value → Parser [ModelAddedSizes] # | |
FromJSON ModelConstantOrLinear | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelConstantOrLinear # parseJSONList ∷ Value → Parser [ModelConstantOrLinear] # | |
FromJSON ModelConstantOrTwoArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelConstantOrTwoArguments # parseJSONList ∷ Value → Parser [ModelConstantOrTwoArguments] # | |
FromJSON ModelFiveArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelFiveArguments # parseJSONList ∷ Value → Parser [ModelFiveArguments] # | |
FromJSON ModelFourArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelFourArguments # parseJSONList ∷ Value → Parser [ModelFourArguments] # | |
FromJSON ModelLinearSize | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelLinearSize # parseJSONList ∷ Value → Parser [ModelLinearSize] # | |
FromJSON ModelMaxSize | |
FromJSON ModelMinSize | |
FromJSON ModelMultipliedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelMultipliedSizes # parseJSONList ∷ Value → Parser [ModelMultipliedSizes] # | |
FromJSON ModelOneArgument | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelOneArgument # parseJSONList ∷ Value → Parser [ModelOneArgument] # | |
FromJSON ModelSixArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelSixArguments # parseJSONList ∷ Value → Parser [ModelSixArguments] # | |
FromJSON ModelSubtractedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelSubtractedSizes # parseJSONList ∷ Value → Parser [ModelSubtractedSizes] # | |
FromJSON ModelThreeArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelThreeArguments # parseJSONList ∷ Value → Parser [ModelThreeArguments] # | |
FromJSON ModelTwoArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser ModelTwoArguments # parseJSONList ∷ Value → Parser [ModelTwoArguments] # | |
FromJSON CovLoc | |
Defined in PlutusTx.Coverage | |
FromJSON CoverageAnnotation | |
Defined in PlutusTx.Coverage Methods parseJSON ∷ Value → Parser CoverageAnnotation # parseJSONList ∷ Value → Parser [CoverageAnnotation] # | |
FromJSON CoverageData | |
Defined in PlutusTx.Coverage | |
FromJSON CoverageIndex | |
Defined in PlutusTx.Coverage | |
FromJSON CoverageMetadata | |
Defined in PlutusTx.Coverage Methods parseJSON ∷ Value → Parser CoverageMetadata # parseJSONList ∷ Value → Parser [CoverageMetadata] # | |
FromJSON CoverageReport | |
Defined in PlutusTx.Coverage | |
FromJSON Metadata | |
Defined in PlutusTx.Coverage | |
FromJSON StudentT | |
Defined in Statistics.Distribution.StudentT | |
FromJSON Environment | |
Defined in Katip.Core | |
FromJSON LogStr | |
Defined in Katip.Core | |
FromJSON Namespace | |
Defined in Katip.Core | |
FromJSON Severity | |
Defined in Katip.Core | |
FromJSON ThreadIdText | |
Defined in Katip.Core | |
FromJSON Verbosity | |
Defined in Katip.Core | |
FromJSON LocJs | |
Defined in Katip.Core | |
FromJSON ProcessIDJs | |
Defined in Katip.Core | |
FromJSON GYEra # | |
Defined in GeniusYield.Types.Era | |
FromJSON GYDatumHash # | |
Defined in GeniusYield.Types.Datum | |
FromJSON GYLogScribeConfig # |
|
Defined in GeniusYield.Types.Logging Methods parseJSON ∷ Value → Parser GYLogScribeConfig # parseJSONList ∷ Value → Parser [GYLogScribeConfig] # | |
FromJSON GYLogScribeType # |
|
Defined in GeniusYield.Types.Logging Methods parseJSON ∷ Value → Parser GYLogScribeType # parseJSONList ∷ Value → Parser [GYLogScribeType] # | |
FromJSON LogSrc # | |
Defined in GeniusYield.Types.Logging | |
FromJSON GYLogVerbosity # | |
Defined in GeniusYield.Types.Logging | |
FromJSON GYLogSeverity # |
|
Defined in GeniusYield.Types.Logging | |
FromJSON GYNetworkId # |
|
Defined in GeniusYield.Types.NetworkId | |
FromJSON AdditionalProperties | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser AdditionalProperties # parseJSONList ∷ Value → Parser [AdditionalProperties] # | |
FromJSON ApiKeyLocation | |
Defined in Data.Swagger.Internal | |
FromJSON ApiKeyParams | |
Defined in Data.Swagger.Internal | |
FromJSON Contact | |
Defined in Data.Swagger.Internal | |
FromJSON Example | |
Defined in Data.Swagger.Internal | |
FromJSON ExternalDocs | |
Defined in Data.Swagger.Internal | |
FromJSON Header | |
Defined in Data.Swagger.Internal | |
FromJSON Host | |
Defined in Data.Swagger.Internal | |
FromJSON Info | |
Defined in Data.Swagger.Internal | |
FromJSON License | |
Defined in Data.Swagger.Internal | |
FromJSON MimeList | |
Defined in Data.Swagger.Internal | |
FromJSON OAuth2Flow | |
Defined in Data.Swagger.Internal | |
FromJSON OAuth2Params | |
Defined in Data.Swagger.Internal | |
FromJSON Operation | |
Defined in Data.Swagger.Internal | |
FromJSON Param | |
Defined in Data.Swagger.Internal | |
FromJSON ParamAnySchema | |
Defined in Data.Swagger.Internal | |
FromJSON ParamLocation | |
Defined in Data.Swagger.Internal | |
FromJSON ParamOtherSchema | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser ParamOtherSchema # parseJSONList ∷ Value → Parser [ParamOtherSchema] # | |
FromJSON PathItem | |
Defined in Data.Swagger.Internal | |
FromJSON Reference | |
Defined in Data.Swagger.Internal | |
FromJSON Response | |
Defined in Data.Swagger.Internal | |
FromJSON Responses | |
Defined in Data.Swagger.Internal | |
FromJSON Schema | |
Defined in Data.Swagger.Internal | |
FromJSON Scheme | |
Defined in Data.Swagger.Internal | |
FromJSON SecurityDefinitions | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser SecurityDefinitions # parseJSONList ∷ Value → Parser [SecurityDefinitions] # | |
FromJSON SecurityRequirement | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser SecurityRequirement # parseJSONList ∷ Value → Parser [SecurityRequirement] # | |
FromJSON SecurityScheme | |
Defined in Data.Swagger.Internal | |
FromJSON SecuritySchemeType | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser SecuritySchemeType # parseJSONList ∷ Value → Parser [SecuritySchemeType] # | |
FromJSON Swagger | |
Defined in Data.Swagger.Internal | |
FromJSON Tag | |
Defined in Data.Swagger.Internal | |
FromJSON URL | |
Defined in Data.Swagger.Internal | |
FromJSON Xml | |
Defined in Data.Swagger.Internal | |
FromJSON GYPubKeyHash # |
Invalid characters:
|
Defined in GeniusYield.Types.PubKeyHash | |
FromJSON GYPaymentSigningKey # |
|
Defined in GeniusYield.Types.Key Methods parseJSON ∷ Value → Parser GYPaymentSigningKey # parseJSONList ∷ Value → Parser [GYPaymentSigningKey] # | |
FromJSON GYPaymentVerificationKey # |
|
Defined in GeniusYield.Types.Key Methods parseJSON ∷ Value → Parser GYPaymentVerificationKey # parseJSONList ∷ Value → Parser [GYPaymentVerificationKey] # | |
FromJSON Rational | |
Defined in PlutusTx.Ratio | |
FromJSON GYRational # |
|
Defined in GeniusYield.Types.Rational | |
FromJSON GYMintingPolicyId # | |
Defined in GeniusYield.Types.Script Methods parseJSON ∷ Value → Parser GYMintingPolicyId # parseJSONList ∷ Value → Parser [GYMintingPolicyId] # | |
FromJSON GYAddressBech32 # |
|
Defined in GeniusYield.Types.Address Methods parseJSON ∷ Value → Parser GYAddressBech32 # parseJSONList ∷ Value → Parser [GYAddressBech32] # | |
FromJSON GYAddress # | In JSON context addresses are represented in hex.
|
Defined in GeniusYield.Types.Address | |
FromJSON GYTime # |
|
Defined in GeniusYield.Types.Time | |
FromJSON GYTx # |
|
Defined in GeniusYield.Types.Tx | |
FromJSON GYTxOutRefCbor # | |
Defined in GeniusYield.Types.TxOutRef | |
FromJSON GYTxOutRef # | |
Defined in GeniusYield.Types.TxOutRef | |
FromJSON GYTokenName # |
|
Defined in GeniusYield.Types.Value | |
FromJSON GYAssetClass # |
|
Defined in GeniusYield.Types.Value | |
FromJSON GYValue # |
|
Defined in GeniusYield.Types.Value | |
FromJSON TokenPolicyId | |
Defined in Cardano.Wallet.Primitive.Types.TokenPolicy | |
FromJSON TokenName | |
Defined in Cardano.Wallet.Primitive.Types.TokenPolicy | |
FromJSON TokenQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenQuantity | |
FromJSON FlatAssetQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods parseJSON ∷ Value → Parser FlatAssetQuantity # parseJSONList ∷ Value → Parser [FlatAssetQuantity] # | |
FromJSON NestedMapEntry | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap | |
FromJSON NestedTokenQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods parseJSON ∷ Value → Parser NestedTokenQuantity # parseJSONList ∷ Value → Parser [NestedTokenQuantity] # | |
FromJSON Percentage | |
Defined in Data.Quantity | |
FromJSON Ada | |
Defined in Plutus.Model.Ada | |
FromJSON Slot | |
Defined in Plutus.Model.Fork.Ledger.Slot | |
FromJSON MaestroUtxo # | |
Defined in GeniusYield.Providers.Maestro | |
FromJSON MaestroDatumOption # | |
Defined in GeniusYield.Providers.Maestro Methods parseJSON ∷ Value → Parser MaestroDatumOption # parseJSONList ∷ Value → Parser [MaestroDatumOption] # | |
FromJSON MaestroDatumOptionType # | |
Defined in GeniusYield.Providers.Maestro Methods parseJSON ∷ Value → Parser MaestroDatumOptionType # parseJSONList ∷ Value → Parser [MaestroDatumOptionType] # | |
FromJSON MaestroScript # | |
Defined in GeniusYield.Providers.Maestro | |
FromJSON MaestroScriptType # | |
Defined in GeniusYield.Providers.Maestro Methods parseJSON ∷ Value → Parser MaestroScriptType # parseJSONList ∷ Value → Parser [MaestroScriptType] # | |
FromJSON MaestroAsset # | |
Defined in GeniusYield.Providers.Maestro | |
FromJSON MaestroAssetClass # | |
Defined in GeniusYield.Providers.Maestro Methods parseJSON ∷ Value → Parser MaestroAssetClass # parseJSONList ∷ Value → Parser [MaestroAssetClass] # | |
FromJSON ScriptDataDetailed # | |
Defined in GeniusYield.Providers.Maestro Methods parseJSON ∷ Value → Parser ScriptDataDetailed # parseJSONList ∷ Value → Parser [ScriptDataDetailed] # | |
FromJSON GYCoreConfig # | |
Defined in GeniusYield.GYConfig | |
FromJSON GYCoreProviderInfo # | |
Defined in GeniusYield.GYConfig Methods parseJSON ∷ Value → Parser GYCoreProviderInfo # parseJSONList ∷ Value → Parser [GYCoreProviderInfo] # | |
FromJSON a ⇒ FromJSON [a] | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Maybe a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, Integral a) ⇒ FromJSON (Ratio a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Min a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Max a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (First a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Last a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (WrappedMonoid a) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (WrappedMonoid a) # parseJSONList ∷ Value → Parser [WrappedMonoid a] # | |
FromJSON a ⇒ FromJSON (Option a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Identity a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (First a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Last a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Dual a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (NonEmpty a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (IntMap a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON v ⇒ FromJSON (Tree v) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Seq a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Ord a, FromJSON a) ⇒ FromJSON (Set a) | |
Defined in Data.Aeson.Types.FromJSON | |
IsShelleyBasedEra era ⇒ FromJSON (AddressInEra era) | |
Defined in Cardano.Api.Address Methods parseJSON ∷ Value → Parser (AddressInEra era) # parseJSONList ∷ Value → Parser [AddressInEra era] # | |
FromJSON (Hash BlockHeader) | |
Defined in Cardano.Api.Block Methods parseJSON ∷ Value → Parser (Hash BlockHeader) # parseJSONList ∷ Value → Parser [Hash BlockHeader] # | |
FromJSON (Hash ScriptData) | |
Defined in Cardano.Api.ScriptData Methods parseJSON ∷ Value → Parser (Hash ScriptData) # parseJSONList ∷ Value → Parser [Hash ScriptData] # | |
FromJSON (Hash StakePoolKey) | |
Defined in Cardano.Api.KeysShelley Methods parseJSON ∷ Value → Parser (Hash StakePoolKey) # parseJSONList ∷ Value → Parser [Hash StakePoolKey] # | |
(IsCardanoEra era, IsShelleyBasedEra era, FromJSON (TxOut CtxUTxO era)) ⇒ FromJSON (UTxO era) | |
Defined in Cardano.Api.Query | |
IsSimpleScriptLanguage lang ⇒ FromJSON (SimpleScript lang) | |
Defined in Cardano.Api.Script Methods parseJSON ∷ Value → Parser (SimpleScript lang) # parseJSONList ∷ Value → Parser [SimpleScript lang] # | |
IsCardanoEra era ⇒ FromJSON (TxOutValue era) | |
Defined in Cardano.Api.TxBody Methods parseJSON ∷ Value → Parser (TxOutValue era) # parseJSONList ∷ Value → Parser [TxOutValue era] # | |
FromJSON a ⇒ FromJSON (StrictSeq a) | |
Defined in Data.Sequence.Strict | |
Crypto crypto ⇒ FromJSON (ShelleyGenesisStaking crypto) | |
Defined in Cardano.Ledger.Shelley.Genesis Methods parseJSON ∷ Value → Parser (ShelleyGenesisStaking crypto) # parseJSONList ∷ Value → Parser [ShelleyGenesisStaking crypto] # | |
Crypto crypto ⇒ FromJSON (Addr crypto) | |
Defined in Cardano.Ledger.Address | |
Crypto crypto ⇒ FromJSON (GenDelegPair crypto) | |
Defined in Cardano.Ledger.Keys Methods parseJSON ∷ Value → Parser (GenDelegPair crypto) # parseJSONList ∷ Value → Parser [GenDelegPair crypto] # | |
FromJSON (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams | |
Era era ⇒ FromJSON (ShelleyGenesis era) | |
Defined in Cardano.Ledger.Shelley.Genesis Methods parseJSON ∷ Value → Parser (ShelleyGenesis era) # parseJSONList ∷ Value → Parser [ShelleyGenesis era] # | |
FromJSON a ⇒ FromJSON (StrictMaybe a) | |
Defined in Data.Maybe.Strict | |
Crypto crypto ⇒ FromJSON (PoolParams crypto) | |
Defined in Cardano.Ledger.Shelley.TxBody Methods parseJSON ∷ Value → Parser (PoolParams crypto) # parseJSONList ∷ Value → Parser [PoolParams crypto] # | |
FromJSON a ⇒ FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON1 f ⇒ FromJSON (Fix f) | |
Defined in Data.Aeson.Types.FromJSON | |
Crypto crypto ⇒ FromJSON (RewardProvenance crypto) | |
Defined in Cardano.Ledger.Shelley.RewardProvenance Methods parseJSON ∷ Value → Parser (RewardProvenance crypto) # parseJSONList ∷ Value → Parser [RewardProvenance crypto] # | |
Crypto crypto ⇒ FromJSON (BlocksMade crypto) | |
Defined in Cardano.Ledger.BaseTypes Methods parseJSON ∷ Value → Parser (BlocksMade crypto) # parseJSONList ∷ Value → Parser [BlocksMade crypto] # | |
Crypto crypto ⇒ FromJSON (ScriptHash crypto) | |
Defined in Cardano.Ledger.Hashes Methods parseJSON ∷ Value → Parser (ScriptHash crypto) # parseJSONList ∷ Value → Parser [ScriptHash crypto] # | |
FromJSON a ⇒ FromJSON (DList a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (HashSet a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Vector Vector a, FromJSON a) ⇒ FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Storable a, FromJSON a) ⇒ FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Prim a, FromJSON a) ⇒ FromJSON (Vector a) | |
Defined in Data.Aeson.Types.FromJSON | |
Crypto crypto ⇒ FromJSON (RewardProvenancePool crypto) | |
Defined in Cardano.Ledger.Shelley.RewardProvenance Methods parseJSON ∷ Value → Parser (RewardProvenancePool crypto) # parseJSONList ∷ Value → Parser [RewardProvenancePool crypto] # | |
Crypto crypto ⇒ FromJSON (RewardAcnt crypto) | |
Defined in Cardano.Ledger.Address Methods parseJSON ∷ Value → Parser (RewardAcnt crypto) # parseJSONList ∷ Value → Parser [RewardAcnt crypto] # | |
FromJSON a ⇒ FromJSON (Solo a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON v ⇒ FromJSON (KeyMap v) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (DNonEmpty a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Maybe a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Array a) | |
Defined in Data.Aeson.Types.FromJSON | |
(Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (Generically a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON1 f, Functor f) ⇒ FromJSON (Mu f) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON1 f, Functor f) ⇒ FromJSON (Nu f) | |
Defined in Data.Aeson.Types.FromJSON | |
(Prim a, FromJSON a) ⇒ FromJSON (PrimArray a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (SmallArray a) | |
Defined in Data.Aeson.Types.FromJSON | |
IsCardanoEra era ⇒ FromJSON (ReferenceScript era) | |
Defined in Cardano.Api.Script Methods parseJSON ∷ Value → Parser (ReferenceScript era) # parseJSONList ∷ Value → Parser [ReferenceScript era] # | |
FromJSON a ⇒ FromJSON (RedeemSignature a) | |
Defined in Cardano.Crypto.Signing.Redeem.Signature Methods parseJSON ∷ Value → Parser (RedeemSignature a) # parseJSONList ∷ Value → Parser [RedeemSignature a] # | |
FromJSON (Signature w) | |
Defined in Cardano.Crypto.Signing.Signature | |
Crypto crypto ⇒ FromJSON (StakeCreds crypto) | |
Defined in Cardano.Ledger.Shelley.TxBody Methods parseJSON ∷ Value → Parser (StakeCreds crypto) # parseJSONList ∷ Value → Parser [StakeCreds crypto] # | |
FromJSON (BuiltinCostModelBase CostingFun) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser (BuiltinCostModelBase CostingFun) # parseJSONList ∷ Value → Parser [BuiltinCostModelBase CostingFun] # | |
FromJSON model ⇒ FromJSON (CostingFun model) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods parseJSON ∷ Value → Parser (CostingFun model) # parseJSONList ∷ Value → Parser [CostingFun model] # | |
FromJSON d ⇒ FromJSON (LinearTransform d) | |
Defined in Statistics.Distribution.Transform Methods parseJSON ∷ Value → Parser (LinearTransform d) # parseJSONList ∷ Value → Parser [LinearTransform d] # | |
FromJSON a ⇒ FromJSON (Item a) | |
Defined in Katip.Core | |
FromJSON (CollectionFormat ('SwaggerKindNormal t)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (CollectionFormat ('SwaggerKindNormal t)) # parseJSONList ∷ Value → Parser [CollectionFormat ('SwaggerKindNormal t)] # | |
FromJSON (CollectionFormat ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (CollectionFormat 'SwaggerKindParamOtherSchema) # parseJSONList ∷ Value → Parser [CollectionFormat 'SwaggerKindParamOtherSchema] # | |
FromJSON (ParamSchema ('SwaggerKindSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (ParamSchema 'SwaggerKindSchema) # parseJSONList ∷ Value → Parser [ParamSchema 'SwaggerKindSchema] # | |
(FromJSON (SwaggerType ('SwaggerKindNormal t)), FromJSON (SwaggerItems ('SwaggerKindNormal t))) ⇒ FromJSON (ParamSchema ('SwaggerKindNormal t)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (ParamSchema ('SwaggerKindNormal t)) # parseJSONList ∷ Value → Parser [ParamSchema ('SwaggerKindNormal t)] # | |
FromJSON (ParamSchema ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (ParamSchema 'SwaggerKindParamOtherSchema) # parseJSONList ∷ Value → Parser [ParamSchema 'SwaggerKindParamOtherSchema] # | |
FromJSON (Referenced Param) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (Referenced Param) # parseJSONList ∷ Value → Parser [Referenced Param] # | |
FromJSON (Referenced Response) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (Referenced Response) # parseJSONList ∷ Value → Parser [Referenced Response] # | |
FromJSON (Referenced Schema) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (Referenced Schema) # parseJSONList ∷ Value → Parser [Referenced Schema] # | |
FromJSON (SwaggerItems ('SwaggerKindSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerItems 'SwaggerKindSchema) # parseJSONList ∷ Value → Parser [SwaggerItems 'SwaggerKindSchema] # | |
(FromJSON (CollectionFormat ('SwaggerKindNormal t)), FromJSON (ParamSchema ('SwaggerKindNormal t))) ⇒ FromJSON (SwaggerItems ('SwaggerKindNormal t)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerItems ('SwaggerKindNormal t)) # parseJSONList ∷ Value → Parser [SwaggerItems ('SwaggerKindNormal t)] # | |
FromJSON (SwaggerItems ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerItems 'SwaggerKindParamOtherSchema) # parseJSONList ∷ Value → Parser [SwaggerItems 'SwaggerKindParamOtherSchema] # | |
FromJSON (SwaggerType ('SwaggerKindSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerType 'SwaggerKindSchema) # parseJSONList ∷ Value → Parser [SwaggerType 'SwaggerKindSchema] # | |
FromJSON (SwaggerType ('SwaggerKindNormal t)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerType ('SwaggerKindNormal t)) # parseJSONList ∷ Value → Parser [SwaggerType ('SwaggerKindNormal t)] # | |
FromJSON (SwaggerType ('SwaggerKindParamOtherSchema ∷ SwaggerKind Type)) | |
Defined in Data.Swagger.Internal Methods parseJSON ∷ Value → Parser (SwaggerType 'SwaggerKindParamOtherSchema) # parseJSONList ∷ Value → Parser [SwaggerType 'SwaggerKindParamOtherSchema] # | |
(Eq a, Hashable a, FromJSON a) ⇒ FromJSON (InsOrdHashSet a) | |
Defined in Data.HashSet.InsOrd Methods parseJSON ∷ Value → Parser (InsOrdHashSet a) # parseJSONList ∷ Value → Parser [InsOrdHashSet a] # | |
FromJSON (Flat TokenMap) | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap | |
FromJSON (Nested TokenMap) | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods parseJSON ∷ Value → Parser (Nested TokenMap) # parseJSONList ∷ Value → Parser [Nested TokenMap] # | |
(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b) ⇒ FromJSON (a, b) | |
Defined in Data.Aeson.Types.FromJSON | |
HasResolution a ⇒ FromJSON (Fixed a) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON (Proxy a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSONKey k, Ord k, FromJSON v) ⇒ FromJSON (Map k v) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON (EraInMode AllegraEra CardanoMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode AllegraEra CardanoMode) # parseJSONList ∷ Value → Parser [EraInMode AllegraEra CardanoMode] # | |
FromJSON (EraInMode AlonzoEra CardanoMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode AlonzoEra CardanoMode) # parseJSONList ∷ Value → Parser [EraInMode AlonzoEra CardanoMode] # | |
FromJSON (EraInMode ByronEra CardanoMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode ByronEra CardanoMode) # parseJSONList ∷ Value → Parser [EraInMode ByronEra CardanoMode] # | |
FromJSON (EraInMode ByronEra ByronMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode ByronEra ByronMode) # parseJSONList ∷ Value → Parser [EraInMode ByronEra ByronMode] # | |
FromJSON (EraInMode MaryEra CardanoMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode MaryEra CardanoMode) # parseJSONList ∷ Value → Parser [EraInMode MaryEra CardanoMode] # | |
FromJSON (EraInMode ShelleyEra CardanoMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode ShelleyEra CardanoMode) # parseJSONList ∷ Value → Parser [EraInMode ShelleyEra CardanoMode] # | |
FromJSON (EraInMode ShelleyEra ShelleyMode) | |
Defined in Cardano.Api.Modes Methods parseJSON ∷ Value → Parser (EraInMode ShelleyEra ShelleyMode) # parseJSONList ∷ Value → Parser [EraInMode ShelleyEra ShelleyMode] # | |
(IsShelleyBasedEra era, IsCardanoEra era) ⇒ FromJSON (TxOut CtxTx era) | |
Defined in Cardano.Api.TxBody Methods parseJSON ∷ Value → Parser (TxOut CtxTx era) # parseJSONList ∷ Value → Parser [TxOut CtxTx era] # | |
(IsShelleyBasedEra era, IsCardanoEra era) ⇒ FromJSON (TxOut CtxUTxO era) | |
Defined in Cardano.Api.TxBody Methods parseJSON ∷ Value → Parser (TxOut CtxUTxO era) # parseJSONList ∷ Value → Parser [TxOut CtxUTxO era] # | |
Crypto crypto ⇒ FromJSON (KeyHash disc crypto) | |
Defined in Cardano.Ledger.Keys Methods parseJSON ∷ Value → Parser (KeyHash disc crypto) # parseJSONList ∷ Value → Parser [KeyHash disc crypto] # | |
HashAlgorithm h ⇒ FromJSON (Hash h a) | |
Defined in Cardano.Crypto.Hash.Class | |
FromJSON b ⇒ FromJSON (Annotated b ()) | |
Defined in Cardano.Binary.Annotated Methods parseJSON ∷ Value → Parser (Annotated b ()) # parseJSONList ∷ Value → Parser [Annotated b ()] # | |
HashAlgorithm algo ⇒ FromJSON (AbstractHash algo a) | |
Defined in Cardano.Crypto.Hashing Methods parseJSON ∷ Value → Parser (AbstractHash algo a) # parseJSONList ∷ Value → Parser [AbstractHash algo a] # | |
Crypto crypto ⇒ FromJSON (Credential kr crypto) | |
Defined in Cardano.Ledger.Credential Methods parseJSON ∷ Value → Parser (Credential kr crypto) # parseJSONList ∷ Value → Parser [Credential kr crypto] # | |
(FromJSON v, FromJSONKey k, Eq k, Hashable k) ⇒ FromJSON (HashMap k v) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b) ⇒ FromJSON (Either a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b) ⇒ FromJSON (Pair a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b) ⇒ FromJSON (These a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b) ⇒ FromJSON (These a b) | |
Defined in Data.Aeson.Types.FromJSON | |
Bounded (BoundedRatio b Word64) ⇒ FromJSON (BoundedRatio b Word64) | |
Defined in Cardano.Ledger.BaseTypes | |
(FromJSONKey k, Ord k, FromJSON a) ⇒ FromJSON (MonoidalMap k a) | |
Defined in Data.Map.Monoidal Methods parseJSON ∷ Value → Parser (MonoidalMap k a) # parseJSONList ∷ Value → Parser [MonoidalMap k a] # | |
(Eq k, Hashable k, FromJSONKey k, FromJSON v) ⇒ FromJSON (InsOrdHashMap k v) | |
Defined in Data.HashMap.Strict.InsOrd Methods parseJSON ∷ Value → Parser (InsOrdHashMap k v) # parseJSONList ∷ Value → Parser [InsOrdHashMap k v] # | |
(KnownSymbol unit, FromJSON a) ⇒ FromJSON (Quantity unit a) | |
Defined in Data.Quantity Methods parseJSON ∷ Value → Parser (Quantity unit a) # parseJSONList ∷ Value → Parser [Quantity unit a] # | |
(FromJSON a, FromJSON b, FromJSON c) ⇒ FromJSON (a, b, c) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON a ⇒ FromJSON (Const a b) | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSON b ⇒ FromJSON (Tagged a b) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (These1 f g a) | |
Defined in Data.Aeson.Types.FromJSON | |
(AesonOptions t, Generic a, GFromJSON Zero (Rep a)) ⇒ FromJSON (CustomJSON t a) | |
Defined in Deriving.Aeson Methods parseJSON ∷ Value → Parser (CustomJSON t a) # parseJSONList ∷ Value → Parser [CustomJSON t a] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d) ⇒ FromJSON (a, b, c, d) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Product f g a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Sum f g a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e) ⇒ FromJSON (a, b, c, d, e) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e) # parseJSONList ∷ Value → Parser [(a, b, c, d, e)] # | |
(FromJSON1 f, FromJSON1 g, FromJSON a) ⇒ FromJSON (Compose f g a) | |
Defined in Data.Aeson.Types.FromJSON | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f) ⇒ FromJSON (a, b, c, d, e, f) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g) ⇒ FromJSON (a, b, c, d, e, f, g) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h) ⇒ FromJSON (a, b, c, d, e, f, g, h) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i) ⇒ FromJSON (a, b, c, d, e, f, g, h, i) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] # | |
(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n, FromJSON o) ⇒ FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
Defined in Data.Aeson.Types.FromJSON Methods parseJSON ∷ Value → Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # parseJSONList ∷ Value → Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] # |
Minimal complete definition
Nothing
Instances
ToJSON Bool | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Bool → Encoding # toJSONList ∷ [Bool] → Value # toEncodingList ∷ [Bool] → Encoding # | |
ToJSON Char | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Char → Encoding # toJSONList ∷ [Char] → Value # toEncodingList ∷ [Char] → Encoding # | |
ToJSON Double | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Double → Encoding # toJSONList ∷ [Double] → Value # toEncodingList ∷ [Double] → Encoding # | |
ToJSON Float | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Float → Encoding # toJSONList ∷ [Float] → Value # toEncodingList ∷ [Float] → Encoding # | |
ToJSON Int | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Int8 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Int8 → Encoding # toJSONList ∷ [Int8] → Value # toEncodingList ∷ [Int8] → Encoding # | |
ToJSON Int16 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Int16 → Encoding # toJSONList ∷ [Int16] → Value # toEncodingList ∷ [Int16] → Encoding # | |
ToJSON Int32 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Int32 → Encoding # toJSONList ∷ [Int32] → Value # toEncodingList ∷ [Int32] → Encoding # | |
ToJSON Int64 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Int64 → Encoding # toJSONList ∷ [Int64] → Value # toEncodingList ∷ [Int64] → Encoding # | |
ToJSON Integer | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Integer → Encoding # toJSONList ∷ [Integer] → Value # toEncodingList ∷ [Integer] → Encoding # | |
ToJSON Natural | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Natural → Encoding # toJSONList ∷ [Natural] → Value # toEncodingList ∷ [Natural] → Encoding # | |
ToJSON Ordering | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Ordering → Encoding # toJSONList ∷ [Ordering] → Value # toEncodingList ∷ [Ordering] → Encoding # | |
ToJSON Word | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Word → Encoding # toJSONList ∷ [Word] → Value # toEncodingList ∷ [Word] → Encoding # | |
ToJSON Word8 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Word8 → Encoding # toJSONList ∷ [Word8] → Value # toEncodingList ∷ [Word8] → Encoding # | |
ToJSON Word16 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Word16 → Encoding # toJSONList ∷ [Word16] → Value # toEncodingList ∷ [Word16] → Encoding # | |
ToJSON Word32 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Word32 → Encoding # toJSONList ∷ [Word32] → Value # toEncodingList ∷ [Word32] → Encoding # | |
ToJSON Word64 | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Word64 → Encoding # toJSONList ∷ [Word64] → Value # toEncodingList ∷ [Word64] → Encoding # | |
ToJSON () | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON Void | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Void → Encoding # toJSONList ∷ [Void] → Value # toEncodingList ∷ [Void] → Encoding # | |
ToJSON Version | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Version → Encoding # toJSONList ∷ [Version] → Value # toEncodingList ∷ [Version] → Encoding # | |
ToJSON CTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ CTime → Encoding # toJSONList ∷ [CTime] → Value # toEncodingList ∷ [CTime] → Encoding # | |
(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # | |
Defined in GeniusYield.Imports Methods toJSON ∷ ByteString → Value # toEncoding ∷ ByteString → Encoding # toJSONList ∷ [ByteString] → Value # toEncodingList ∷ [ByteString] → Encoding # | |
ToJSON IntSet | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ IntSet → Encoding # toJSONList ∷ [IntSet] → Value # toEncodingList ∷ [IntSet] → Encoding # | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Text → Encoding # toJSONList ∷ [Text] → Value # toEncodingList ∷ [Text] → Encoding # | |
ToJSON Text | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Text → Encoding # toJSONList ∷ [Text] → Value # toEncodingList ∷ [Text] → Encoding # | |
ToJSON ZonedTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ ZonedTime → Encoding # toJSONList ∷ [ZonedTime] → Value # toEncodingList ∷ [ZonedTime] → Encoding # | |
ToJSON LocalTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ LocalTime → Encoding # toJSONList ∷ [LocalTime] → Value # toEncodingList ∷ [LocalTime] → Encoding # | |
ToJSON TimeOfDay | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ TimeOfDay → Encoding # toJSONList ∷ [TimeOfDay] → Value # toEncodingList ∷ [TimeOfDay] → Encoding # | |
ToJSON CalendarDiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ CalendarDiffTime → Value # toEncoding ∷ CalendarDiffTime → Encoding # toJSONList ∷ [CalendarDiffTime] → Value # toEncodingList ∷ [CalendarDiffTime] → Encoding # | |
ToJSON UTCTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ UTCTime → Encoding # toJSONList ∷ [UTCTime] → Value # toEncodingList ∷ [UTCTime] → Encoding # | |
ToJSON SystemTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ SystemTime → Value # toEncoding ∷ SystemTime → Encoding # toJSONList ∷ [SystemTime] → Value # toEncodingList ∷ [SystemTime] → Encoding # | |
ToJSON NominalDiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ NominalDiffTime → Value # toEncoding ∷ NominalDiffTime → Encoding # toJSONList ∷ [NominalDiffTime] → Value # toEncodingList ∷ [NominalDiffTime] → Encoding # | |
ToJSON DiffTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ DiffTime → Encoding # toJSONList ∷ [DiffTime] → Value # toEncodingList ∷ [DiffTime] → Encoding # | |
ToJSON DayOfWeek | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ DayOfWeek → Encoding # toJSONList ∷ [DayOfWeek] → Value # toEncodingList ∷ [DayOfWeek] → Encoding # | |
ToJSON Day | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON CalendarDiffDays | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ CalendarDiffDays → Value # toEncoding ∷ CalendarDiffDays → Encoding # toJSONList ∷ [CalendarDiffDays] → Value # toEncodingList ∷ [CalendarDiffDays] → Encoding # | |
ToJSON StakeAddress | |
Defined in Cardano.Api.Address Methods toJSON ∷ StakeAddress → Value # toEncoding ∷ StakeAddress → Encoding # toJSONList ∷ [StakeAddress] → Value # toEncodingList ∷ [StakeAddress] → Encoding # | |
ToJSON StakeCredential | |
Defined in Cardano.Api.Address Methods toJSON ∷ StakeCredential → Value # toEncoding ∷ StakeCredential → Encoding # toJSONList ∷ [StakeCredential] → Value # toEncodingList ∷ [StakeCredential] → Encoding # | |
ToJSON ChainTip | |
Defined in Cardano.Api.Block Methods toEncoding ∷ ChainTip → Encoding # toJSONList ∷ [ChainTip] → Value # toEncodingList ∷ [ChainTip] → Encoding # | |
ToJSON AnyCardanoEra | |
Defined in Cardano.Api.Eras Methods toJSON ∷ AnyCardanoEra → Value # toEncoding ∷ AnyCardanoEra → Encoding # toJSONList ∷ [AnyCardanoEra] → Value # toEncodingList ∷ [AnyCardanoEra] → Encoding # | |
ToJSON CostModel | |
Defined in Cardano.Api.ProtocolParameters Methods toEncoding ∷ CostModel → Encoding # toJSONList ∷ [CostModel] → Value # toEncodingList ∷ [CostModel] → Encoding # | |
ToJSON ExecutionUnitPrices | |
Defined in Cardano.Api.ProtocolParameters Methods toJSON ∷ ExecutionUnitPrices → Value # toEncoding ∷ ExecutionUnitPrices → Encoding # toJSONList ∷ [ExecutionUnitPrices] → Value # toEncodingList ∷ [ExecutionUnitPrices] → Encoding # | |
ToJSON PraosNonce | |
Defined in Cardano.Api.ProtocolParameters Methods toEncoding ∷ PraosNonce → Encoding # toJSONList ∷ [PraosNonce] → Value # toEncodingList ∷ [PraosNonce] → Encoding # | |
ToJSON AnyPlutusScriptVersion | |
Defined in Cardano.Api.Script Methods toJSON ∷ AnyPlutusScriptVersion → Value # toEncoding ∷ AnyPlutusScriptVersion → Encoding # toJSONList ∷ [AnyPlutusScriptVersion] → Value # toEncodingList ∷ [AnyPlutusScriptVersion] → Encoding # | |
ToJSON ExecutionUnits | |
Defined in Cardano.Api.Script Methods toJSON ∷ ExecutionUnits → Value # toEncoding ∷ ExecutionUnits → Encoding # toJSONList ∷ [ExecutionUnits] → Value # toEncodingList ∷ [ExecutionUnits] → Encoding # | |
ToJSON ScriptHash | |
Defined in Cardano.Api.Script Methods toEncoding ∷ ScriptHash → Encoding # toJSONList ∷ [ScriptHash] → Value # toEncodingList ∷ [ScriptHash] → Encoding # | |
ToJSON ScriptInAnyLang | |
Defined in Cardano.Api.Script Methods toJSON ∷ ScriptInAnyLang → Value # toEncoding ∷ ScriptInAnyLang → Encoding # toJSONList ∷ [ScriptInAnyLang] → Value # toEncodingList ∷ [ScriptInAnyLang] → Encoding # | |
ToJSON TextEnvelope | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods toJSON ∷ TextEnvelope → Value # toEncoding ∷ TextEnvelope → Encoding # toJSONList ∷ [TextEnvelope] → Value # toEncodingList ∷ [TextEnvelope] → Encoding # | |
ToJSON TextEnvelopeDescr | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods toJSON ∷ TextEnvelopeDescr → Value # toEncoding ∷ TextEnvelopeDescr → Encoding # toJSONList ∷ [TextEnvelopeDescr] → Value # toEncodingList ∷ [TextEnvelopeDescr] → Encoding # | |
ToJSON TextEnvelopeType | |
Defined in Cardano.Api.SerialiseTextEnvelope Methods toJSON ∷ TextEnvelopeType → Value # toEncoding ∷ TextEnvelopeType → Encoding # toJSONList ∷ [TextEnvelopeType] → Value # toEncodingList ∷ [TextEnvelopeType] → Encoding # | |
ToJSON TxId | |
Defined in Cardano.Api.TxIn Methods toEncoding ∷ TxId → Encoding # toJSONList ∷ [TxId] → Value # toEncodingList ∷ [TxId] → Encoding # | |
ToJSON TxIn | |
Defined in Cardano.Api.TxIn Methods toEncoding ∷ TxIn → Encoding # toJSONList ∷ [TxIn] → Value # toEncodingList ∷ [TxIn] → Encoding # | |
ToJSON TxIx | |
Defined in Cardano.Api.TxIn Methods toEncoding ∷ TxIx → Encoding # toJSONList ∷ [TxIx] → Value # toEncodingList ∷ [TxIx] → Encoding # | |
ToJSON AssetName | |
Defined in Cardano.Api.Value Methods toEncoding ∷ AssetName → Encoding # toJSONList ∷ [AssetName] → Value # toEncodingList ∷ [AssetName] → Encoding # | |
ToJSON Lovelace | |
Defined in Cardano.Api.Value Methods toEncoding ∷ Lovelace → Encoding # toJSONList ∷ [Lovelace] → Value # toEncodingList ∷ [Lovelace] → Encoding # | |
ToJSON PolicyId | |
Defined in Cardano.Api.Value Methods toEncoding ∷ PolicyId → Encoding # toJSONList ∷ [PolicyId] → Value # toEncodingList ∷ [PolicyId] → Encoding # | |
ToJSON Quantity | |
Defined in Cardano.Api.Value Methods toEncoding ∷ Quantity → Encoding # toJSONList ∷ [Quantity] → Value # toEncodingList ∷ [Quantity] → Encoding # | |
ToJSON Value | |
Defined in Cardano.Api.Value Methods toEncoding ∷ Value → Encoding # toJSONList ∷ [Value] → Value0 # toEncodingList ∷ [Value] → Encoding # | |
ToJSON ValueNestedRep | |
Defined in Cardano.Api.Value Methods toJSON ∷ ValueNestedRep → Value # toEncoding ∷ ValueNestedRep → Encoding # toJSONList ∷ [ValueNestedRep] → Value # toEncodingList ∷ [ValueNestedRep] → Encoding # | |
ToJSON EpochNo | |
Defined in Cardano.Slotting.Slot Methods toEncoding ∷ EpochNo → Encoding # toJSONList ∷ [EpochNo] → Value # toEncodingList ∷ [EpochNo] → Encoding # | |
ToJSON SlotNo | |
Defined in Cardano.Slotting.Slot Methods toEncoding ∷ SlotNo → Encoding # toJSONList ∷ [SlotNo] → Value # toEncodingList ∷ [SlotNo] → Encoding # | |
ToJSON ProtVer | |
Defined in Cardano.Ledger.BaseTypes Methods toEncoding ∷ ProtVer → Encoding # toJSONList ∷ [ProtVer] → Value # toEncodingList ∷ [ProtVer] → Encoding # | |
ToJSON RequiresNetworkMagic | |
Defined in Cardano.Crypto.ProtocolMagic Methods toJSON ∷ RequiresNetworkMagic → Value # toEncoding ∷ RequiresNetworkMagic → Encoding # toJSONList ∷ [RequiresNetworkMagic] → Value # toEncodingList ∷ [RequiresNetworkMagic] → Encoding # | |
ToJSON ProtocolVersion | |
Defined in Cardano.Chain.Update.ProtocolVersion Methods toJSON ∷ ProtocolVersion → Value # toEncoding ∷ ProtocolVersion → Encoding # toJSONList ∷ [ProtocolVersion] → Value # toEncodingList ∷ [ProtocolVersion] → Encoding # | |
ToJSON ProtocolMagicId | |
Defined in Cardano.Crypto.ProtocolMagic Methods toJSON ∷ ProtocolMagicId → Value # toEncoding ∷ ProtocolMagicId → Encoding # toJSONList ∷ [ProtocolMagicId] → Value # toEncodingList ∷ [ProtocolMagicId] → Encoding # | |
ToJSON SoftwareVersion | |
Defined in Cardano.Chain.Update.SoftwareVersion Methods toJSON ∷ SoftwareVersion → Value # toEncoding ∷ SoftwareVersion → Encoding # toJSONList ∷ [SoftwareVersion] → Value # toEncodingList ∷ [SoftwareVersion] → Encoding # | |
ToJSON CompactRedeemVerificationKey | |
Defined in Cardano.Crypto.Signing.Redeem.Compact Methods toJSON ∷ CompactRedeemVerificationKey → Value # toEncoding ∷ CompactRedeemVerificationKey → Encoding # toJSONList ∷ [CompactRedeemVerificationKey] → Value # toEncodingList ∷ [CompactRedeemVerificationKey] → Encoding # | |
ToJSON Lovelace | |
Defined in Cardano.Chain.Common.Lovelace Methods toEncoding ∷ Lovelace → Encoding # toJSONList ∷ [Lovelace] → Value # toEncodingList ∷ [Lovelace] → Encoding # | |
ToJSON VerificationKey | |
Defined in Cardano.Crypto.Signing.VerificationKey Methods toJSON ∷ VerificationKey → Value # toEncoding ∷ VerificationKey → Encoding # toJSONList ∷ [VerificationKey] → Value # toEncodingList ∷ [VerificationKey] → Encoding # | |
ToJSON GenesisHash | |
Defined in Cardano.Chain.Genesis.Hash Methods toJSON ∷ GenesisHash → Value # toEncoding ∷ GenesisHash → Encoding # toJSONList ∷ [GenesisHash] → Value # toEncodingList ∷ [GenesisHash] → Encoding # | |
ToJSON SlotNumber | |
Defined in Cardano.Chain.Slotting.SlotNumber Methods toEncoding ∷ SlotNumber → Encoding # toJSONList ∷ [SlotNumber] → Value # toEncodingList ∷ [SlotNumber] → Encoding # | |
ToJSON Tx | |
Defined in Cardano.Chain.UTxO.Tx | |
ToJSON ByteSpan | |
Defined in Cardano.Binary.Annotated Methods toEncoding ∷ ByteSpan → Encoding # toJSONList ∷ [ByteSpan] → Value # toEncodingList ∷ [ByteSpan] → Encoding # | |
ToJSON EpochNumber | |
Defined in Cardano.Chain.Slotting.EpochNumber Methods toJSON ∷ EpochNumber → Value # toEncoding ∷ EpochNumber → Encoding # toJSONList ∷ [EpochNumber] → Value # toEncodingList ∷ [EpochNumber] → Encoding # | |
ToJSON ProtocolMagic | |
Defined in Cardano.Crypto.ProtocolMagic Methods toJSON ∷ ProtocolMagic → Value # toEncoding ∷ ProtocolMagic → Encoding # toJSONList ∷ [ProtocolMagic] → Value # toEncodingList ∷ [ProtocolMagic] → Encoding # | |
ToJSON PositiveUnitInterval | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ PositiveUnitInterval → Value # toEncoding ∷ PositiveUnitInterval → Encoding # toJSONList ∷ [PositiveUnitInterval] → Value # toEncodingList ∷ [PositiveUnitInterval] → Encoding # | |
ToJSON Network | |
Defined in Cardano.Ledger.BaseTypes Methods toEncoding ∷ Network → Encoding # toJSONList ∷ [Network] → Value # toEncodingList ∷ [Network] → Encoding # | |
ToJSON Coin | |
Defined in Cardano.Ledger.Coin Methods toEncoding ∷ Coin → Encoding # toJSONList ∷ [Coin] → Value # toEncodingList ∷ [Coin] → Encoding # | |
ToJSON Nonce | |
Defined in Cardano.Ledger.BaseTypes Methods toEncoding ∷ Nonce → Encoding # toJSONList ∷ [Nonce] → Value # toEncodingList ∷ [Nonce] → Encoding # | |
ToJSON Value | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Value → Encoding # toJSONList ∷ [Value] → Value # toEncodingList ∷ [Value] → Encoding # | |
ToJSON Key | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON StakePoolRelay | |
Defined in Cardano.Ledger.Shelley.TxBody Methods toJSON ∷ StakePoolRelay → Value # toEncoding ∷ StakePoolRelay → Encoding # toJSONList ∷ [StakePoolRelay] → Value # toEncodingList ∷ [StakePoolRelay] → Encoding # | |
ToJSON RewardParams | |
Defined in Cardano.Ledger.Shelley.API.Wallet Methods toJSON ∷ RewardParams → Value # toEncoding ∷ RewardParams → Encoding # toJSONList ∷ [RewardParams] → Value # toEncodingList ∷ [RewardParams] → Encoding # | |
ToJSON RewardInfoPool | |
Defined in Cardano.Ledger.Shelley.API.Wallet Methods toJSON ∷ RewardInfoPool → Value # toEncoding ∷ RewardInfoPool → Encoding # toJSONList ∷ [RewardInfoPool] → Value # toEncodingList ∷ [RewardInfoPool] → Encoding # | |
ToJSON UnitInterval | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ UnitInterval → Value # toEncoding ∷ UnitInterval → Encoding # toJSONList ∷ [UnitInterval] → Value # toEncodingList ∷ [UnitInterval] → Encoding # | |
ToJSON NonNegativeInterval | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ NonNegativeInterval → Value # toEncoding ∷ NonNegativeInterval → Encoding # toJSONList ∷ [NonNegativeInterval] → Value # toEncodingList ∷ [NonNegativeInterval] → Encoding # | |
ToJSON AlonzoGenesis | |
Defined in Cardano.Ledger.Alonzo.Genesis Methods toJSON ∷ AlonzoGenesis → Value # toEncoding ∷ AlonzoGenesis → Encoding # toJSONList ∷ [AlonzoGenesis] → Value # toEncodingList ∷ [AlonzoGenesis] → Encoding # | |
ToJSON ExCPU | |
Defined in PlutusCore.Evaluation.Machine.ExMemory Methods toEncoding ∷ ExCPU → Encoding # toJSONList ∷ [ExCPU] → Value # toEncodingList ∷ [ExCPU] → Encoding # | |
ToJSON ExMemory | |
Defined in PlutusCore.Evaluation.Machine.ExMemory Methods toEncoding ∷ ExMemory → Encoding # toJSONList ∷ [ExMemory] → Value # toEncodingList ∷ [ExMemory] → Encoding # | |
ToJSON ExBudget | |
Defined in PlutusCore.Evaluation.Machine.ExBudget Methods toEncoding ∷ ExBudget → Encoding # toJSONList ∷ [ExBudget] → Value # toEncodingList ∷ [ExBudget] → Encoding # | |
ToJSON Desirability | |
Defined in Cardano.Ledger.Shelley.RewardProvenance Methods toJSON ∷ Desirability → Value # toEncoding ∷ Desirability → Encoding # toJSONList ∷ [Desirability] → Value # toEncodingList ∷ [Desirability] → Encoding # | |
ToJSON PoolMetadata | |
Defined in Cardano.Ledger.Shelley.TxBody Methods toJSON ∷ PoolMetadata → Value # toEncoding ∷ PoolMetadata → Encoding # toJSONList ∷ [PoolMetadata] → Value # toEncodingList ∷ [PoolMetadata] → Encoding # | |
ToJSON Number | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Number → Encoding # toJSONList ∷ [Number] → Value # toEncodingList ∷ [Number] → Encoding # | |
ToJSON Scientific | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Scientific → Encoding # toJSONList ∷ [Scientific] → Value # toEncodingList ∷ [Scientific] → Encoding # | |
ToJSON ProtocolParameters | |
Defined in Cardano.Api.ProtocolParameters Methods toJSON ∷ ProtocolParameters → Value # toEncoding ∷ ProtocolParameters → Encoding # toJSONList ∷ [ProtocolParameters] → Value # toEncodingList ∷ [ProtocolParameters] → Encoding # | |
ToJSON EpochSize | |
Defined in Cardano.Slotting.Slot Methods toEncoding ∷ EpochSize → Encoding # toJSONList ∷ [EpochSize] → Value # toEncodingList ∷ [EpochSize] → Encoding # | |
ToJSON DotNetTime | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ DotNetTime → Encoding # toJSONList ∷ [DotNetTime] → Value # toEncodingList ∷ [DotNetTime] → Encoding # | |
ToJSON Month | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Month → Encoding # toJSONList ∷ [Month] → Value # toEncodingList ∷ [Month] → Encoding # | |
ToJSON Quarter | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Quarter → Encoding # toJSONList ∷ [Quarter] → Value # toEncodingList ∷ [Quarter] → Encoding # | |
ToJSON QuarterOfYear | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ QuarterOfYear → Value # toEncoding ∷ QuarterOfYear → Encoding # toJSONList ∷ [QuarterOfYear] → Value # toEncodingList ∷ [QuarterOfYear] → Encoding # | |
ToJSON ShortText | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ ShortText → Encoding # toJSONList ∷ [ShortText] → Value # toEncodingList ∷ [ShortText] → Encoding # | |
ToJSON UUID | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ UUID → Encoding # toJSONList ∷ [UUID] → Value # toEncodingList ∷ [UUID] → Encoding # | |
ToJSON BaseUrl | |
Defined in Servant.Client.Core.BaseUrl Methods toEncoding ∷ BaseUrl → Encoding # toJSONList ∷ [BaseUrl] → Value # toEncodingList ∷ [BaseUrl] → Encoding # | |
ToJSON ByteString64 | |
Defined in Data.ByteString.Base64.Type Methods toJSON ∷ ByteString64 → Value # toEncoding ∷ ByteString64 → Encoding # toJSONList ∷ [ByteString64] → Value # toEncodingList ∷ [ByteString64] → Encoding # | |
ToJSON Address | |
Defined in Cardano.Chain.Common.Address Methods toEncoding ∷ Address → Encoding # toJSONList ∷ [Address] → Value # toEncodingList ∷ [Address] → Encoding # | |
ToJSON NetworkMagic | |
Defined in Cardano.Chain.Common.NetworkMagic Methods toJSON ∷ NetworkMagic → Value # toEncoding ∷ NetworkMagic → Encoding # toJSONList ∷ [NetworkMagic] → Value # toEncodingList ∷ [NetworkMagic] → Encoding # | |
ToJSON AddrAttributes | |
Defined in Cardano.Chain.Common.AddrAttributes Methods toJSON ∷ AddrAttributes → Value # toEncoding ∷ AddrAttributes → Encoding # toJSONList ∷ [AddrAttributes] → Value # toEncodingList ∷ [AddrAttributes] → Encoding # | |
ToJSON HDAddressPayload | |
Defined in Cardano.Chain.Common.AddrAttributes Methods toJSON ∷ HDAddressPayload → Value # toEncoding ∷ HDAddressPayload → Encoding # toJSONList ∷ [HDAddressPayload] → Value # toEncodingList ∷ [HDAddressPayload] → Encoding # | |
ToJSON Url | |
Defined in Cardano.Ledger.BaseTypes | |
ToJSON CekMachineCosts | |
Defined in UntypedPlutusCore.Evaluation.Machine.Cek.CekMachineCosts Methods toJSON ∷ CekMachineCosts → Value # toEncoding ∷ CekMachineCosts → Encoding # toJSONList ∷ [CekMachineCosts] → Value # toEncodingList ∷ [CekMachineCosts] → Encoding # | |
ToJSON TxInWitness | |
Defined in Cardano.Chain.UTxO.TxWitness Methods toJSON ∷ TxInWitness → Value # toEncoding ∷ TxInWitness → Encoding # toJSONList ∷ [TxInWitness] → Value # toEncodingList ∷ [TxInWitness] → Encoding # | |
ToJSON TxSigData | |
Defined in Cardano.Chain.UTxO.TxWitness Methods toEncoding ∷ TxSigData → Encoding # toJSONList ∷ [TxSigData] → Value # toEncodingList ∷ [TxSigData] → Encoding # | |
ToJSON TxIn | |
Defined in Cardano.Chain.UTxO.Tx Methods toEncoding ∷ TxIn → Encoding # toJSONList ∷ [TxIn] → Value # toEncodingList ∷ [TxIn] → Encoding # | |
ToJSON RedeemVerificationKey | |
Defined in Cardano.Crypto.Signing.Redeem.VerificationKey Methods toJSON ∷ RedeemVerificationKey → Value # toEncoding ∷ RedeemVerificationKey → Encoding # toJSONList ∷ [RedeemVerificationKey] → Value # toEncodingList ∷ [RedeemVerificationKey] → Encoding # | |
ToJSON DnsName | |
Defined in Cardano.Ledger.BaseTypes Methods toEncoding ∷ DnsName → Encoding # toJSONList ∷ [DnsName] → Value # toEncodingList ∷ [DnsName] → Encoding # | |
ToJSON Port | |
Defined in Cardano.Ledger.BaseTypes Methods toEncoding ∷ Port → Encoding # toJSONList ∷ [Port] → Value # toEncodingList ∷ [Port] → Encoding # | |
ToJSON PositiveInterval | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ PositiveInterval → Value # toEncoding ∷ PositiveInterval → Encoding # toJSONList ∷ [PositiveInterval] → Value # toEncodingList ∷ [PositiveInterval] → Encoding # | |
ToJSON ChainDifficulty | |
Defined in Cardano.Chain.Common.ChainDifficulty Methods toJSON ∷ ChainDifficulty → Value # toEncoding ∷ ChainDifficulty → Encoding # toJSONList ∷ [ChainDifficulty] → Value # toEncodingList ∷ [ChainDifficulty] → Encoding # | |
ToJSON Proof | |
Defined in Cardano.Chain.Block.Proof Methods toEncoding ∷ Proof → Encoding # toJSONList ∷ [Proof] → Value # toEncodingList ∷ [Proof] → Encoding # | |
ToJSON SscPayload | |
Defined in Cardano.Chain.Ssc Methods toEncoding ∷ SscPayload → Encoding # toJSONList ∷ [SscPayload] → Value # toEncodingList ∷ [SscPayload] → Encoding # | |
ToJSON ProposalBody | |
Defined in Cardano.Chain.Update.Proposal Methods toJSON ∷ ProposalBody → Value # toEncoding ∷ ProposalBody → Encoding # toJSONList ∷ [ProposalBody] → Value # toEncodingList ∷ [ProposalBody] → Encoding # | |
ToJSON SscProof | |
Defined in Cardano.Chain.Ssc Methods toEncoding ∷ SscProof → Encoding # toJSONList ∷ [SscProof] → Value # toEncodingList ∷ [SscProof] → Encoding # | |
ToJSON TxProof | |
Defined in Cardano.Chain.UTxO.TxProof Methods toEncoding ∷ TxProof → Encoding # toJSONList ∷ [TxProof] → Value # toEncodingList ∷ [TxProof] → Encoding # | |
ToJSON ApplicationName | |
Defined in Cardano.Chain.Update.ApplicationName Methods toJSON ∷ ApplicationName → Value # toEncoding ∷ ApplicationName → Encoding # toJSONList ∷ [ApplicationName] → Value # toEncodingList ∷ [ApplicationName] → Encoding # | |
ToJSON TxOut | |
Defined in Cardano.Chain.UTxO.Tx Methods toEncoding ∷ TxOut → Encoding # toJSONList ∷ [TxOut] → Value # toEncodingList ∷ [TxOut] → Encoding # | |
ToJSON AddrType | |
Defined in Cardano.Chain.Common.AddrSpendingData Methods toEncoding ∷ AddrType → Encoding # toJSONList ∷ [AddrType] → Value # toEncodingList ∷ [AddrType] → Encoding # | |
ToJSON UnparsedFields | |
Defined in Cardano.Chain.Common.Attributes Methods toJSON ∷ UnparsedFields → Value # toEncoding ∷ UnparsedFields → Encoding # toJSONList ∷ [UnparsedFields] → Value # toEncodingList ∷ [UnparsedFields] → Encoding # | |
ToJSON LovelacePortion | |
Defined in Cardano.Chain.Common.LovelacePortion Methods toJSON ∷ LovelacePortion → Value # toEncoding ∷ LovelacePortion → Encoding # toJSONList ∷ [LovelacePortion] → Value # toEncodingList ∷ [LovelacePortion] → Encoding # | |
ToJSON TxFeePolicy | |
Defined in Cardano.Chain.Common.TxFeePolicy Methods toJSON ∷ TxFeePolicy → Value # toEncoding ∷ TxFeePolicy → Encoding # toJSONList ∷ [TxFeePolicy] → Value # toEncodingList ∷ [TxFeePolicy] → Encoding # | |
ToJSON TxSizeLinear | |
Defined in Cardano.Chain.Common.TxSizeLinear Methods toJSON ∷ TxSizeLinear → Value # toEncoding ∷ TxSizeLinear → Encoding # toJSONList ∷ [TxSizeLinear] → Value # toEncodingList ∷ [TxSizeLinear] → Encoding # | |
ToJSON SoftforkRule | |
Defined in Cardano.Chain.Update.SoftforkRule Methods toJSON ∷ SoftforkRule → Value # toEncoding ∷ SoftforkRule → Encoding # toJSONList ∷ [SoftforkRule] → Value # toEncodingList ∷ [SoftforkRule] → Encoding # | |
ToJSON InstallerHash | |
Defined in Cardano.Chain.Update.InstallerHash Methods toJSON ∷ InstallerHash → Value # toEncoding ∷ InstallerHash → Encoding # toJSONList ∷ [InstallerHash] → Value # toEncodingList ∷ [InstallerHash] → Encoding # | |
ToJSON SystemTag | |
Defined in Cardano.Chain.Update.SystemTag Methods toEncoding ∷ SystemTag → Encoding # toJSONList ∷ [SystemTag] → Value # toEncodingList ∷ [SystemTag] → Encoding # | |
ToJSON ProtocolParametersUpdate | |
Defined in Cardano.Chain.Update.ProtocolParametersUpdate Methods toJSON ∷ ProtocolParametersUpdate → Value # toEncoding ∷ ProtocolParametersUpdate → Encoding # toJSONList ∷ [ProtocolParametersUpdate] → Value # toEncodingList ∷ [ProtocolParametersUpdate] → Encoding # | |
ToJSON PeerAdvertise | |
Defined in Ouroboros.Network.PeerSelection.Types Methods toJSON ∷ PeerAdvertise → Value # toEncoding ∷ PeerAdvertise → Encoding # toJSONList ∷ [PeerAdvertise] → Value # toEncodingList ∷ [PeerAdvertise] → Encoding # | |
ToJSON SatInt | |
Defined in Data.SatInt Methods toEncoding ∷ SatInt → Encoding # toJSONList ∷ [SatInt] → Value # toEncodingList ∷ [SatInt] → Encoding # | |
ToJSON ModelAddedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelAddedSizes → Value # toEncoding ∷ ModelAddedSizes → Encoding # toJSONList ∷ [ModelAddedSizes] → Value # toEncodingList ∷ [ModelAddedSizes] → Encoding # | |
ToJSON ModelConstantOrLinear | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelConstantOrLinear → Value # toEncoding ∷ ModelConstantOrLinear → Encoding # toJSONList ∷ [ModelConstantOrLinear] → Value # toEncodingList ∷ [ModelConstantOrLinear] → Encoding # | |
ToJSON ModelConstantOrTwoArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelConstantOrTwoArguments → Value # toEncoding ∷ ModelConstantOrTwoArguments → Encoding # toJSONList ∷ [ModelConstantOrTwoArguments] → Value # toEncodingList ∷ [ModelConstantOrTwoArguments] → Encoding # | |
ToJSON ModelFiveArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelFiveArguments → Value # toEncoding ∷ ModelFiveArguments → Encoding # toJSONList ∷ [ModelFiveArguments] → Value # toEncodingList ∷ [ModelFiveArguments] → Encoding # | |
ToJSON ModelFourArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelFourArguments → Value # toEncoding ∷ ModelFourArguments → Encoding # toJSONList ∷ [ModelFourArguments] → Value # toEncodingList ∷ [ModelFourArguments] → Encoding # | |
ToJSON ModelLinearSize | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelLinearSize → Value # toEncoding ∷ ModelLinearSize → Encoding # toJSONList ∷ [ModelLinearSize] → Value # toEncodingList ∷ [ModelLinearSize] → Encoding # | |
ToJSON ModelMaxSize | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelMaxSize → Value # toEncoding ∷ ModelMaxSize → Encoding # toJSONList ∷ [ModelMaxSize] → Value # toEncodingList ∷ [ModelMaxSize] → Encoding # | |
ToJSON ModelMinSize | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelMinSize → Value # toEncoding ∷ ModelMinSize → Encoding # toJSONList ∷ [ModelMinSize] → Value # toEncodingList ∷ [ModelMinSize] → Encoding # | |
ToJSON ModelMultipliedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelMultipliedSizes → Value # toEncoding ∷ ModelMultipliedSizes → Encoding # toJSONList ∷ [ModelMultipliedSizes] → Value # toEncodingList ∷ [ModelMultipliedSizes] → Encoding # | |
ToJSON ModelOneArgument | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelOneArgument → Value # toEncoding ∷ ModelOneArgument → Encoding # toJSONList ∷ [ModelOneArgument] → Value # toEncodingList ∷ [ModelOneArgument] → Encoding # | |
ToJSON ModelSixArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelSixArguments → Value # toEncoding ∷ ModelSixArguments → Encoding # toJSONList ∷ [ModelSixArguments] → Value # toEncodingList ∷ [ModelSixArguments] → Encoding # | |
ToJSON ModelSubtractedSizes | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelSubtractedSizes → Value # toEncoding ∷ ModelSubtractedSizes → Encoding # toJSONList ∷ [ModelSubtractedSizes] → Value # toEncodingList ∷ [ModelSubtractedSizes] → Encoding # | |
ToJSON ModelThreeArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelThreeArguments → Value # toEncoding ∷ ModelThreeArguments → Encoding # toJSONList ∷ [ModelThreeArguments] → Value # toEncodingList ∷ [ModelThreeArguments] → Encoding # | |
ToJSON ModelTwoArguments | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ ModelTwoArguments → Value # toEncoding ∷ ModelTwoArguments → Encoding # toJSONList ∷ [ModelTwoArguments] → Value # toEncodingList ∷ [ModelTwoArguments] → Encoding # | |
ToJSON CovLoc | |
Defined in PlutusTx.Coverage Methods toEncoding ∷ CovLoc → Encoding # toJSONList ∷ [CovLoc] → Value # toEncodingList ∷ [CovLoc] → Encoding # | |
ToJSON CoverageAnnotation | |
Defined in PlutusTx.Coverage Methods toJSON ∷ CoverageAnnotation → Value # toEncoding ∷ CoverageAnnotation → Encoding # toJSONList ∷ [CoverageAnnotation] → Value # toEncodingList ∷ [CoverageAnnotation] → Encoding # | |
ToJSON CoverageData | |
Defined in PlutusTx.Coverage Methods toJSON ∷ CoverageData → Value # toEncoding ∷ CoverageData → Encoding # toJSONList ∷ [CoverageData] → Value # toEncodingList ∷ [CoverageData] → Encoding # | |
ToJSON CoverageIndex | |
Defined in PlutusTx.Coverage Methods toJSON ∷ CoverageIndex → Value # toEncoding ∷ CoverageIndex → Encoding # toJSONList ∷ [CoverageIndex] → Value # toEncodingList ∷ [CoverageIndex] → Encoding # | |
ToJSON CoverageMetadata | |
Defined in PlutusTx.Coverage Methods toJSON ∷ CoverageMetadata → Value # toEncoding ∷ CoverageMetadata → Encoding # toJSONList ∷ [CoverageMetadata] → Value # toEncodingList ∷ [CoverageMetadata] → Encoding # | |
ToJSON CoverageReport | |
Defined in PlutusTx.Coverage Methods toJSON ∷ CoverageReport → Value # toEncoding ∷ CoverageReport → Encoding # toJSONList ∷ [CoverageReport] → Value # toEncodingList ∷ [CoverageReport] → Encoding # | |
ToJSON Metadata | |
Defined in PlutusTx.Coverage Methods toEncoding ∷ Metadata → Encoding # toJSONList ∷ [Metadata] → Value # toEncodingList ∷ [Metadata] → Encoding # | |
ToJSON StudentT | |
Defined in Statistics.Distribution.StudentT Methods toEncoding ∷ StudentT → Encoding # toJSONList ∷ [StudentT] → Value # toEncodingList ∷ [StudentT] → Encoding # | |
ToJSON Environment | |
Defined in Katip.Core Methods toJSON ∷ Environment → Value # toEncoding ∷ Environment → Encoding # toJSONList ∷ [Environment] → Value # toEncodingList ∷ [Environment] → Encoding # | |
ToJSON Namespace | |
Defined in Katip.Core Methods toEncoding ∷ Namespace → Encoding # toJSONList ∷ [Namespace] → Value # toEncodingList ∷ [Namespace] → Encoding # | |
ToJSON Severity | |
Defined in Katip.Core Methods toEncoding ∷ Severity → Encoding # toJSONList ∷ [Severity] → Value # toEncodingList ∷ [Severity] → Encoding # | |
ToJSON SimpleLogPayload | |
Defined in Katip.Core Methods toJSON ∷ SimpleLogPayload → Value # toEncoding ∷ SimpleLogPayload → Encoding # toJSONList ∷ [SimpleLogPayload] → Value # toEncodingList ∷ [SimpleLogPayload] → Encoding # | |
ToJSON ThreadIdText | |
Defined in Katip.Core Methods toJSON ∷ ThreadIdText → Value # toEncoding ∷ ThreadIdText → Encoding # toJSONList ∷ [ThreadIdText] → Value # toEncodingList ∷ [ThreadIdText] → Encoding # | |
ToJSON Verbosity | |
Defined in Katip.Core Methods toEncoding ∷ Verbosity → Encoding # toJSONList ∷ [Verbosity] → Value # toEncodingList ∷ [Verbosity] → Encoding # | |
ToJSON LogContexts | |
Defined in Katip.Monadic Methods toJSON ∷ LogContexts → Value # toEncoding ∷ LogContexts → Encoding # toJSONList ∷ [LogContexts] → Value # toEncodingList ∷ [LogContexts] → Encoding # | |
ToJSON LocJs | |
Defined in Katip.Core Methods toEncoding ∷ LocJs → Encoding # toJSONList ∷ [LocJs] → Value # toEncodingList ∷ [LocJs] → Encoding # | |
ToJSON ProcessIDJs | |
Defined in Katip.Core Methods toJSON ∷ ProcessIDJs → Value # toEncoding ∷ ProcessIDJs → Encoding # toJSONList ∷ [ProcessIDJs] → Value # toEncodingList ∷ [ProcessIDJs] → Encoding # | |
ToJSON SentryRecord | |
Defined in System.Log.Raven.Types Methods toJSON ∷ SentryRecord → Value # toEncoding ∷ SentryRecord → Encoding # toJSONList ∷ [SentryRecord] → Value # toEncodingList ∷ [SentryRecord] → Encoding # | |
ToJSON SentryLevel | |
Defined in System.Log.Raven.Types Methods toJSON ∷ SentryLevel → Value # toEncoding ∷ SentryLevel → Encoding # toJSONList ∷ [SentryLevel] → Value # toEncodingList ∷ [SentryLevel] → Encoding # | |
ToJSON GYEra # | |
Defined in GeniusYield.Types.Era Methods toEncoding ∷ GYEra → Encoding # toJSONList ∷ [GYEra] → Value # toEncodingList ∷ [GYEra] → Encoding # | |
ToJSON GYDatumHash # | |
Defined in GeniusYield.Types.Datum Methods toJSON ∷ GYDatumHash → Value # toEncoding ∷ GYDatumHash → Encoding # toJSONList ∷ [GYDatumHash] → Value # toEncodingList ∷ [GYDatumHash] → Encoding # | |
ToJSON GYLogScribeConfig # |
|
Defined in GeniusYield.Types.Logging Methods toJSON ∷ GYLogScribeConfig → Value # toEncoding ∷ GYLogScribeConfig → Encoding # toJSONList ∷ [GYLogScribeConfig] → Value # toEncodingList ∷ [GYLogScribeConfig] → Encoding # | |
ToJSON GYLogScribeType # |
|
Defined in GeniusYield.Types.Logging Methods toJSON ∷ GYLogScribeType → Value # toEncoding ∷ GYLogScribeType → Encoding # toJSONList ∷ [GYLogScribeType] → Value # toEncodingList ∷ [GYLogScribeType] → Encoding # | |
ToJSON LogSrc # | |
Defined in GeniusYield.Types.Logging Methods toEncoding ∷ LogSrc → Encoding # toJSONList ∷ [LogSrc] → Value # toEncodingList ∷ [LogSrc] → Encoding # | |
ToJSON GYLogVerbosity # | |
Defined in GeniusYield.Types.Logging Methods toJSON ∷ GYLogVerbosity → Value # toEncoding ∷ GYLogVerbosity → Encoding # toJSONList ∷ [GYLogVerbosity] → Value # toEncodingList ∷ [GYLogVerbosity] → Encoding # | |
ToJSON GYLogSeverity # | |
Defined in GeniusYield.Types.Logging Methods toJSON ∷ GYLogSeverity → Value # toEncoding ∷ GYLogSeverity → Encoding # toJSONList ∷ [GYLogSeverity] → Value # toEncodingList ∷ [GYLogSeverity] → Encoding # | |
ToJSON GYNetworkId # |
|
Defined in GeniusYield.Types.NetworkId Methods toJSON ∷ GYNetworkId → Value # toEncoding ∷ GYNetworkId → Encoding # toJSONList ∷ [GYNetworkId] → Value # toEncodingList ∷ [GYNetworkId] → Encoding # | |
ToJSON AdditionalProperties | |
Defined in Data.Swagger.Internal Methods toJSON ∷ AdditionalProperties → Value # toEncoding ∷ AdditionalProperties → Encoding # toJSONList ∷ [AdditionalProperties] → Value # toEncodingList ∷ [AdditionalProperties] → Encoding # | |
ToJSON ApiKeyLocation | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ApiKeyLocation → Value # toEncoding ∷ ApiKeyLocation → Encoding # toJSONList ∷ [ApiKeyLocation] → Value # toEncodingList ∷ [ApiKeyLocation] → Encoding # | |
ToJSON ApiKeyParams | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ApiKeyParams → Value # toEncoding ∷ ApiKeyParams → Encoding # toJSONList ∷ [ApiKeyParams] → Value # toEncodingList ∷ [ApiKeyParams] → Encoding # | |
ToJSON Contact | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Contact → Encoding # toJSONList ∷ [Contact] → Value # toEncodingList ∷ [Contact] → Encoding # | |
ToJSON Example | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Example → Encoding # toJSONList ∷ [Example] → Value # toEncodingList ∷ [Example] → Encoding # | |
ToJSON ExternalDocs | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ExternalDocs → Value # toEncoding ∷ ExternalDocs → Encoding # toJSONList ∷ [ExternalDocs] → Value # toEncodingList ∷ [ExternalDocs] → Encoding # | |
ToJSON Header | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Header → Encoding # toJSONList ∷ [Header] → Value # toEncodingList ∷ [Header] → Encoding # | |
ToJSON Host | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Host → Encoding # toJSONList ∷ [Host] → Value # toEncodingList ∷ [Host] → Encoding # | |
ToJSON Info | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Info → Encoding # toJSONList ∷ [Info] → Value # toEncodingList ∷ [Info] → Encoding # | |
ToJSON License | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ License → Encoding # toJSONList ∷ [License] → Value # toEncodingList ∷ [License] → Encoding # | |
ToJSON MimeList | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ MimeList → Encoding # toJSONList ∷ [MimeList] → Value # toEncodingList ∷ [MimeList] → Encoding # | |
ToJSON OAuth2Flow | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ OAuth2Flow → Encoding # toJSONList ∷ [OAuth2Flow] → Value # toEncodingList ∷ [OAuth2Flow] → Encoding # | |
ToJSON OAuth2Params | |
Defined in Data.Swagger.Internal Methods toJSON ∷ OAuth2Params → Value # toEncoding ∷ OAuth2Params → Encoding # toJSONList ∷ [OAuth2Params] → Value # toEncodingList ∷ [OAuth2Params] → Encoding # | |
ToJSON Operation | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Operation → Encoding # toJSONList ∷ [Operation] → Value # toEncodingList ∷ [Operation] → Encoding # | |
ToJSON Param | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Param → Encoding # toJSONList ∷ [Param] → Value # toEncodingList ∷ [Param] → Encoding # | |
ToJSON ParamAnySchema | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ParamAnySchema → Value # toEncoding ∷ ParamAnySchema → Encoding # toJSONList ∷ [ParamAnySchema] → Value # toEncodingList ∷ [ParamAnySchema] → Encoding # | |
ToJSON ParamLocation | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ParamLocation → Value # toEncoding ∷ ParamLocation → Encoding # toJSONList ∷ [ParamLocation] → Value # toEncodingList ∷ [ParamLocation] → Encoding # | |
ToJSON ParamOtherSchema | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ParamOtherSchema → Value # toEncoding ∷ ParamOtherSchema → Encoding # toJSONList ∷ [ParamOtherSchema] → Value # toEncodingList ∷ [ParamOtherSchema] → Encoding # | |
ToJSON PathItem | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ PathItem → Encoding # toJSONList ∷ [PathItem] → Value # toEncodingList ∷ [PathItem] → Encoding # | |
ToJSON Reference | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Reference → Encoding # toJSONList ∷ [Reference] → Value # toEncodingList ∷ [Reference] → Encoding # | |
ToJSON Response | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Response → Encoding # toJSONList ∷ [Response] → Value # toEncodingList ∷ [Response] → Encoding # | |
ToJSON Responses | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Responses → Encoding # toJSONList ∷ [Responses] → Value # toEncodingList ∷ [Responses] → Encoding # | |
ToJSON Schema | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Schema → Encoding # toJSONList ∷ [Schema] → Value # toEncodingList ∷ [Schema] → Encoding # | |
ToJSON Scheme | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Scheme → Encoding # toJSONList ∷ [Scheme] → Value # toEncodingList ∷ [Scheme] → Encoding # | |
ToJSON SecurityDefinitions | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SecurityDefinitions → Value # toEncoding ∷ SecurityDefinitions → Encoding # toJSONList ∷ [SecurityDefinitions] → Value # toEncodingList ∷ [SecurityDefinitions] → Encoding # | |
ToJSON SecurityRequirement | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SecurityRequirement → Value # toEncoding ∷ SecurityRequirement → Encoding # toJSONList ∷ [SecurityRequirement] → Value # toEncodingList ∷ [SecurityRequirement] → Encoding # | |
ToJSON SecurityScheme | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SecurityScheme → Value # toEncoding ∷ SecurityScheme → Encoding # toJSONList ∷ [SecurityScheme] → Value # toEncodingList ∷ [SecurityScheme] → Encoding # | |
ToJSON SecuritySchemeType | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SecuritySchemeType → Value # toEncoding ∷ SecuritySchemeType → Encoding # toJSONList ∷ [SecuritySchemeType] → Value # toEncodingList ∷ [SecuritySchemeType] → Encoding # | |
ToJSON Swagger | |
Defined in Data.Swagger.Internal Methods toEncoding ∷ Swagger → Encoding # toJSONList ∷ [Swagger] → Value # toEncodingList ∷ [Swagger] → Encoding # | |
ToJSON Tag | |
Defined in Data.Swagger.Internal | |
ToJSON URL | |
Defined in Data.Swagger.Internal | |
ToJSON Xml | |
Defined in Data.Swagger.Internal | |
ToJSON GYPubKeyHash # |
|
Defined in GeniusYield.Types.PubKeyHash Methods toJSON ∷ GYPubKeyHash → Value # toEncoding ∷ GYPubKeyHash → Encoding # toJSONList ∷ [GYPubKeyHash] → Value # toEncodingList ∷ [GYPubKeyHash] → Encoding # | |
ToJSON GYPaymentSigningKey # |
|
Defined in GeniusYield.Types.Key Methods toJSON ∷ GYPaymentSigningKey → Value # toEncoding ∷ GYPaymentSigningKey → Encoding # toJSONList ∷ [GYPaymentSigningKey] → Value # toEncodingList ∷ [GYPaymentSigningKey] → Encoding # | |
ToJSON GYPaymentVerificationKey # |
|
Defined in GeniusYield.Types.Key Methods toJSON ∷ GYPaymentVerificationKey → Value # toEncoding ∷ GYPaymentVerificationKey → Encoding # toJSONList ∷ [GYPaymentVerificationKey] → Value # toEncodingList ∷ [GYPaymentVerificationKey] → Encoding # | |
ToJSON Rational | |
Defined in PlutusTx.Ratio Methods toEncoding ∷ Rational → Encoding # toJSONList ∷ [Rational] → Value # toEncodingList ∷ [Rational] → Encoding # | |
ToJSON GYRational # |
|
Defined in GeniusYield.Types.Rational Methods toJSON ∷ GYRational → Value # toEncoding ∷ GYRational → Encoding # toJSONList ∷ [GYRational] → Value # toEncodingList ∷ [GYRational] → Encoding # | |
ToJSON GYMintingPolicyId # | |
Defined in GeniusYield.Types.Script Methods toJSON ∷ GYMintingPolicyId → Value # toEncoding ∷ GYMintingPolicyId → Encoding # toJSONList ∷ [GYMintingPolicyId] → Value # toEncodingList ∷ [GYMintingPolicyId] → Encoding # | |
ToJSON GYAddressBech32 # |
|
Defined in GeniusYield.Types.Address Methods toJSON ∷ GYAddressBech32 → Value # toEncoding ∷ GYAddressBech32 → Encoding # toJSONList ∷ [GYAddressBech32] → Value # toEncodingList ∷ [GYAddressBech32] → Encoding # | |
ToJSON GYAddress # |
|
Defined in GeniusYield.Types.Address Methods toEncoding ∷ GYAddress → Encoding # toJSONList ∷ [GYAddress] → Value # toEncodingList ∷ [GYAddress] → Encoding # | |
ToJSON GYSlot # | |
Defined in GeniusYield.Types.Slot Methods toEncoding ∷ GYSlot → Encoding # toJSONList ∷ [GYSlot] → Value # toEncodingList ∷ [GYSlot] → Encoding # | |
ToJSON GYTime # |
|
Defined in GeniusYield.Types.Time Methods toEncoding ∷ GYTime → Encoding # toJSONList ∷ [GYTime] → Value # toEncodingList ∷ [GYTime] → Encoding # | |
ToJSON GYTxId # |
|
Defined in GeniusYield.Types.Tx Methods toEncoding ∷ GYTxId → Encoding # toJSONList ∷ [GYTxId] → Value # toEncodingList ∷ [GYTxId] → Encoding # | |
ToJSON GYTx # |
|
Defined in GeniusYield.Types.Tx Methods toEncoding ∷ GYTx → Encoding # toJSONList ∷ [GYTx] → Value # toEncodingList ∷ [GYTx] → Encoding # | |
ToJSON GYTxOutRef # | |
Defined in GeniusYield.Types.TxOutRef Methods toJSON ∷ GYTxOutRef → Value # toEncoding ∷ GYTxOutRef → Encoding # toJSONList ∷ [GYTxOutRef] → Value # toEncodingList ∷ [GYTxOutRef] → Encoding # | |
ToJSON GYTokenName # |
|
Defined in GeniusYield.Types.Value Methods toJSON ∷ GYTokenName → Value # toEncoding ∷ GYTokenName → Encoding # toJSONList ∷ [GYTokenName] → Value # toEncodingList ∷ [GYTokenName] → Encoding # | |
ToJSON GYAssetClass # |
|
Defined in GeniusYield.Types.Value Methods toJSON ∷ GYAssetClass → Value # toEncoding ∷ GYAssetClass → Encoding # toJSONList ∷ [GYAssetClass] → Value # toEncodingList ∷ [GYAssetClass] → Encoding # | |
ToJSON GYValue # |
|
Defined in GeniusYield.Types.Value Methods toEncoding ∷ GYValue → Encoding # toJSONList ∷ [GYValue] → Value # toEncodingList ∷ [GYValue] → Encoding # | |
ToJSON TokenPolicyId | |
Defined in Cardano.Wallet.Primitive.Types.TokenPolicy Methods toJSON ∷ TokenPolicyId → Value # toEncoding ∷ TokenPolicyId → Encoding # toJSONList ∷ [TokenPolicyId] → Value # toEncodingList ∷ [TokenPolicyId] → Encoding # | |
ToJSON TokenName | |
Defined in Cardano.Wallet.Primitive.Types.TokenPolicy Methods toEncoding ∷ TokenName → Encoding # toJSONList ∷ [TokenName] → Value # toEncodingList ∷ [TokenName] → Encoding # | |
ToJSON TokenQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenQuantity Methods toJSON ∷ TokenQuantity → Value # toEncoding ∷ TokenQuantity → Encoding # toJSONList ∷ [TokenQuantity] → Value # toEncodingList ∷ [TokenQuantity] → Encoding # | |
ToJSON FlatAssetQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods toJSON ∷ FlatAssetQuantity → Value # toEncoding ∷ FlatAssetQuantity → Encoding # toJSONList ∷ [FlatAssetQuantity] → Value # toEncodingList ∷ [FlatAssetQuantity] → Encoding # | |
ToJSON NestedMapEntry | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods toJSON ∷ NestedMapEntry → Value # toEncoding ∷ NestedMapEntry → Encoding # toJSONList ∷ [NestedMapEntry] → Value # toEncodingList ∷ [NestedMapEntry] → Encoding # | |
ToJSON NestedTokenQuantity | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods toJSON ∷ NestedTokenQuantity → Value # toEncoding ∷ NestedTokenQuantity → Encoding # toJSONList ∷ [NestedTokenQuantity] → Value # toEncodingList ∷ [NestedTokenQuantity] → Encoding # | |
ToJSON Percentage | |
Defined in Data.Quantity Methods toEncoding ∷ Percentage → Encoding # toJSONList ∷ [Percentage] → Value # toEncodingList ∷ [Percentage] → Encoding # | |
ToJSON Ada | |
Defined in Plutus.Model.Ada | |
ToJSON Slot | |
Defined in Plutus.Model.Fork.Ledger.Slot Methods toEncoding ∷ Slot → Encoding # toJSONList ∷ [Slot] → Value # toEncodingList ∷ [Slot] → Encoding # | |
ToJSON a ⇒ ToJSON [a] | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSON a ⇒ ToJSON (Maybe a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Maybe a → Encoding # toJSONList ∷ [Maybe a] → Value # toEncodingList ∷ [Maybe a] → Encoding # | |
(ToJSON a, Integral a) ⇒ ToJSON (Ratio a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Ratio a → Encoding # toJSONList ∷ [Ratio a] → Value # toEncodingList ∷ [Ratio a] → Encoding # | |
ToJSON a ⇒ ToJSON (Min a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Min a → Encoding # toJSONList ∷ [Min a] → Value # toEncodingList ∷ [Min a] → Encoding # | |
ToJSON a ⇒ ToJSON (Max a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Max a → Encoding # toJSONList ∷ [Max a] → Value # toEncodingList ∷ [Max a] → Encoding # | |
ToJSON a ⇒ ToJSON (First a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ First a → Encoding # toJSONList ∷ [First a] → Value # toEncodingList ∷ [First a] → Encoding # | |
ToJSON a ⇒ ToJSON (Last a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Last a → Encoding # toJSONList ∷ [Last a] → Value # toEncodingList ∷ [Last a] → Encoding # | |
ToJSON a ⇒ ToJSON (WrappedMonoid a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ WrappedMonoid a → Value # toEncoding ∷ WrappedMonoid a → Encoding # toJSONList ∷ [WrappedMonoid a] → Value # toEncodingList ∷ [WrappedMonoid a] → Encoding # | |
ToJSON a ⇒ ToJSON (Option a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Option a → Encoding # toJSONList ∷ [Option a] → Value # toEncodingList ∷ [Option a] → Encoding # | |
ToJSON a ⇒ ToJSON (Identity a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Identity a → Encoding # toJSONList ∷ [Identity a] → Value # toEncodingList ∷ [Identity a] → Encoding # | |
ToJSON a ⇒ ToJSON (First a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ First a → Encoding # toJSONList ∷ [First a] → Value # toEncodingList ∷ [First a] → Encoding # | |
ToJSON a ⇒ ToJSON (Last a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Last a → Encoding # toJSONList ∷ [Last a] → Value # toEncodingList ∷ [Last a] → Encoding # | |
ToJSON a ⇒ ToJSON (Dual a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Dual a → Encoding # toJSONList ∷ [Dual a] → Value # toEncodingList ∷ [Dual a] → Encoding # | |
ToJSON a ⇒ ToJSON (NonEmpty a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ NonEmpty a → Encoding # toJSONList ∷ [NonEmpty a] → Value # toEncodingList ∷ [NonEmpty a] → Encoding # | |
ToJSON a ⇒ ToJSON (IntMap a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ IntMap a → Encoding # toJSONList ∷ [IntMap a] → Value # toEncodingList ∷ [IntMap a] → Encoding # | |
ToJSON v ⇒ ToJSON (Tree v) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Tree v → Encoding # toJSONList ∷ [Tree v] → Value # toEncodingList ∷ [Tree v] → Encoding # | |
ToJSON a ⇒ ToJSON (Seq a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Seq a → Encoding # toJSONList ∷ [Seq a] → Value # toEncodingList ∷ [Seq a] → Encoding # | |
ToJSON a ⇒ ToJSON (Set a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Set a → Encoding # toJSONList ∷ [Set a] → Value # toEncodingList ∷ [Set a] → Encoding # | |
IsCardanoEra era ⇒ ToJSON (AddressInEra era) | |
Defined in Cardano.Api.Address Methods toJSON ∷ AddressInEra era → Value # toEncoding ∷ AddressInEra era → Encoding # toJSONList ∷ [AddressInEra era] → Value # toEncodingList ∷ [AddressInEra era] → Encoding # | |
ToJSON (CardanoEra era) | |
Defined in Cardano.Api.Eras Methods toJSON ∷ CardanoEra era → Value # toEncoding ∷ CardanoEra era → Encoding # toJSONList ∷ [CardanoEra era] → Value # toEncodingList ∷ [CardanoEra era] → Encoding # | |
ToJSON (Hash BlockHeader) | |
Defined in Cardano.Api.Block Methods toJSON ∷ Hash BlockHeader → Value # toEncoding ∷ Hash BlockHeader → Encoding # toJSONList ∷ [Hash BlockHeader] → Value # toEncodingList ∷ [Hash BlockHeader] → Encoding # | |
ToJSON (Hash ScriptData) | |
Defined in Cardano.Api.ScriptData Methods toJSON ∷ Hash ScriptData → Value # toEncoding ∷ Hash ScriptData → Encoding # toJSONList ∷ [Hash ScriptData] → Value # toEncodingList ∷ [Hash ScriptData] → Encoding # | |
ToJSON (Hash StakePoolKey) | |
Defined in Cardano.Api.KeysShelley Methods toJSON ∷ Hash StakePoolKey → Value # toEncoding ∷ Hash StakePoolKey → Encoding # toJSONList ∷ [Hash StakePoolKey] → Value # toEncodingList ∷ [Hash StakePoolKey] → Encoding # | |
IsCardanoEra era ⇒ ToJSON (UTxO era) | |
Defined in Cardano.Api.Query Methods toEncoding ∷ UTxO era → Encoding # toJSONList ∷ [UTxO era] → Value # toEncodingList ∷ [UTxO era] → Encoding # | |
ToJSON (SimpleScript lang) | |
Defined in Cardano.Api.Script Methods toJSON ∷ SimpleScript lang → Value # toEncoding ∷ SimpleScript lang → Encoding # toJSONList ∷ [SimpleScript lang] → Value # toEncodingList ∷ [SimpleScript lang] → Encoding # | |
ToJSON (MultiAssetSupportedInEra era) | |
Defined in Cardano.Api.TxBody Methods toJSON ∷ MultiAssetSupportedInEra era → Value # toEncoding ∷ MultiAssetSupportedInEra era → Encoding # toJSONList ∷ [MultiAssetSupportedInEra era] → Value # toEncodingList ∷ [MultiAssetSupportedInEra era] → Encoding # | |
ToJSON (TxOutValue era) | |
Defined in Cardano.Api.TxBody Methods toJSON ∷ TxOutValue era → Value # toEncoding ∷ TxOutValue era → Encoding # toJSONList ∷ [TxOutValue era] → Value # toEncodingList ∷ [TxOutValue era] → Encoding # | |
ToJSON a ⇒ ToJSON (AHeader a) | |
Defined in Cardano.Chain.Block.Header Methods toEncoding ∷ AHeader a → Encoding # toJSONList ∷ [AHeader a] → Value # toEncodingList ∷ [AHeader a] → Encoding # | |
ToJSON a ⇒ ToJSON (ATxAux a) | |
Defined in Cardano.Chain.UTxO.TxAux Methods toEncoding ∷ ATxAux a → Encoding # toJSONList ∷ [ATxAux a] → Value # toEncodingList ∷ [ATxAux a] → Encoding # | |
ToJSON a ⇒ ToJSON (ACertificate a) | |
Defined in Cardano.Chain.Delegation.Certificate Methods toJSON ∷ ACertificate a → Value # toEncoding ∷ ACertificate a → Encoding # toJSONList ∷ [ACertificate a] → Value # toEncodingList ∷ [ACertificate a] → Encoding # | |
ToJSON a ⇒ ToJSON (AProposal a) | |
Defined in Cardano.Chain.Update.Proposal Methods toJSON ∷ AProposal a → Value # toEncoding ∷ AProposal a → Encoding # toJSONList ∷ [AProposal a] → Value # toEncodingList ∷ [AProposal a] → Encoding # | |
ToJSON a ⇒ ToJSON (AVote a) | |
Defined in Cardano.Chain.Update.Vote Methods toEncoding ∷ AVote a → Encoding # toJSONList ∷ [AVote a] → Value # toEncodingList ∷ [AVote a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABlockOrBoundary a) | |
Defined in Cardano.Chain.Block.Block Methods toJSON ∷ ABlockOrBoundary a → Value # toEncoding ∷ ABlockOrBoundary a → Encoding # toJSONList ∷ [ABlockOrBoundary a] → Value # toEncodingList ∷ [ABlockOrBoundary a] → Encoding # | |
ToJSON a ⇒ ToJSON (StrictSeq a) | |
Defined in Data.Sequence.Strict Methods toJSON ∷ StrictSeq a → Value # toEncoding ∷ StrictSeq a → Encoding # toJSONList ∷ [StrictSeq a] → Value # toEncodingList ∷ [StrictSeq a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABoundaryHeader a) | |
Defined in Cardano.Chain.Block.Header Methods toJSON ∷ ABoundaryHeader a → Value # toEncoding ∷ ABoundaryHeader a → Encoding # toJSONList ∷ [ABoundaryHeader a] → Value # toEncodingList ∷ [ABoundaryHeader a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABoundaryBlock a) | |
Defined in Cardano.Chain.Block.Block Methods toJSON ∷ ABoundaryBlock a → Value # toEncoding ∷ ABoundaryBlock a → Encoding # toJSONList ∷ [ABoundaryBlock a] → Value # toEncodingList ∷ [ABoundaryBlock a] → Encoding # | |
Crypto crypto ⇒ ToJSON (ShelleyGenesisStaking crypto) | |
Defined in Cardano.Ledger.Shelley.Genesis Methods toJSON ∷ ShelleyGenesisStaking crypto → Value # toEncoding ∷ ShelleyGenesisStaking crypto → Encoding # toJSONList ∷ [ShelleyGenesisStaking crypto] → Value # toEncodingList ∷ [ShelleyGenesisStaking crypto] → Encoding # | |
ToJSON (Addr crypto) | |
Defined in Cardano.Ledger.Address Methods toJSON ∷ Addr crypto → Value # toEncoding ∷ Addr crypto → Encoding # toJSONList ∷ [Addr crypto] → Value # toEncodingList ∷ [Addr crypto] → Encoding # | |
Crypto crypto ⇒ ToJSON (GenDelegPair crypto) | |
Defined in Cardano.Ledger.Keys Methods toJSON ∷ GenDelegPair crypto → Value # toEncoding ∷ GenDelegPair crypto → Encoding # toJSONList ∷ [GenDelegPair crypto] → Value # toEncodingList ∷ [GenDelegPair crypto] → Encoding # | |
ToJSON (PParams era) | |
Defined in Cardano.Ledger.Shelley.PParams Methods toJSON ∷ PParams era → Value # toEncoding ∷ PParams era → Encoding # toJSONList ∷ [PParams era] → Value # toEncodingList ∷ [PParams era] → Encoding # | |
Era era ⇒ ToJSON (ShelleyGenesis era) | |
Defined in Cardano.Ledger.Shelley.Genesis Methods toJSON ∷ ShelleyGenesis era → Value # toEncoding ∷ ShelleyGenesis era → Encoding # toJSONList ∷ [ShelleyGenesis era] → Value # toEncodingList ∷ [ShelleyGenesis era] → Encoding # | |
ToJSON a ⇒ ToJSON (StrictMaybe a) | |
Defined in Data.Maybe.Strict Methods toJSON ∷ StrictMaybe a → Value # toEncoding ∷ StrictMaybe a → Encoding # toJSONList ∷ [StrictMaybe a] → Value # toEncodingList ∷ [StrictMaybe a] → Encoding # | |
Crypto crypto ⇒ ToJSON (PoolParams crypto) | |
Defined in Cardano.Ledger.Shelley.TxBody Methods toJSON ∷ PoolParams crypto → Value # toEncoding ∷ PoolParams crypto → Encoding # toJSONList ∷ [PoolParams crypto] → Value # toEncodingList ∷ [PoolParams crypto] → Encoding # | |
ToJSON a ⇒ ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Vector a → Encoding # toJSONList ∷ [Vector a] → Value # toEncodingList ∷ [Vector a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABlock a) | |
Defined in Cardano.Chain.Block.Block Methods toEncoding ∷ ABlock a → Encoding # toJSONList ∷ [ABlock a] → Value # toEncodingList ∷ [ABlock a] → Encoding # | |
ToJSON1 f ⇒ ToJSON (Fix f) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Fix f → Encoding # toJSONList ∷ [Fix f] → Value # toEncodingList ∷ [Fix f] → Encoding # | |
Crypto crypto ⇒ ToJSON (RewardProvenance crypto) | |
Defined in Cardano.Ledger.Shelley.RewardProvenance Methods toJSON ∷ RewardProvenance crypto → Value # toEncoding ∷ RewardProvenance crypto → Encoding # toJSONList ∷ [RewardProvenance crypto] → Value # toEncodingList ∷ [RewardProvenance crypto] → Encoding # | |
Crypto crypto ⇒ ToJSON (BlocksMade crypto) | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ BlocksMade crypto → Value # toEncoding ∷ BlocksMade crypto → Encoding # toJSONList ∷ [BlocksMade crypto] → Value # toEncodingList ∷ [BlocksMade crypto] → Encoding # | |
Crypto crypto ⇒ ToJSON (ScriptHash crypto) | |
Defined in Cardano.Ledger.Hashes Methods toJSON ∷ ScriptHash crypto → Value # toEncoding ∷ ScriptHash crypto → Encoding # toJSONList ∷ [ScriptHash crypto] → Value # toEncodingList ∷ [ScriptHash crypto] → Encoding # | |
ToJSON a ⇒ ToJSON (DList a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ DList a → Encoding # toJSONList ∷ [DList a] → Value # toEncodingList ∷ [DList a] → Encoding # | |
ToJSON a ⇒ ToJSON (HashSet a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ HashSet a → Encoding # toJSONList ∷ [HashSet a] → Value # toEncodingList ∷ [HashSet a] → Encoding # | |
(Vector Vector a, ToJSON a) ⇒ ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Vector a → Encoding # toJSONList ∷ [Vector a] → Value # toEncodingList ∷ [Vector a] → Encoding # | |
(Storable a, ToJSON a) ⇒ ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Vector a → Encoding # toJSONList ∷ [Vector a] → Value # toEncodingList ∷ [Vector a] → Encoding # | |
(Prim a, ToJSON a) ⇒ ToJSON (Vector a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Vector a → Encoding # toJSONList ∷ [Vector a] → Value # toEncodingList ∷ [Vector a] → Encoding # | |
Crypto crypto ⇒ ToJSON (RewardProvenancePool crypto) | |
Defined in Cardano.Ledger.Shelley.RewardProvenance Methods toJSON ∷ RewardProvenancePool crypto → Value # toEncoding ∷ RewardProvenancePool crypto → Encoding # toJSONList ∷ [RewardProvenancePool crypto] → Value # toEncodingList ∷ [RewardProvenancePool crypto] → Encoding # | |
Crypto crypto ⇒ ToJSON (RewardAcnt crypto) | |
Defined in Cardano.Ledger.Address Methods toJSON ∷ RewardAcnt crypto → Value # toEncoding ∷ RewardAcnt crypto → Encoding # toJSONList ∷ [RewardAcnt crypto] → Value # toEncodingList ∷ [RewardAcnt crypto] → Encoding # | |
ToJSON a ⇒ ToJSON (Solo a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Solo a → Encoding # toJSONList ∷ [Solo a] → Value # toEncodingList ∷ [Solo a] → Encoding # | |
(IsShelleyBasedEra era, ShelleyLedgerEra era ~ ledgerera, ShelleyBasedEra ledgerera, ToJSON (PParams ledgerera), ToJSON (PParamsDelta ledgerera), ToJSON (TxOut ledgerera), Share (TxOut (ShelleyLedgerEra era)) ~ Interns (Credential 'Staking (Crypto (ShelleyLedgerEra era)))) ⇒ ToJSON (DebugLedgerState era) | |
Defined in Cardano.Api.Query Methods toJSON ∷ DebugLedgerState era → Value # toEncoding ∷ DebugLedgerState era → Encoding # toJSONList ∷ [DebugLedgerState era] → Value # toEncodingList ∷ [DebugLedgerState era] → Encoding # | |
ToJSON v ⇒ ToJSON (KeyMap v) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ KeyMap v → Encoding # toJSONList ∷ [KeyMap v] → Value # toEncodingList ∷ [KeyMap v] → Encoding # | |
ToJSON a ⇒ ToJSON (DNonEmpty a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ DNonEmpty a → Value # toEncoding ∷ DNonEmpty a → Encoding # toJSONList ∷ [DNonEmpty a] → Value # toEncodingList ∷ [DNonEmpty a] → Encoding # | |
ToJSON a ⇒ ToJSON (Maybe a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Maybe a → Encoding # toJSONList ∷ [Maybe a] → Value # toEncodingList ∷ [Maybe a] → Encoding # | |
ToJSON a ⇒ ToJSON (Array a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Array a → Encoding # toJSONList ∷ [Array a] → Value # toEncodingList ∷ [Array a] → Encoding # | |
(Generic a, GToJSON' Value Zero (Rep a), GToJSON' Encoding Zero (Rep a)) ⇒ ToJSON (Generically a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ Generically a → Value # toEncoding ∷ Generically a → Encoding # toJSONList ∷ [Generically a] → Value # toEncodingList ∷ [Generically a] → Encoding # | |
(ToJSON1 f, Functor f) ⇒ ToJSON (Mu f) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Mu f → Encoding # toJSONList ∷ [Mu f] → Value # toEncodingList ∷ [Mu f] → Encoding # | |
(ToJSON1 f, Functor f) ⇒ ToJSON (Nu f) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Nu f → Encoding # toJSONList ∷ [Nu f] → Value # toEncodingList ∷ [Nu f] → Encoding # | |
(Prim a, ToJSON a) ⇒ ToJSON (PrimArray a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ PrimArray a → Value # toEncoding ∷ PrimArray a → Encoding # toJSONList ∷ [PrimArray a] → Value # toEncodingList ∷ [PrimArray a] → Encoding # | |
ToJSON a ⇒ ToJSON (SmallArray a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ SmallArray a → Value # toEncoding ∷ SmallArray a → Encoding # toJSONList ∷ [SmallArray a] → Value # toEncodingList ∷ [SmallArray a] → Encoding # | |
IsCardanoEra era ⇒ ToJSON (ReferenceScript era) | |
Defined in Cardano.Api.Script Methods toJSON ∷ ReferenceScript era → Value # toEncoding ∷ ReferenceScript era → Encoding # toJSONList ∷ [ReferenceScript era] → Value # toEncodingList ∷ [ReferenceScript era] → Encoding # | |
ToJSON a ⇒ ToJSON (RedeemSignature a) | |
Defined in Cardano.Crypto.Signing.Redeem.Signature Methods toJSON ∷ RedeemSignature a → Value # toEncoding ∷ RedeemSignature a → Encoding # toJSONList ∷ [RedeemSignature a] → Value # toEncodingList ∷ [RedeemSignature a] → Encoding # | |
ToJSON (Signature w) | |
Defined in Cardano.Crypto.Signing.Signature Methods toJSON ∷ Signature w → Value # toEncoding ∷ Signature w → Encoding # toJSONList ∷ [Signature w] → Value # toEncodingList ∷ [Signature w] → Encoding # | |
ToJSON a ⇒ ToJSON (ABoundaryBody a) | |
Defined in Cardano.Chain.Block.Block Methods toJSON ∷ ABoundaryBody a → Value # toEncoding ∷ ABoundaryBody a → Encoding # toJSONList ∷ [ABoundaryBody a] → Value # toEncodingList ∷ [ABoundaryBody a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABody a) | |
Defined in Cardano.Chain.Block.Body Methods toEncoding ∷ ABody a → Encoding # toJSONList ∷ [ABody a] → Value # toEncodingList ∷ [ABody a] → Encoding # | |
ToJSON a ⇒ ToJSON (APayload a) | |
Defined in Cardano.Chain.Delegation.Payload Methods toEncoding ∷ APayload a → Encoding # toJSONList ∷ [APayload a] → Value # toEncodingList ∷ [APayload a] → Encoding # | |
ToJSON a ⇒ ToJSON (ABlockSignature a) | |
Defined in Cardano.Chain.Block.Header Methods toJSON ∷ ABlockSignature a → Value # toEncoding ∷ ABlockSignature a → Encoding # toJSONList ∷ [ABlockSignature a] → Value # toEncodingList ∷ [ABlockSignature a] → Encoding # | |
ToJSON a ⇒ ToJSON (ATxPayload a) | |
Defined in Cardano.Chain.UTxO.TxPayload Methods toJSON ∷ ATxPayload a → Value # toEncoding ∷ ATxPayload a → Encoding # toJSONList ∷ [ATxPayload a] → Value # toEncodingList ∷ [ATxPayload a] → Encoding # | |
ToJSON a ⇒ ToJSON (APayload a) | |
Defined in Cardano.Chain.Update.Payload Methods toEncoding ∷ APayload a → Encoding # toJSONList ∷ [APayload a] → Value # toEncodingList ∷ [APayload a] → Encoding # | |
ToJSON a ⇒ ToJSON (MerkleRoot a) | |
Defined in Cardano.Chain.Common.Merkle Methods toJSON ∷ MerkleRoot a → Value # toEncoding ∷ MerkleRoot a → Encoding # toJSONList ∷ [MerkleRoot a] → Value # toEncodingList ∷ [MerkleRoot a] → Encoding # | |
ToJSON a ⇒ ToJSON (Attributes a) | |
Defined in Cardano.Chain.Common.Attributes Methods toJSON ∷ Attributes a → Value # toEncoding ∷ Attributes a → Encoding # toJSONList ∷ [Attributes a] → Value # toEncodingList ∷ [Attributes a] → Encoding # | |
Crypto crypto ⇒ ToJSON (StakeCreds crypto) | |
Defined in Cardano.Ledger.Shelley.TxBody Methods toJSON ∷ StakeCreds crypto → Value # toEncoding ∷ StakeCreds crypto → Encoding # toJSONList ∷ [StakeCreds crypto] → Value # toEncodingList ∷ [StakeCreds crypto] → Encoding # | |
ToJSON (BuiltinCostModelBase CostingFun) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ BuiltinCostModelBase CostingFun → Value # toEncoding ∷ BuiltinCostModelBase CostingFun → Encoding # toJSONList ∷ [BuiltinCostModelBase CostingFun] → Value # toEncodingList ∷ [BuiltinCostModelBase CostingFun] → Encoding # | |
ToJSON (BuiltinCostModelBase MCostingFun) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ BuiltinCostModelBase MCostingFun → Value # toEncoding ∷ BuiltinCostModelBase MCostingFun → Encoding # toJSONList ∷ [BuiltinCostModelBase MCostingFun] → Value # toEncodingList ∷ [BuiltinCostModelBase MCostingFun] → Encoding # | |
ToJSON model ⇒ ToJSON (CostingFun model) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ CostingFun model → Value # toEncoding ∷ CostingFun model → Encoding # toJSONList ∷ [CostingFun model] → Value # toEncodingList ∷ [CostingFun model] → Encoding # | |
ToJSON a ⇒ ToJSON (MCostingFun a) | |
Defined in PlutusCore.Evaluation.Machine.BuiltinCostModel Methods toJSON ∷ MCostingFun a → Value # toEncoding ∷ MCostingFun a → Encoding # toJSONList ∷ [MCostingFun a] → Value # toEncodingList ∷ [MCostingFun a] → Encoding # | |
ToJSON d ⇒ ToJSON (LinearTransform d) | |
Defined in Statistics.Distribution.Transform Methods toJSON ∷ LinearTransform d → Value # toEncoding ∷ LinearTransform d → Encoding # toJSONList ∷ [LinearTransform d] → Value # toEncodingList ∷ [LinearTransform d] → Encoding # | |
ToJSON a ⇒ ToJSON (Item a) | |
Defined in Katip.Core Methods toEncoding ∷ Item a → Encoding # toJSONList ∷ [Item a] → Value # toEncodingList ∷ [Item a] → Encoding # | |
ToJSON (CollectionFormat t) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ CollectionFormat t → Value # toEncoding ∷ CollectionFormat t → Encoding # toJSONList ∷ [CollectionFormat t] → Value # toEncodingList ∷ [CollectionFormat t] → Encoding # | |
ToJSON (ParamSchema k) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ ParamSchema k → Value # toEncoding ∷ ParamSchema k → Encoding # toJSONList ∷ [ParamSchema k] → Value # toEncodingList ∷ [ParamSchema k] → Encoding # | |
ToJSON (Referenced Param) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ Referenced Param → Value # toEncoding ∷ Referenced Param → Encoding # toJSONList ∷ [Referenced Param] → Value # toEncodingList ∷ [Referenced Param] → Encoding # | |
ToJSON (Referenced Response) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ Referenced Response → Value # toEncoding ∷ Referenced Response → Encoding # toJSONList ∷ [Referenced Response] → Value # toEncodingList ∷ [Referenced Response] → Encoding # | |
ToJSON (Referenced Schema) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ Referenced Schema → Value # toEncoding ∷ Referenced Schema → Encoding # toJSONList ∷ [Referenced Schema] → Value # toEncodingList ∷ [Referenced Schema] → Encoding # | |
ToJSON (ParamSchema t) ⇒ ToJSON (SwaggerItems t) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SwaggerItems t → Value # toEncoding ∷ SwaggerItems t → Encoding # toJSONList ∷ [SwaggerItems t] → Value # toEncodingList ∷ [SwaggerItems t] → Encoding # | |
ToJSON (SwaggerType t) | |
Defined in Data.Swagger.Internal Methods toJSON ∷ SwaggerType t → Value # toEncoding ∷ SwaggerType t → Encoding # toJSONList ∷ [SwaggerType t] → Value # toEncodingList ∷ [SwaggerType t] → Encoding # | |
ToJSON a ⇒ ToJSON (InsOrdHashSet a) | |
Defined in Data.HashSet.InsOrd Methods toJSON ∷ InsOrdHashSet a → Value # toEncoding ∷ InsOrdHashSet a → Encoding # toJSONList ∷ [InsOrdHashSet a] → Value # toEncodingList ∷ [InsOrdHashSet a] → Encoding # | |
ToJSON (Flat TokenMap) | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods toJSON ∷ Flat TokenMap → Value # toEncoding ∷ Flat TokenMap → Encoding # toJSONList ∷ [Flat TokenMap] → Value # toEncodingList ∷ [Flat TokenMap] → Encoding # | |
ToJSON (Nested TokenMap) | |
Defined in Cardano.Wallet.Primitive.Types.TokenMap Methods toJSON ∷ Nested TokenMap → Value # toEncoding ∷ Nested TokenMap → Encoding # toJSONList ∷ [Nested TokenMap] → Value # toEncodingList ∷ [Nested TokenMap] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Either a b → Encoding # toJSONList ∷ [Either a b] → Value # toEncodingList ∷ [Either a b] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (a, b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ (a, b) → Encoding # toJSONList ∷ [(a, b)] → Value # toEncodingList ∷ [(a, b)] → Encoding # | |
HasResolution a ⇒ ToJSON (Fixed a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Fixed a → Encoding # toJSONList ∷ [Fixed a] → Value # toEncodingList ∷ [Fixed a] → Encoding # | |
ToJSON (Proxy a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Proxy a → Encoding # toJSONList ∷ [Proxy a] → Value # toEncodingList ∷ [Proxy a] → Encoding # | |
(ToJSON v, ToJSONKey k) ⇒ ToJSON (Map k v) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Map k v → Encoding # toJSONList ∷ [Map k v] → Value # toEncodingList ∷ [Map k v] → Encoding # | |
ToJSON (EraInMode era mode) | |
Defined in Cardano.Api.Modes Methods toJSON ∷ EraInMode era mode → Value # toEncoding ∷ EraInMode era mode → Encoding # toJSONList ∷ [EraInMode era mode] → Value # toEncodingList ∷ [EraInMode era mode] → Encoding # | |
ToJSON (ScriptLanguageInEra lang era) | |
Defined in Cardano.Api.Script Methods toJSON ∷ ScriptLanguageInEra lang era → Value # toEncoding ∷ ScriptLanguageInEra lang era → Encoding # toJSONList ∷ [ScriptLanguageInEra lang era] → Value # toEncodingList ∷ [ScriptLanguageInEra lang era] → Encoding # | |
IsCardanoEra era ⇒ ToJSON (TxOut ctx era) | |
Defined in Cardano.Api.TxBody Methods toJSON ∷ TxOut ctx era → Value # toEncoding ∷ TxOut ctx era → Encoding # toJSONList ∷ [TxOut ctx era] → Value # toEncodingList ∷ [TxOut ctx era] → Encoding # | |
Crypto crypto ⇒ ToJSON (KeyHash disc crypto) | |
Defined in Cardano.Ledger.Keys Methods toJSON ∷ KeyHash disc crypto → Value # toEncoding ∷ KeyHash disc crypto → Encoding # toJSONList ∷ [KeyHash disc crypto] → Value # toEncodingList ∷ [KeyHash disc crypto] → Encoding # | |
HashAlgorithm h ⇒ ToJSON (Hash h a) | |
Defined in Cardano.Crypto.Hash.Class Methods toEncoding ∷ Hash h a → Encoding # toJSONList ∷ [Hash h a] → Value # toEncodingList ∷ [Hash h a] → Encoding # | |
ToJSON b ⇒ ToJSON (Annotated b a) | |
Defined in Cardano.Binary.Annotated Methods toJSON ∷ Annotated b a → Value # toEncoding ∷ Annotated b a → Encoding # toJSONList ∷ [Annotated b a] → Value # toEncodingList ∷ [Annotated b a] → Encoding # | |
ToJSON (AbstractHash algo a) | |
Defined in Cardano.Crypto.Hashing Methods toJSON ∷ AbstractHash algo a → Value # toEncoding ∷ AbstractHash algo a → Encoding # toJSONList ∷ [AbstractHash algo a] → Value # toEncodingList ∷ [AbstractHash algo a] → Encoding # | |
Crypto crypto ⇒ ToJSON (Credential kr crypto) | |
Defined in Cardano.Ledger.Credential Methods toJSON ∷ Credential kr crypto → Value # toEncoding ∷ Credential kr crypto → Encoding # toJSONList ∷ [Credential kr crypto] → Value # toEncodingList ∷ [Credential kr crypto] → Encoding # | |
(ToJSON v, ToJSONKey k) ⇒ ToJSON (HashMap k v) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ HashMap k v → Value # toEncoding ∷ HashMap k v → Encoding # toJSONList ∷ [HashMap k v] → Value # toEncodingList ∷ [HashMap k v] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (Either a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Either a b → Encoding # toJSONList ∷ [Either a b] → Value # toEncodingList ∷ [Either a b] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (Pair a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Pair a b → Encoding # toJSONList ∷ [Pair a b] → Value # toEncodingList ∷ [Pair a b] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (These a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ These a b → Encoding # toJSONList ∷ [These a b] → Value # toEncodingList ∷ [These a b] → Encoding # | |
(ToJSON a, ToJSON b) ⇒ ToJSON (These a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ These a b → Encoding # toJSONList ∷ [These a b] → Value # toEncodingList ∷ [These a b] → Encoding # | |
ToJSON (BoundedRatio b Word64) | |
Defined in Cardano.Ledger.BaseTypes Methods toJSON ∷ BoundedRatio b Word64 → Value # toEncoding ∷ BoundedRatio b Word64 → Encoding # toJSONList ∷ [BoundedRatio b Word64] → Value # toEncodingList ∷ [BoundedRatio b Word64] → Encoding # | |
(ToJSON a, ToJSONKey k) ⇒ ToJSON (MonoidalMap k a) | |
Defined in Data.Map.Monoidal Methods toJSON ∷ MonoidalMap k a → Value # toEncoding ∷ MonoidalMap k a → Encoding # toJSONList ∷ [MonoidalMap k a] → Value # toEncodingList ∷ [MonoidalMap k a] → Encoding # | |
(ToJSONKey k, ToJSON v) ⇒ ToJSON (InsOrdHashMap k v) | |
Defined in Data.HashMap.Strict.InsOrd Methods toJSON ∷ InsOrdHashMap k v → Value # toEncoding ∷ InsOrdHashMap k v → Encoding # toJSONList ∷ [InsOrdHashMap k v] → Value # toEncodingList ∷ [InsOrdHashMap k v] → Encoding # | |
(KnownSymbol unit, ToJSON a) ⇒ ToJSON (Quantity unit a) | |
Defined in Data.Quantity Methods toJSON ∷ Quantity unit a → Value # toEncoding ∷ Quantity unit a → Encoding # toJSONList ∷ [Quantity unit a] → Value # toEncodingList ∷ [Quantity unit a] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c) ⇒ ToJSON (a, b, c) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ (a, b, c) → Encoding # toJSONList ∷ [(a, b, c)] → Value # toEncodingList ∷ [(a, b, c)] → Encoding # | |
ToJSON a ⇒ ToJSON (Const a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Const a b → Encoding # toJSONList ∷ [Const a b] → Value # toEncodingList ∷ [Const a b] → Encoding # | |
ToJSON b ⇒ ToJSON (Tagged a b) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Tagged a b → Encoding # toJSONList ∷ [Tagged a b] → Value # toEncodingList ∷ [Tagged a b] → Encoding # | |
(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (These1 f g a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ These1 f g a → Value # toEncoding ∷ These1 f g a → Encoding # toJSONList ∷ [These1 f g a] → Value # toEncodingList ∷ [These1 f g a] → Encoding # | |
(AesonOptions t, Generic a, GToJSON Zero (Rep a), GToEncoding Zero (Rep a)) ⇒ ToJSON (CustomJSON t a) | |
Defined in Deriving.Aeson Methods toJSON ∷ CustomJSON t a → Value # toEncoding ∷ CustomJSON t a → Encoding # toJSONList ∷ [CustomJSON t a] → Value # toEncodingList ∷ [CustomJSON t a] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d) ⇒ ToJSON (a, b, c, d) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d) → Value # toEncoding ∷ (a, b, c, d) → Encoding # toJSONList ∷ [(a, b, c, d)] → Value # toEncodingList ∷ [(a, b, c, d)] → Encoding # | |
(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Product f g a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ Product f g a → Value # toEncoding ∷ Product f g a → Encoding # toJSONList ∷ [Product f g a] → Value # toEncodingList ∷ [Product f g a] → Encoding # | |
(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Sum f g a) | |
Defined in Data.Aeson.Types.ToJSON Methods toEncoding ∷ Sum f g a → Encoding # toJSONList ∷ [Sum f g a] → Value # toEncodingList ∷ [Sum f g a] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) ⇒ ToJSON (a, b, c, d, e) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e) → Value # toEncoding ∷ (a, b, c, d, e) → Encoding # toJSONList ∷ [(a, b, c, d, e)] → Value # toEncodingList ∷ [(a, b, c, d, e)] → Encoding # | |
(ToJSON1 f, ToJSON1 g, ToJSON a) ⇒ ToJSON (Compose f g a) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ Compose f g a → Value # toEncoding ∷ Compose f g a → Encoding # toJSONList ∷ [Compose f g a] → Value # toEncodingList ∷ [Compose f g a] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) ⇒ ToJSON (a, b, c, d, e, f) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f) → Value # toEncoding ∷ (a, b, c, d, e, f) → Encoding # toJSONList ∷ [(a, b, c, d, e, f)] → Value # toEncodingList ∷ [(a, b, c, d, e, f)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) ⇒ ToJSON (a, b, c, d, e, f, g) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g) → Value # toEncoding ∷ (a, b, c, d, e, f, g) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) ⇒ ToJSON (a, b, c, d, e, f, g, h) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) ⇒ ToJSON (a, b, c, d, e, f, g, h, i) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] → Encoding # | |
(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) ⇒ ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | |
Defined in Data.Aeson.Types.ToJSON Methods toJSON ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Value # toEncoding ∷ (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) → Encoding # toJSONList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Value # toEncodingList ∷ [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] → Encoding # |
data Some (tag ∷ k → Type) where #
Instances
GEq tag ⇒ Eq (Some tag) | |
GCompare tag ⇒ Ord (Some tag) | |
GRead f ⇒ Read (Some f) | |
GShow tag ⇒ Show (Some tag) | |
Applicative m ⇒ Semigroup (Some m) | |
Applicative m ⇒ Monoid (Some m) | |
GNFData tag ⇒ NFData (Some tag) | |
Defined in Data.Some.Newtype | |
(Closed uni, Everywhere uni ExMemoryUsage) ⇒ ExMemoryUsage (Some (ValueOf uni)) | |
Defined in PlutusCore.Evaluation.Machine.ExMemory Methods memoryUsage ∷ Some (ValueOf uni) → ExMemory |
rightToMaybe ∷ Either a b → Maybe b #
ifor_ ∷ (FoldableWithIndex i t, Applicative f) ⇒ t a → (i → a → f b) → f () #
wither ∷ (Witherable t, Applicative f) ⇒ (a → f (Maybe b)) → t a → f (t b) #
iwither ∷ (WitherableWithIndex i t, Applicative f) ⇒ (i → a → f (Maybe b)) → t a → f (t b) #
pattern TODO ∷ () ⇒ HasCallStack ⇒ a #
decodeUtf8Lenient ∷ ByteString → Text #
Decode a strict ByteString
containing UTF-8 encoded text.
lazyDecodeUtf8Lenient ∷ ByteString → Text #
Decode a lazy ByteString
containing UTF-8 encoded text.
Any invalid input bytes will be replaced with the Unicode replacement character U+FFFD.
Orphan instances
(TypeError ('Text "Forbidden FromJSON ByteString instance") ∷ Constraint) ⇒ FromJSON ByteString # | |
(TypeError ('Text "Forbidden ToJSON ByteString instance") ∷ Constraint) ⇒ ToJSON ByteString # | |
Methods toJSON ∷ ByteString → Value # toEncoding ∷ ByteString → Encoding # toJSONList ∷ [ByteString] → Value # toEncodingList ∷ [ByteString] → Encoding # |