cardano-api-8.36.1.1: The cardano api
Safe HaskellNone
LanguageHaskell2010

Cardano.Api.Orphans

Orphan instances

Data DecoderError Source # 
Instance details

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecoderError -> c DecoderError Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecoderError Source #

toConstr :: DecoderError -> Constr Source #

dataTypeOf :: DecoderError -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecoderError) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecoderError) Source #

gmapT :: (forall b. Data b => b -> b) -> DecoderError -> DecoderError Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecoderError -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecoderError -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> DecoderError -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecoderError -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecoderError -> m DecoderError Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecoderError -> m DecoderError Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecoderError -> m DecoderError Source #

Data DeserialiseFailure Source # 
Instance details

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeserialiseFailure -> c DeserialiseFailure Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeserialiseFailure Source #

toConstr :: DeserialiseFailure -> Constr Source #

dataTypeOf :: DeserialiseFailure -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeserialiseFailure) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeserialiseFailure) Source #

gmapT :: (forall b. Data b => b -> b) -> DeserialiseFailure -> DeserialiseFailure Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeserialiseFailure -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeserialiseFailure -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> DeserialiseFailure -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeserialiseFailure -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeserialiseFailure -> m DeserialiseFailure Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeserialiseFailure -> m DeserialiseFailure Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeserialiseFailure -> m DeserialiseFailure Source #

Data CharPosition Source # 
Instance details

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CharPosition -> c CharPosition Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CharPosition Source #

toConstr :: CharPosition -> Constr Source #

dataTypeOf :: CharPosition -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CharPosition) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CharPosition) Source #

gmapT :: (forall b. Data b => b -> b) -> CharPosition -> CharPosition Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CharPosition -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CharPosition -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> CharPosition -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CharPosition -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CharPosition -> m CharPosition Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CharPosition -> m CharPosition Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CharPosition -> m CharPosition Source #

Data DecodingError Source # 
Instance details

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecodingError -> c DecodingError Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecodingError Source #

toConstr :: DecodingError -> Constr Source #

dataTypeOf :: DecodingError -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecodingError) Source #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecodingError) Source #

gmapT :: (forall b. Data b => b -> b) -> DecodingError -> DecodingError Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecodingError -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecodingError -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> DecodingError -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecodingError -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecodingError -> m DecodingError Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecodingError -> m DecodingError Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecodingError -> m DecodingError Source #

Generic LovelaceError Source # 
Instance details

Associated Types

type Rep LovelaceError :: Type -> Type Source #

Methods

from :: LovelaceError -> Rep LovelaceError x Source #

to :: Rep LovelaceError x -> LovelaceError Source #

Generic SoftwareVersionError Source # 
Instance details

Associated Types

type Rep SoftwareVersionError :: Type -> Type Source #

Methods

from :: SoftwareVersionError -> Rep SoftwareVersionError x Source #

to :: Rep SoftwareVersionError x -> SoftwareVersionError Source #

Generic ApplicationNameError Source # 
Instance details

Associated Types

type Rep ApplicationNameError :: Type -> Type Source #

Methods

from :: ApplicationNameError -> Rep ApplicationNameError x Source #

to :: Rep ApplicationNameError x -> ApplicationNameError Source #

Generic SystemTagError Source # 
Instance details

Associated Types

type Rep SystemTagError :: Type -> Type Source #

Methods

from :: SystemTagError -> Rep SystemTagError x Source #

to :: Rep SystemTagError x -> SystemTagError Source #

Generic UTxOError Source # 
Instance details

Associated Types

type Rep UTxOError :: Type -> Type Source #

Methods

from :: UTxOError -> Rep UTxOError x Source #

to :: Rep UTxOError x -> UTxOError Source #

Generic TxValidationError Source # 
Instance details

Associated Types

type Rep TxValidationError :: Type -> Type Source #

Methods

from :: TxValidationError -> Rep TxValidationError x Source #

to :: Rep TxValidationError x -> TxValidationError Source #

Generic UTxOValidationError Source # 
Instance details

Associated Types

type Rep UTxOValidationError :: Type -> Type Source #

Methods

from :: UTxOValidationError -> Rep UTxOValidationError x Source #

to :: Rep UTxOValidationError x -> UTxOValidationError Source #

Generic Error Source # 
Instance details

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Generic ApplyMempoolPayloadErr Source # 
Instance details

Associated Types

type Rep ApplyMempoolPayloadErr :: Type -> Type Source #

Methods

from :: ApplyMempoolPayloadErr -> Rep ApplyMempoolPayloadErr x Source #

to :: Rep ApplyMempoolPayloadErr x -> ApplyMempoolPayloadErr Source #

Generic Error Source # 
Instance details

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Generic Error Source # 
Instance details

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Generic Error Source # 
Instance details

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Generic Error Source # 
Instance details

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Generic Adopted Source # 
Instance details

Associated Types

type Rep Adopted :: Type -> Type Source #

Methods

from :: Adopted -> Rep Adopted x Source #

to :: Rep Adopted x -> Adopted Source #

ToJSON KeyHash Source # 
Instance details

Methods

toJSON :: KeyHash -> Value #

toEncoding :: KeyHash -> Encoding #

toJSONList :: [KeyHash] -> Value #

toEncodingList :: [KeyHash] -> Encoding #

omitField :: KeyHash -> Bool #

ToJSON LovelaceError Source # 
Instance details

Methods

toJSON :: LovelaceError -> Value #

toEncoding :: LovelaceError -> Encoding #

toJSONList :: [LovelaceError] -> Value #

toEncodingList :: [LovelaceError] -> Encoding #

omitField :: LovelaceError -> Bool #

ToJSON SoftwareVersionError Source # 
Instance details

Methods

toJSON :: SoftwareVersionError -> Value #

toEncoding :: SoftwareVersionError -> Encoding #

toJSONList :: [SoftwareVersionError] -> Value #

toEncodingList :: [SoftwareVersionError] -> Encoding #

omitField :: SoftwareVersionError -> Bool #

ToJSON ApplicationNameError Source # 
Instance details

Methods

toJSON :: ApplicationNameError -> Value #

toEncoding :: ApplicationNameError -> Encoding #

toJSONList :: [ApplicationNameError] -> Value #

toEncodingList :: [ApplicationNameError] -> Encoding #

omitField :: ApplicationNameError -> Bool #

ToJSON SystemTagError Source # 
Instance details

Methods

toJSON :: SystemTagError -> Value #

toEncoding :: SystemTagError -> Encoding #

toJSONList :: [SystemTagError] -> Value #

toEncodingList :: [SystemTagError] -> Encoding #

omitField :: SystemTagError -> Bool #

ToJSON UTxOError Source # 
Instance details

Methods

toJSON :: UTxOError -> Value #

toEncoding :: UTxOError -> Encoding #

toJSONList :: [UTxOError] -> Value #

toEncodingList :: [UTxOError] -> Encoding #

omitField :: UTxOError -> Bool #

ToJSON TxValidationError Source # 
Instance details

Methods

toJSON :: TxValidationError -> Value #

toEncoding :: TxValidationError -> Encoding #

toJSONList :: [TxValidationError] -> Value #

toEncodingList :: [TxValidationError] -> Encoding #

omitField :: TxValidationError -> Bool #

ToJSON UTxOValidationError Source # 
Instance details

Methods

toJSON :: UTxOValidationError -> Value #

toEncoding :: UTxOValidationError -> Encoding #

toJSONList :: [UTxOValidationError] -> Value #

toEncodingList :: [UTxOValidationError] -> Encoding #

omitField :: UTxOValidationError -> Bool #

ToJSON MIRPot Source # 
Instance details

Methods

toJSON :: MIRPot -> Value #

toEncoding :: MIRPot -> Encoding #

toJSONList :: [MIRPot] -> Value #

toEncodingList :: [MIRPot] -> Encoding #

omitField :: MIRPot -> Bool #

ToJSON RdmrPtr Source # 
Instance details

Methods

toJSON :: RdmrPtr -> Value #

toEncoding :: RdmrPtr -> Encoding #

toJSONList :: [RdmrPtr] -> Value #

toEncodingList :: [RdmrPtr] -> Encoding #

omitField :: RdmrPtr -> Bool #

ToJSON VotingPeriod Source # 
Instance details

Methods

toJSON :: VotingPeriod -> Value #

toEncoding :: VotingPeriod -> Encoding #

toJSONList :: [VotingPeriod] -> Value #

toEncodingList :: [VotingPeriod] -> Encoding #

omitField :: VotingPeriod -> Bool #

ToJSON ByronHash Source # 
Instance details

Methods

toJSON :: ByronHash -> Value #

toEncoding :: ByronHash -> Encoding #

toJSONList :: [ByronHash] -> Value #

toEncodingList :: [ByronHash] -> Encoding #

omitField :: ByronHash -> Bool #

ToJSON TicknState Source # 
Instance details

Methods

toJSON :: TicknState -> Value #

toEncoding :: TicknState -> Encoding #

toJSONList :: [TicknState] -> Value #

toEncodingList :: [TicknState] -> Encoding #

omitField :: TicknState -> Bool #

ToJSON Error Source # 
Instance details

Methods

toJSON :: Error -> Value #

toEncoding :: Error -> Encoding #

toJSONList :: [Error] -> Value #

toEncodingList :: [Error] -> Encoding #

omitField :: Error -> Bool #

ToJSON ApplyMempoolPayloadErr Source # 
Instance details

Methods

toJSON :: ApplyMempoolPayloadErr -> Value #

toEncoding :: ApplyMempoolPayloadErr -> Encoding #

toJSONList :: [ApplyMempoolPayloadErr] -> Value #

toEncodingList :: [ApplyMempoolPayloadErr] -> Encoding #

omitField :: ApplyMempoolPayloadErr -> Bool #

ToJSON ApplicationVersion Source # 
Instance details

Methods

toJSON :: ApplicationVersion -> Value #

toEncoding :: ApplicationVersion -> Encoding #

toJSONList :: [ApplicationVersion] -> Value #

toEncodingList :: [ApplicationVersion] -> Encoding #

omitField :: ApplicationVersion -> Bool #

ToJSON Error Source # 
Instance details

Methods

toJSON :: Error -> Value #

toEncoding :: Error -> Encoding #

toJSONList :: [Error] -> Value #

toEncodingList :: [Error] -> Encoding #

omitField :: Error -> Bool #

ToJSON Error Source # 
Instance details

Methods

toJSON :: Error -> Value #

toEncoding :: Error -> Encoding #

toJSONList :: [Error] -> Value #

toEncodingList :: [Error] -> Encoding #

omitField :: Error -> Bool #

ToJSON Error Source # 
Instance details

Methods

toJSON :: Error -> Value #

toEncoding :: Error -> Encoding #

toJSONList :: [Error] -> Value #

toEncodingList :: [Error] -> Encoding #

omitField :: Error -> Bool #

ToJSON Error Source # 
Instance details

Methods

toJSON :: Error -> Value #

toEncoding :: Error -> Encoding #

toJSONList :: [Error] -> Value #

toEncodingList :: [Error] -> Encoding #

omitField :: Error -> Bool #

ToJSON Adopted Source # 
Instance details

Methods

toJSON :: Adopted -> Value #

toEncoding :: Adopted -> Encoding #

toJSONList :: [Adopted] -> Value #

toEncodingList :: [Adopted] -> Encoding #

omitField :: Adopted -> Bool #

ToJSONKey ApplicationName Source # 
Instance details

Methods

toJSONKey :: ToJSONKeyFunction ApplicationName

toJSONKeyList :: ToJSONKeyFunction [ApplicationName]

Generic (ApplyTxError era) Source # 
Instance details

Associated Types

type Rep (ApplyTxError era) :: Type -> Type Source #

Methods

from :: ApplyTxError era -> Rep (ApplyTxError era) x Source #

to :: Rep (ApplyTxError era) x -> ApplyTxError era Source #

Generic (TooLarge a) Source # 
Instance details

Associated Types

type Rep (TooLarge a) :: Type -> Type Source #

Methods

from :: TooLarge a -> Rep (TooLarge a) x Source #

to :: Rep (TooLarge a) x -> TooLarge a Source #

ToJSON (PoolCert StandardCrypto) Source # 
Instance details

Show (ConwayTxCert c) => ToJSON (ConwayTxCert c) Source # 
Instance details

Methods

toJSON :: ConwayTxCert c -> Value #

toEncoding :: ConwayTxCert c -> Encoding #

toJSONList :: [ConwayTxCert c] -> Value #

toEncodingList :: [ConwayTxCert c] -> Encoding #

omitField :: ConwayTxCert c -> Bool #

ToJSON (GenesisDelegCert StandardCrypto) Source # 
Instance details

ToJSON (MIRCert StandardCrypto) Source # 
Instance details

ToJSON (ShelleyDelegCert StandardCrypto) Source # 
Instance details

ToJSON (MIRTarget StandardCrypto) Source # 
Instance details

(Crypto (EraCrypto ledgerera), ToJSON (GenesisDelegCert (EraCrypto ledgerera)), ToJSON (MIRCert (EraCrypto ledgerera)), ToJSON (PoolCert (EraCrypto ledgerera)), ToJSON (ShelleyDelegCert (EraCrypto ledgerera))) => ToJSON (ShelleyTxCert ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyTxCert ledgerera -> Value #

toEncoding :: ShelleyTxCert ledgerera -> Encoding #

toJSONList :: [ShelleyTxCert ledgerera] -> Value #

toEncodingList :: [ShelleyTxCert ledgerera] -> Encoding #

omitField :: ShelleyTxCert ledgerera -> Bool #

ToJSON (PredicateFailure (EraRule "LEDGER" ledgerera)) => ToJSON (ApplyTxError ledgerera) Source # 
Instance details

Methods

toJSON :: ApplyTxError ledgerera -> Value #

toEncoding :: ApplyTxError ledgerera -> Encoding #

toJSONList :: [ApplyTxError ledgerera] -> Value #

toEncodingList :: [ApplyTxError ledgerera] -> Encoding #

omitField :: ApplyTxError ledgerera -> Bool #

(Crypto (EraCrypto ledgerera), ToJSON (TxCert ledgerera)) => ToJSON (ScriptPurpose ledgerera) Source # 
Instance details

Methods

toJSON :: ScriptPurpose ledgerera -> Value #

toEncoding :: ScriptPurpose ledgerera -> Encoding #

toJSONList :: [ScriptPurpose ledgerera] -> Value #

toEncodingList :: [ScriptPurpose ledgerera] -> Encoding #

omitField :: ScriptPurpose ledgerera -> Bool #

(ToJSON (PredicateFailure (EraRule "UTXOW" ledgerera)), ToJSON (PredicateFailure (EraRule "DELEGS" ledgerera))) => ToJSON (ShelleyLedgerPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyLedgerPredFailure ledgerera -> Value #

toEncoding :: ShelleyLedgerPredFailure ledgerera -> Encoding #

toJSONList :: [ShelleyLedgerPredFailure ledgerera] -> Value #

toEncodingList :: [ShelleyLedgerPredFailure ledgerera] -> Encoding #

omitField :: ShelleyLedgerPredFailure ledgerera -> Bool #

(Crypto (EraCrypto ledgerera), ToJSON (PredicateFailure (EraRule "UTXO" ledgerera)), ToJSON (TxCert ledgerera)) => ToJSON (BabbageUtxowPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: BabbageUtxowPredFailure ledgerera -> Value #

toEncoding :: BabbageUtxowPredFailure ledgerera -> Encoding #

toJSONList :: [BabbageUtxowPredFailure ledgerera] -> Value #

toEncodingList :: [BabbageUtxowPredFailure ledgerera] -> Encoding #

omitField :: BabbageUtxowPredFailure ledgerera -> Bool #

Show (ShelleyDelegsPredFailure ledgerera) => ToJSON (ShelleyDelegsPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyDelegsPredFailure ledgerera -> Value #

toEncoding :: ShelleyDelegsPredFailure ledgerera -> Encoding #

toJSONList :: [ShelleyDelegsPredFailure ledgerera] -> Value #

toEncodingList :: [ShelleyDelegsPredFailure ledgerera] -> Encoding #

omitField :: ShelleyDelegsPredFailure ledgerera -> Bool #

(Crypto (EraCrypto ledgerera), ToJSON (PredicateFailure (EraRule "UTXO" ledgerera)), ToJSON (ScriptPurpose ledgerera)) => ToJSON (AlonzoUtxowPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: AlonzoUtxowPredFailure ledgerera -> Value #

toEncoding :: AlonzoUtxowPredFailure ledgerera -> Encoding #

toJSONList :: [AlonzoUtxowPredFailure ledgerera] -> Value #

toEncodingList :: [AlonzoUtxowPredFailure ledgerera] -> Encoding #

omitField :: AlonzoUtxowPredFailure ledgerera -> Bool #

Show (BabbageUtxoPredFailure ledgerera) => ToJSON (BabbageUtxoPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: BabbageUtxoPredFailure ledgerera -> Value #

toEncoding :: BabbageUtxoPredFailure ledgerera -> Encoding #

toJSONList :: [BabbageUtxoPredFailure ledgerera] -> Value #

toEncodingList :: [BabbageUtxoPredFailure ledgerera] -> Encoding #

omitField :: BabbageUtxoPredFailure ledgerera -> Bool #

(Crypto (EraCrypto ledgerera), ToJSON (PredicateFailure (EraRule "UTXO" ledgerera))) => ToJSON (ShelleyUtxowPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyUtxowPredFailure ledgerera -> Value #

toEncoding :: ShelleyUtxowPredFailure ledgerera -> Encoding #

toJSONList :: [ShelleyUtxowPredFailure ledgerera] -> Value #

toEncodingList :: [ShelleyUtxowPredFailure ledgerera] -> Encoding #

omitField :: ShelleyUtxowPredFailure ledgerera -> Bool #

Show (AlonzoUtxoPredFailure ledgerera) => ToJSON (AlonzoUtxoPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: AlonzoUtxoPredFailure ledgerera -> Value #

toEncoding :: AlonzoUtxoPredFailure ledgerera -> Encoding #

toJSONList :: [AlonzoUtxoPredFailure ledgerera] -> Value #

toEncodingList :: [AlonzoUtxoPredFailure ledgerera] -> Encoding #

omitField :: AlonzoUtxoPredFailure ledgerera -> Bool #

Show (AllegraUtxoPredFailure ledgerera) => ToJSON (AllegraUtxoPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: AllegraUtxoPredFailure ledgerera -> Value #

toEncoding :: AllegraUtxoPredFailure ledgerera -> Encoding #

toJSONList :: [AllegraUtxoPredFailure ledgerera] -> Value #

toEncodingList :: [AllegraUtxoPredFailure ledgerera] -> Encoding #

omitField :: AllegraUtxoPredFailure ledgerera -> Bool #

Show (ShelleyUtxoPredFailure ledgerera) => ToJSON (ShelleyUtxoPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyUtxoPredFailure ledgerera -> Value #

toEncoding :: ShelleyUtxoPredFailure ledgerera -> Encoding #

toJSONList :: [ShelleyUtxoPredFailure ledgerera] -> Value #

toEncodingList :: [ShelleyUtxoPredFailure ledgerera] -> Encoding #

omitField :: ShelleyUtxoPredFailure ledgerera -> Bool #

(Crypto (EraCrypto ledgerera), ToJSON (PredicateFailure (EraRule "UTXO" ledgerera))) => ToJSON (ShelleyPpupPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ShelleyPpupPredFailure ledgerera -> Value #

toEncoding :: ShelleyPpupPredFailure ledgerera -> Encoding #

toJSONList :: [ShelleyPpupPredFailure ledgerera] -> Value #

toEncodingList :: [ShelleyPpupPredFailure ledgerera] -> Encoding #

omitField :: ShelleyPpupPredFailure ledgerera -> Bool #

Show (ConwayLedgerPredFailure ledgerera) => ToJSON (ConwayLedgerPredFailure ledgerera) Source # 
Instance details

Methods

toJSON :: ConwayLedgerPredFailure ledgerera -> Value #

toEncoding :: ConwayLedgerPredFailure ledgerera -> Encoding #

toJSONList :: [ConwayLedgerPredFailure ledgerera] -> Value #

toEncodingList :: [ConwayLedgerPredFailure ledgerera] -> Encoding #

omitField :: ConwayLedgerPredFailure ledgerera -> Bool #

ToJSON (PraosState StandardCrypto) Source # 
Instance details

Methods

toJSON :: PraosState StandardCrypto -> Value #

toEncoding :: PraosState StandardCrypto -> Encoding #

toJSONList :: [PraosState StandardCrypto] -> Value #

toEncodingList :: [PraosState StandardCrypto] -> Encoding #

omitField :: PraosState StandardCrypto -> Bool #

ToJSON (TPraosState StandardCrypto) Source # 
Instance details

Methods

toJSON :: TPraosState StandardCrypto -> Value #

toEncoding :: TPraosState StandardCrypto -> Encoding #

toJSONList :: [TPraosState StandardCrypto] -> Value #

toEncodingList :: [TPraosState StandardCrypto] -> Encoding #

omitField :: TPraosState StandardCrypto -> Bool #

ToJSON (ChainDepState StandardCrypto) Source # 
Instance details

Methods

toJSON :: ChainDepState StandardCrypto -> Value #

toEncoding :: ChainDepState StandardCrypto -> Encoding #

toJSONList :: [ChainDepState StandardCrypto] -> Value #

toEncodingList :: [ChainDepState StandardCrypto] -> Encoding #

omitField :: ChainDepState StandardCrypto -> Bool #

ToJSON (PrtclState StandardCrypto) Source # 
Instance details

Methods

toJSON :: PrtclState StandardCrypto -> Value #

toEncoding :: PrtclState StandardCrypto -> Encoding #

toJSONList :: [PrtclState StandardCrypto] -> Value #

toEncodingList :: [PrtclState StandardCrypto] -> Encoding #

omitField :: PrtclState StandardCrypto -> Bool #

ToJSON (StakeSnapshot crypto) Source # 
Instance details

Methods

toJSON :: StakeSnapshot crypto -> Value #

toEncoding :: StakeSnapshot crypto -> Encoding #

toJSONList :: [StakeSnapshot crypto] -> Value #

toEncodingList :: [StakeSnapshot crypto] -> Encoding #

omitField :: StakeSnapshot crypto -> Bool #

Crypto crypto => ToJSON (StakeSnapshots crypto) Source # 
Instance details

Methods

toJSON :: StakeSnapshots crypto -> Value #

toEncoding :: StakeSnapshots crypto -> Encoding #

toJSONList :: [StakeSnapshots crypto] -> Value #

toEncodingList :: [StakeSnapshots crypto] -> Encoding #

omitField :: StakeSnapshots crypto -> Bool #

Crypto crypto => ToJSON (ShelleyHash crypto) Source # 
Instance details

Methods

toJSON :: ShelleyHash crypto -> Value #

toEncoding :: ShelleyHash crypto -> Encoding #

toJSONList :: [ShelleyHash crypto] -> Value #

toEncodingList :: [ShelleyHash crypto] -> Encoding #

omitField :: ShelleyHash crypto -> Bool #

Crypto crypto => ToJSON (HashHeader crypto) Source # 
Instance details

Methods

toJSON :: HashHeader crypto -> Value #

toEncoding :: HashHeader crypto -> Encoding #

toJSONList :: [HashHeader crypto] -> Value #

toEncodingList :: [HashHeader crypto] -> Encoding #

omitField :: HashHeader crypto -> Bool #

ToJSON a => ToJSON (TooLarge a) Source # 
Instance details

Methods

toJSON :: TooLarge a -> Value #

toEncoding :: TooLarge a -> Encoding #

toJSONList :: [TooLarge a] -> Value #

toEncodingList :: [TooLarge a] -> Encoding #

omitField :: TooLarge a -> Bool #

Semigroup (ShelleyPParams StrictMaybe era) Source # 
Instance details

Methods

(<>) :: ShelleyPParams StrictMaybe era -> ShelleyPParams StrictMaybe era -> ShelleyPParams StrictMaybe era Source #

sconcat :: NonEmpty (ShelleyPParams StrictMaybe era) -> ShelleyPParams StrictMaybe era Source #

stimes :: Integral b => b -> ShelleyPParams StrictMaybe era -> ShelleyPParams StrictMaybe era Source #

Semigroup (BabbagePParams StrictMaybe era) Source # 
Instance details

Methods

(<>) :: BabbagePParams StrictMaybe era -> BabbagePParams StrictMaybe era -> BabbagePParams StrictMaybe era Source #

sconcat :: NonEmpty (BabbagePParams StrictMaybe era) -> BabbagePParams StrictMaybe era Source #

stimes :: Integral b => b -> BabbagePParams StrictMaybe era -> BabbagePParams StrictMaybe era Source #

Semigroup (ConwayPParams StrictMaybe era) Source # 
Instance details

Methods

(<>) :: ConwayPParams StrictMaybe era -> ConwayPParams StrictMaybe era -> ConwayPParams StrictMaybe era Source #

sconcat :: NonEmpty (ConwayPParams StrictMaybe era) -> ConwayPParams StrictMaybe era Source #

stimes :: Integral b => b -> ConwayPParams StrictMaybe era -> ConwayPParams StrictMaybe era Source #

Semigroup (AlonzoPParams StrictMaybe era) Source # 
Instance details

Methods

(<>) :: AlonzoPParams StrictMaybe era -> AlonzoPParams StrictMaybe era -> AlonzoPParams StrictMaybe era Source #

sconcat :: NonEmpty (AlonzoPParams StrictMaybe era) -> AlonzoPParams StrictMaybe era Source #

stimes :: Integral b => b -> AlonzoPParams StrictMaybe era -> AlonzoPParams StrictMaybe era Source #

Crypto c => ToJSON (VKey 'Witness c) Source # 
Instance details

Methods

toJSON :: VKey 'Witness c -> Value #

toEncoding :: VKey 'Witness c -> Encoding #

toJSONList :: [VKey 'Witness c] -> Value #

toEncodingList :: [VKey 'Witness c] -> Encoding #

omitField :: VKey 'Witness c -> Bool #

ToJSON (OneEraHash xs) Source # 
Instance details

Methods

toJSON :: OneEraHash xs -> Value #

toEncoding :: OneEraHash xs -> Encoding #

toJSONList :: [OneEraHash xs] -> Value #

toEncodingList :: [OneEraHash xs] -> Encoding #

omitField :: OneEraHash xs -> Bool #

ToJSON (HeaderHash blk) => ToJSON (Tip blk) Source # 
Instance details

Methods

toJSON :: Tip blk -> Value #

toEncoding :: Tip blk -> Encoding #

toJSONList :: [Tip blk] -> Value #

toEncodingList :: [Tip blk] -> Encoding #

omitField :: Tip blk -> Bool #