shelley-spec-ledger-0.1.0.0
Safe HaskellNone
LanguageHaskell98

Shelley.Spec.Ledger.API

Description

API to the Shelley ledger

Synopsis

Documentation

getNonMyopicMemberRewards :: ShelleyBased era => Globals -> NewEpochState era -> Set (Either Coin (Credential 'Staking (Crypto era))) -> Map (Either Coin (Credential 'Staking (Crypto era))) (Map (KeyHash 'StakePool (Crypto era)) Coin) Source #

Calculate the Non-Myopic Pool Member Rewards for a set of credentials. For each given credential, this function returns a map from each stake pool (identified by the key hash of the pool operator) to the non-myopic pool member reward for that stake pool.

This is not based on any snapshot, but uses the current ledger state.

getUTxO :: NewEpochState era -> UTxO era Source #

Get the full UTxO.

getFilteredUTxO :: NewEpochState era -> Set (Addr (Crypto era)) -> UTxO era Source #

Get the UTxO filtered by address.

getLeaderSchedule :: (Era era, Signable (VRF (Crypto era)) Seed) => Globals -> NewEpochState era -> ChainDepState (Crypto era) -> KeyHash 'StakePool (Crypto era) -> SignKeyVRF (Crypto era) -> PParams era -> Set SlotNo Source #

Get the (private) leader schedule for this epoch.

Given a private VRF key, returns the set of slots in which this node is eligible to lead.

getPoolParameters :: NewEpochState era -> KeyHash 'StakePool (Crypto era) -> Maybe (PoolParams (Crypto era)) Source #

Get the registered stake pool parameters for a given ID.

getTotalStake :: Globals -> NewEpochState era -> Coin Source #

Calculate the current total stake.

poolsByTotalStakeFraction :: forall era. ShelleyBased era => Globals -> NewEpochState era -> PoolDistr (Crypto era) Source #

Get pool sizes, but in terms of total stake

The stake distribution uses active stake (so that the leader schedule is not affected by undelegated stake), but the wallet wants to display pool saturation for rewards purposes. For that, it needs the fraction of total stake.

This is not based on any snapshot, but uses the current ledger state.

newtype Coin Source #

The amount of value held by a transaction output.

Constructors

Coin 

Fields

Instances

Instances details
Enum Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

succ :: Coin -> Coin #

pred :: Coin -> Coin #

toEnum :: Int -> Coin #

fromEnum :: Coin -> Int #

enumFrom :: Coin -> [Coin] #

enumFromThen :: Coin -> Coin -> [Coin] #

enumFromTo :: Coin -> Coin -> [Coin] #

enumFromThenTo :: Coin -> Coin -> Coin -> [Coin] #

Eq Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

(==) :: Coin -> Coin -> Bool #

(/=) :: Coin -> Coin -> Bool #

Ord Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

compare :: Coin -> Coin -> Ordering #

(<) :: Coin -> Coin -> Bool #

(<=) :: Coin -> Coin -> Bool #

(>) :: Coin -> Coin -> Bool #

(>=) :: Coin -> Coin -> Bool #

max :: Coin -> Coin -> Coin #

min :: Coin -> Coin -> Coin #

Show Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

showsPrec :: Int -> Coin -> ShowS #

show :: Coin -> String #

showList :: [Coin] -> ShowS #

Generic Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Associated Types

type Rep Coin :: Type -> Type #

Methods

from :: Coin -> Rep Coin x #

to :: Rep Coin x -> Coin #

Semigroup Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

(<>) :: Coin -> Coin -> Coin #

sconcat :: NonEmpty Coin -> Coin #

stimes :: Integral b => b -> Coin -> Coin #

Monoid Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

mempty :: Coin #

mappend :: Coin -> Coin -> Coin #

mconcat :: [Coin] -> Coin #

NFData Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

rnf :: Coin -> () #

ToJSON Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

FromJSON Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

ToCBOR Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

toCBOR :: Coin -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Coin -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Coin] -> Size Source #

FromCBOR Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Group Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Methods

invert :: Coin -> Coin Source #

(~~) :: Coin -> Coin -> Coin Source #

pow :: Integral x => Coin -> x -> Coin Source #

Abelian Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

NoThunks Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

PartialOrd Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Compactible Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Associated Types

data CompactForm Coin Source #

Torsor Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Associated Types

type Delta Coin Source #

EncodeMint Coin Source # 
Instance details

Defined in Cardano.Ledger.Val

DecodeMint Coin Source # 
Instance details

Defined in Cardano.Ledger.Val

DecodeNonNegative Coin Source # 
Instance details

Defined in Cardano.Ledger.Val

Val Coin Source # 
Instance details

Defined in Cardano.Ledger.Val

HasField "txfee" (TxBody era) Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Coin #

Eq (CompactForm Coin) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

Show (CompactForm Coin) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

ToCBOR (CompactForm Coin) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

FromCBOR (CompactForm Coin) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

NoThunks (CompactForm Coin) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

type Rep Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

type Rep Coin = D1 ('MetaData "Coin" "Shelley.Spec.Ledger.Coin" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Coin" 'PrefixI 'True) (S1 ('MetaSel ('Just "unCoin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))
newtype CompactForm Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

type Delta Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.Coin

data Metadata where Source #

Bundled Patterns

pattern Metadata :: Map Word64 Metadatum -> Metadata 

Instances

Instances details
Eq Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Show Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Generic Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Associated Types

type Rep Metadata :: Type -> Type #

Methods

from :: Metadata -> Rep Metadata x #

to :: Rep Metadata x -> Metadata #

ToCBOR Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Methods

toCBOR :: Metadata -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Metadata -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Metadata] -> Size Source #

NoThunks Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

FromCBOR (Annotator Metadata) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

type Rep Metadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

type Rep Metadata = D1 ('MetaData "Metadata" "Shelley.Spec.Ledger.Metadata" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Metadata'" 'PrefixI 'True) (S1 ('MetaSel ('Just "mdMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Word64 Metadatum)) :*: S1 ('MetaSel ('Just "mdBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

data Metadatum Source #

A generic metadatum type.

Instances

Instances details
Eq Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Ord Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Show Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Generic Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Associated Types

type Rep Metadatum :: Type -> Type #

ToCBOR Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

Methods

toCBOR :: Metadatum -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Metadatum -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Metadatum] -> Size Source #

FromCBOR Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

NoThunks Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

type Rep Metadatum Source # 
Instance details

Defined in Shelley.Spec.Ledger.Metadata

type Hash c = Hash (HASH c) Source #

newtype GenDelegs crypto Source #

Constructors

GenDelegs 

Fields

Instances

Instances details
Eq (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

(==) :: GenDelegs crypto -> GenDelegs crypto -> Bool #

(/=) :: GenDelegs crypto -> GenDelegs crypto -> Bool #

Show (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

showsPrec :: Int -> GenDelegs crypto -> ShowS #

show :: GenDelegs crypto -> String #

showList :: [GenDelegs crypto] -> ShowS #

Generic (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Associated Types

type Rep (GenDelegs crypto) :: Type -> Type #

Methods

from :: GenDelegs crypto -> Rep (GenDelegs crypto) x #

to :: Rep (GenDelegs crypto) x -> GenDelegs crypto #

NFData (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

rnf :: GenDelegs crypto -> () #

Crypto crypto => ToCBOR (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

toCBOR :: GenDelegs crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (GenDelegs crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [GenDelegs crypto] -> Size Source #

Crypto crypto => FromCBOR (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

fromCBOR :: Decoder s (GenDelegs crypto) Source #

label :: Proxy (GenDelegs crypto) -> Text Source #

NoThunks (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (GenDelegs crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (GenDelegs crypto) = D1 ('MetaData "GenDelegs" "Shelley.Spec.Ledger.Keys" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "GenDelegs" 'PrefixI 'True) (S1 ('MetaSel ('Just "unGenDelegs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (KeyHash 'Genesis crypto) (GenDelegPair crypto)))))

data GenDelegPair crypto Source #

Constructors

GenDelegPair 

Fields

Instances

Instances details
Eq (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

(==) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

(/=) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

Ord (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

compare :: GenDelegPair crypto -> GenDelegPair crypto -> Ordering #

(<) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

(<=) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

(>) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

(>=) :: GenDelegPair crypto -> GenDelegPair crypto -> Bool #

max :: GenDelegPair crypto -> GenDelegPair crypto -> GenDelegPair crypto #

min :: GenDelegPair crypto -> GenDelegPair crypto -> GenDelegPair crypto #

Show (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

showsPrec :: Int -> GenDelegPair crypto -> ShowS #

show :: GenDelegPair crypto -> String #

showList :: [GenDelegPair crypto] -> ShowS #

Generic (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Associated Types

type Rep (GenDelegPair crypto) :: Type -> Type #

Methods

from :: GenDelegPair crypto -> Rep (GenDelegPair crypto) x #

to :: Rep (GenDelegPair crypto) x -> GenDelegPair crypto #

NFData (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

rnf :: GenDelegPair crypto -> () #

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

Defined in Shelley.Spec.Ledger.Keys

Crypto crypto => FromJSON (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Crypto crypto => ToCBOR (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

toCBOR :: GenDelegPair crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (GenDelegPair crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [GenDelegPair crypto] -> Size Source #

Crypto crypto => FromCBOR (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

fromCBOR :: Decoder s (GenDelegPair crypto) Source #

label :: Proxy (GenDelegPair crypto) -> Text Source #

NoThunks (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (GenDelegPair crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (GenDelegPair crypto) = D1 ('MetaData "GenDelegPair" "Shelley.Spec.Ledger.Keys" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "GenDelegPair" 'PrefixI 'True) (S1 ('MetaSel ('Just "genDelegKeyHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'GenesisDelegate crypto)) :*: S1 ('MetaSel ('Just "genDelegVrfHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash crypto (VerKeyVRF crypto)))))

newtype KeyHash (discriminator :: KeyRole) crypto Source #

Discriminated hash of public Key

Constructors

KeyHash (Hash (ADDRHASH crypto) (VerKeyDSIGN (DSIGN crypto))) 

Instances

Instances details
HasKeyRole KeyHash Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

coerceKeyRole :: forall (r :: KeyRole) crypto (r' :: KeyRole). KeyHash r crypto -> KeyHash r' crypto Source #

Embed (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toBase :: PoolDistr crypto -> Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto) Source #

fromBase :: Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto) -> PoolDistr crypto Source #

HasExp (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toExp :: PoolDistr crypto -> Exp (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source #

Eq (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

(==) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

(/=) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

Ord (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

compare :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Ordering #

(<) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

(<=) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

(>) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

(>=) :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> Bool #

max :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> KeyHash discriminator crypto #

min :: KeyHash discriminator crypto -> KeyHash discriminator crypto -> KeyHash discriminator crypto #

Show (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

showsPrec :: Int -> KeyHash discriminator crypto -> ShowS #

show :: KeyHash discriminator crypto -> String #

showList :: [KeyHash discriminator crypto] -> ShowS #

Generic (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Associated Types

type Rep (KeyHash discriminator crypto) :: Type -> Type #

Methods

from :: KeyHash discriminator crypto -> Rep (KeyHash discriminator crypto) x #

to :: Rep (KeyHash discriminator crypto) x -> KeyHash discriminator crypto #

NFData (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

rnf :: KeyHash discriminator crypto -> () #

ToJSON (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

toJSON :: KeyHash disc crypto -> Value Source #

toEncoding :: KeyHash disc crypto -> Encoding Source #

toJSONList :: [KeyHash disc crypto] -> Value Source #

toEncodingList :: [KeyHash disc crypto] -> Encoding Source #

ToJSONKey (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Crypto crypto => FromJSON (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

parseJSON :: Value -> Parser (KeyHash disc crypto) Source #

parseJSONList :: Value -> Parser [KeyHash disc crypto] Source #

Crypto crypto => FromJSONKey (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

(Crypto crypto, Typeable disc) => ToCBOR (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

toCBOR :: KeyHash disc crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (KeyHash disc crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [KeyHash disc crypto] -> Size Source #

(Crypto crypto, Typeable disc) => FromCBOR (KeyHash disc crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

fromCBOR :: Decoder s (KeyHash disc crypto) Source #

label :: Proxy (KeyHash disc crypto) -> Text Source #

NoThunks (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

noThunks :: Context -> KeyHash discriminator crypto -> IO (Maybe ThunkInfo) Source #

wNoThunks :: Context -> KeyHash discriminator crypto -> IO (Maybe ThunkInfo) Source #

showTypeOf :: Proxy (KeyHash discriminator crypto) -> String Source #

type Rep (KeyHash discriminator crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (KeyHash discriminator crypto) = Rep (Hash (ADDRHASH crypto) (VerKeyDSIGN (DSIGN crypto)))

data KeyPair (kd :: KeyRole) crypto Source #

Pair of signing key and verification key, with a usage role.

Constructors

KeyPair 

Fields

Instances

Instances details
HasKeyRole KeyPair Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

coerceKeyRole :: forall (r :: KeyRole) crypto (r' :: KeyRole). KeyPair r crypto -> KeyPair r' crypto Source #

Crypto crypto => Show (KeyPair kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

showsPrec :: Int -> KeyPair kd crypto -> ShowS #

show :: KeyPair kd crypto -> String #

showList :: [KeyPair kd crypto] -> ShowS #

Generic (KeyPair kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Associated Types

type Rep (KeyPair kd crypto) :: Type -> Type #

Methods

from :: KeyPair kd crypto -> Rep (KeyPair kd crypto) x #

to :: Rep (KeyPair kd crypto) x -> KeyPair kd crypto #

(Crypto crypto, NFData (VerKeyDSIGN (DSIGN crypto)), NFData (SignKeyDSIGN (DSIGN crypto))) => NFData (KeyPair kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

rnf :: KeyPair kd crypto -> () #

Crypto crypto => NoThunks (KeyPair kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

noThunks :: Context -> KeyPair kd crypto -> IO (Maybe ThunkInfo) Source #

wNoThunks :: Context -> KeyPair kd crypto -> IO (Maybe ThunkInfo) Source #

showTypeOf :: Proxy (KeyPair kd crypto) -> String Source #

type Rep (KeyPair kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (KeyPair kd crypto) = D1 ('MetaData "KeyPair" "Shelley.Spec.Ledger.Keys" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "KeyPair" 'PrefixI 'True) (S1 ('MetaSel ('Just "vKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VKey kd crypto)) :*: S1 ('MetaSel ('Just "sKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignKeyDSIGN (DSIGN crypto)))))

newtype VKey (kd :: KeyRole) crypto Source #

Discriminated verification key

We wrap the basic VerKeyDSIGN in order to add the key role.

Constructors

VKey 

Fields

Instances

Instances details
HasKeyRole VKey Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

coerceKeyRole :: forall (r :: KeyRole) crypto (r' :: KeyRole). VKey r crypto -> VKey r' crypto Source #

Crypto crypto => Eq (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

(==) :: VKey kd crypto -> VKey kd crypto -> Bool #

(/=) :: VKey kd crypto -> VKey kd crypto -> Bool #

Crypto crypto => Show (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

showsPrec :: Int -> VKey kd crypto -> ShowS #

show :: VKey kd crypto -> String #

showList :: [VKey kd crypto] -> ShowS #

Generic (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Associated Types

type Rep (VKey kd crypto) :: Type -> Type #

Methods

from :: VKey kd crypto -> Rep (VKey kd crypto) x #

to :: Rep (VKey kd crypto) x -> VKey kd crypto #

(Crypto crypto, NFData (VerKeyDSIGN (DSIGN crypto))) => NFData (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

rnf :: VKey kd crypto -> () #

(Crypto crypto, Typeable kd) => ToCBOR (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

toCBOR :: VKey kd crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (VKey kd crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [VKey kd crypto] -> Size Source #

(Crypto crypto, Typeable kd) => FromCBOR (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

fromCBOR :: Decoder s (VKey kd crypto) Source #

label :: Proxy (VKey kd crypto) -> Text Source #

Crypto crypto => NoThunks (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

Methods

noThunks :: Context -> VKey kd crypto -> IO (Maybe ThunkInfo) Source #

wNoThunks :: Context -> VKey kd crypto -> IO (Maybe ThunkInfo) Source #

showTypeOf :: Proxy (VKey kd crypto) -> String Source #

type Rep (VKey kd crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

type Rep (VKey kd crypto) = D1 ('MetaData "VKey" "Shelley.Spec.Ledger.Keys" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "VKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unVKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (VerKeyDSIGN (DSIGN crypto)))))

coerceKeyRole :: HasKeyRole a => a r crypto -> a r' crypto Source #

General coercion of key roles.

The presence of this function is mostly to help the user realise where they are converting key roles.

data KeyRole Source #

The role of a key.

Note that a role is not _fixed_, nor is it unique. In particular, keys may variously be used as witnesses, and so in many case we will change the role of a key to the Witness role.

It is also perfectly allowable for a key to be used in many roles; there is nothing prohibiting somebody using the same underlying key as their payment and staking key, as well as the key for their stake pool. So these roles are more intended for two purposes:

  • To make explicit how we are using a key in the specifications
  • To provide a guide to downstream implementors, for whom the profusion of keys may be confusing.

Instances

Instances details
Show KeyRole Source # 
Instance details

Defined in Shelley.Spec.Ledger.Keys

hashKey :: Crypto crypto => VKey kd crypto -> KeyHash kd crypto Source #

Hash a given public key

data Network Source #

Constructors

Testnet 
Mainnet 

Instances

Instances details
Bounded Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Enum Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Eq Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(==) :: Network -> Network -> Bool #

(/=) :: Network -> Network -> Bool #

Ord Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Network :: Type -> Type #

Methods

from :: Network -> Rep Network x #

to :: Rep Network x -> Network #

NFData Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Network -> () #

ToJSON Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Network -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Network -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Network] -> Size Source #

FromCBOR Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Network = D1 ('MetaData "Network" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Testnet" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Mainnet" 'PrefixI 'False) (U1 :: Type -> Type))

data Globals Source #

Constructors

Globals 

Fields

Instances

Instances details
Generic Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Globals :: Type -> Type #

Methods

from :: Globals -> Rep Globals x #

to :: Rep Globals x -> Globals #

NoThunks Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

newtype Port Source #

Constructors

Port 

Fields

Instances

Instances details
Eq Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(==) :: Port -> Port -> Bool #

(/=) :: Port -> Port -> Bool #

Num Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(+) :: Port -> Port -> Port #

(-) :: Port -> Port -> Port #

(*) :: Port -> Port -> Port #

negate :: Port -> Port #

abs :: Port -> Port #

signum :: Port -> Port #

fromInteger :: Integer -> Port #

Ord Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Port -> Port -> Ordering #

(<) :: Port -> Port -> Bool #

(<=) :: Port -> Port -> Bool #

(>) :: Port -> Port -> Bool #

(>=) :: Port -> Port -> Bool #

max :: Port -> Port -> Port #

min :: Port -> Port -> Port #

Show Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Port -> ShowS #

show :: Port -> String #

showList :: [Port] -> ShowS #

Generic Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Port :: Type -> Type #

Methods

from :: Port -> Rep Port x #

to :: Rep Port x -> Port #

NFData Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Port -> () #

ToJSON Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Port -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Port -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Port] -> Size Source #

FromCBOR Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Port = D1 ('MetaData "Port" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Port" 'PrefixI 'True) (S1 ('MetaSel ('Just "portToWord16") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

data StrictMaybe a Source #

Strict Maybe.

TODO move to cardano-prelude

Constructors

SNothing 
SJust !a 

Instances

Instances details
Monad StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(>>=) :: StrictMaybe a -> (a -> StrictMaybe b) -> StrictMaybe b #

(>>) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe b #

return :: a -> StrictMaybe a #

Functor StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fmap :: (a -> b) -> StrictMaybe a -> StrictMaybe b #

(<$) :: a -> StrictMaybe b -> StrictMaybe a #

MonadFail StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fail :: String -> StrictMaybe a #

Applicative StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

pure :: a -> StrictMaybe a #

(<*>) :: StrictMaybe (a -> b) -> StrictMaybe a -> StrictMaybe b #

liftA2 :: (a -> b -> c) -> StrictMaybe a -> StrictMaybe b -> StrictMaybe c #

(*>) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe b #

(<*) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe a #

Foldable StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fold :: Monoid m => StrictMaybe m -> m #

foldMap :: Monoid m => (a -> m) -> StrictMaybe a -> m #

foldMap' :: Monoid m => (a -> m) -> StrictMaybe a -> m #

foldr :: (a -> b -> b) -> b -> StrictMaybe a -> b #

foldr' :: (a -> b -> b) -> b -> StrictMaybe a -> b #

foldl :: (b -> a -> b) -> b -> StrictMaybe a -> b #

foldl' :: (b -> a -> b) -> b -> StrictMaybe a -> b #

foldr1 :: (a -> a -> a) -> StrictMaybe a -> a #

foldl1 :: (a -> a -> a) -> StrictMaybe a -> a #

toList :: StrictMaybe a -> [a] #

null :: StrictMaybe a -> Bool #

length :: StrictMaybe a -> Int #

elem :: Eq a => a -> StrictMaybe a -> Bool #

maximum :: Ord a => StrictMaybe a -> a #

minimum :: Ord a => StrictMaybe a -> a #

sum :: Num a => StrictMaybe a -> a #

product :: Num a => StrictMaybe a -> a #

Traversable StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

traverse :: Applicative f => (a -> f b) -> StrictMaybe a -> f (StrictMaybe b) #

sequenceA :: Applicative f => StrictMaybe (f a) -> f (StrictMaybe a) #

mapM :: Monad m => (a -> m b) -> StrictMaybe a -> m (StrictMaybe b) #

sequence :: Monad m => StrictMaybe (m a) -> m (StrictMaybe a) #

Crypto era ~ crypto => HasField "adHash" (TxBody era) (StrictMaybe (AuxiliaryDataHash crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (AuxiliaryDataHash crypto) #

HasField "update" (TxBody era) (StrictMaybe (Update era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (Update era) #

Eq a => Eq (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Ord a => Ord (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show a => Show (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep (StrictMaybe a) :: Type -> Type #

Methods

from :: StrictMaybe a -> Rep (StrictMaybe a) x #

to :: Rep (StrictMaybe a) x -> StrictMaybe a #

NFData a => NFData (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: StrictMaybe a -> () #

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

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON a => FromJSON (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR a => ToCBOR (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: StrictMaybe a -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (StrictMaybe a) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [StrictMaybe a] -> Size Source #

Era era => ToCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: PParamsUpdate era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PParamsUpdate era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PParamsUpdate era] -> Size Source #

FromCBOR a => FromCBOR (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Era era => FromCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NoThunks a => NoThunks (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Eq (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Ord (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NFData (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: PParams' StrictMaybe era -> () #

type Rep (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep (StrictMaybe a) = D1 ('MetaData "StrictMaybe" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "SNothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SJust" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)))

data Nonce Source #

Evolving nonce type.

Constructors

Nonce !(Hash Blake2b_256 Nonce) 
NeutralNonce

Identity element

Instances

Instances details
Eq Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(==) :: Nonce -> Nonce -> Bool #

(/=) :: Nonce -> Nonce -> Bool #

Ord Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Nonce -> Nonce -> Ordering #

(<) :: Nonce -> Nonce -> Bool #

(<=) :: Nonce -> Nonce -> Bool #

(>) :: Nonce -> Nonce -> Bool #

(>=) :: Nonce -> Nonce -> Bool #

max :: Nonce -> Nonce -> Nonce #

min :: Nonce -> Nonce -> Nonce #

Show Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Nonce -> ShowS #

show :: Nonce -> String #

showList :: [Nonce] -> ShowS #

Generic Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Nonce :: Type -> Type #

Methods

from :: Nonce -> Rep Nonce x #

to :: Rep Nonce x -> Nonce #

NFData Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Nonce -> () #

ToJSON Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Nonce -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Nonce -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Nonce] -> Size Source #

FromCBOR Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Nonce = D1 ('MetaData "Nonce" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Nonce" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash Blake2b_256 Nonce))) :+: C1 ('MetaCons "NeutralNonce" 'PrefixI 'False) (U1 :: Type -> Type))

newtype ScriptHash crypto Source #

Constructors

ScriptHash (Hash (ADDRHASH crypto) EraIndependentScript) 

Instances

Instances details
Eq (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

(==) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

(/=) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

Ord (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

compare :: ScriptHash crypto -> ScriptHash crypto -> Ordering #

(<) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

(<=) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

(>) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

(>=) :: ScriptHash crypto -> ScriptHash crypto -> Bool #

max :: ScriptHash crypto -> ScriptHash crypto -> ScriptHash crypto #

min :: ScriptHash crypto -> ScriptHash crypto -> ScriptHash crypto #

Show (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

showsPrec :: Int -> ScriptHash crypto -> ShowS #

show :: ScriptHash crypto -> String #

showList :: [ScriptHash crypto] -> ShowS #

Generic (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Associated Types

type Rep (ScriptHash crypto) :: Type -> Type #

Methods

from :: ScriptHash crypto -> Rep (ScriptHash crypto) x #

to :: Rep (ScriptHash crypto) x -> ScriptHash crypto #

NFData (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

rnf :: ScriptHash crypto -> () #

ToJSON (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Crypto crypto => FromJSON (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Crypto crypto => ToCBOR (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

toCBOR :: ScriptHash crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (ScriptHash crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [ScriptHash crypto] -> Size Source #

Crypto crypto => FromCBOR (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

fromCBOR :: Decoder s (ScriptHash crypto) Source #

label :: Proxy (ScriptHash crypto) -> Text Source #

NoThunks (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

type Rep (ScriptHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

type Rep (ScriptHash crypto) = D1 ('MetaData "ScriptHash" "Shelley.Spec.Ledger.Scripts" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "ScriptHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hash (ADDRHASH crypto) EraIndependentScript))))

data MultiSig crypto where Source #

Bundled Patterns

pattern RequireMOf :: Crypto crypto => Int -> [MultiSig crypto] -> MultiSig crypto 
pattern RequireSignature :: Crypto crypto => KeyHash 'Witness crypto -> MultiSig crypto 
pattern RequireAllOf :: Crypto crypto => [MultiSig crypto] -> MultiSig crypto 
pattern RequireAnyOf :: Crypto crypto => [MultiSig crypto] -> MultiSig crypto 

Instances

Instances details
Eq (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

(==) :: MultiSig crypto -> MultiSig crypto -> Bool #

(/=) :: MultiSig crypto -> MultiSig crypto -> Bool #

Ord (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

compare :: MultiSig crypto -> MultiSig crypto -> Ordering #

(<) :: MultiSig crypto -> MultiSig crypto -> Bool #

(<=) :: MultiSig crypto -> MultiSig crypto -> Bool #

(>) :: MultiSig crypto -> MultiSig crypto -> Bool #

(>=) :: MultiSig crypto -> MultiSig crypto -> Bool #

max :: MultiSig crypto -> MultiSig crypto -> MultiSig crypto #

min :: MultiSig crypto -> MultiSig crypto -> MultiSig crypto #

Show (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

showsPrec :: Int -> MultiSig crypto -> ShowS #

show :: MultiSig crypto -> String #

showList :: [MultiSig crypto] -> ShowS #

Generic (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Associated Types

type Rep (MultiSig crypto) :: Type -> Type #

Methods

from :: MultiSig crypto -> Rep (MultiSig crypto) x #

to :: Rep (MultiSig crypto) x -> MultiSig crypto #

Typeable crypto => ToCBOR (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Methods

toCBOR :: MultiSig crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (MultiSig crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [MultiSig crypto] -> Size Source #

Crypto crypto => FromCBOR (Annotator (MultiSig crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

Typeable crypto => NoThunks (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

type Rep (MultiSig crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Scripts

type Rep (MultiSig crypto)

data TicknState Source #

Instances

Instances details
Eq TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

Show TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

Generic TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

Associated Types

type Rep TicknState :: Type -> Type #

ToCBOR TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

FromCBOR TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

NoThunks TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

type Rep TicknState Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tickn

type Rep TicknState = D1 ('MetaData "TicknState" "Shelley.Spec.Ledger.STS.Tickn" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "TicknState" 'PrefixI 'True) (S1 ('MetaSel ('Just "ticknStateEpochNonce") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Nonce) :*: S1 ('MetaSel ('Just "ticknStatePrevHashNonce") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Nonce)))

data TicknEnv Source #

Constructors

TicknEnv 

Fields

data BootstrapWitness crypto where Source #

Bundled Patterns

pattern BootstrapWitness :: Crypto crypto => VKey 'Witness crypto -> SignedDSIGN crypto (Hash crypto EraIndependentTxBody) -> ChainCode -> ByteString -> BootstrapWitness crypto 

Instances

Instances details
Crypto crypto => Eq (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Methods

(==) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

(/=) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

Crypto crypto => Ord (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Methods

compare :: BootstrapWitness crypto -> BootstrapWitness crypto -> Ordering #

(<) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

(<=) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

(>) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

(>=) :: BootstrapWitness crypto -> BootstrapWitness crypto -> Bool #

max :: BootstrapWitness crypto -> BootstrapWitness crypto -> BootstrapWitness crypto #

min :: BootstrapWitness crypto -> BootstrapWitness crypto -> BootstrapWitness crypto #

Crypto crypto => Show (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Methods

showsPrec :: Int -> BootstrapWitness crypto -> ShowS #

show :: BootstrapWitness crypto -> String #

showList :: [BootstrapWitness crypto] -> ShowS #

Generic (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Associated Types

type Rep (BootstrapWitness crypto) :: Type -> Type #

Methods

from :: BootstrapWitness crypto -> Rep (BootstrapWitness crypto) x #

to :: Rep (BootstrapWitness crypto) x -> BootstrapWitness crypto #

Crypto crypto => ToCBOR (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Methods

toCBOR :: BootstrapWitness crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (BootstrapWitness crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [BootstrapWitness crypto] -> Size Source #

Crypto crypto => FromCBOR (Annotator (BootstrapWitness crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Crypto crypto => NoThunks (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

type Rep (BootstrapWitness crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

type Rep (BootstrapWitness crypto) = D1 ('MetaData "BootstrapWitness" "Shelley.Spec.Ledger.Address.Bootstrap" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "BootstrapWitness'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "bwKey'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VKey 'Witness crypto)) :*: S1 ('MetaSel ('Just "bwSig'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignedDSIGN crypto (Hash crypto EraIndependentTxBody)))) :*: (S1 ('MetaSel ('Just "bwChainCode'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ChainCode) :*: (S1 ('MetaSel ('Just "bwAttributes'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ByteString) :*: S1 ('MetaSel ('Just "bwBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))))

data OBftSlot crypto Source #

Constructors

NonActiveSlot 
ActiveSlot !(KeyHash 'Genesis crypto) 

Instances

Instances details
Eq (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

(==) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

(/=) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

Ord (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

compare :: OBftSlot crypto -> OBftSlot crypto -> Ordering #

(<) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

(<=) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

(>) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

(>=) :: OBftSlot crypto -> OBftSlot crypto -> Bool #

max :: OBftSlot crypto -> OBftSlot crypto -> OBftSlot crypto #

min :: OBftSlot crypto -> OBftSlot crypto -> OBftSlot crypto #

Show (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

showsPrec :: Int -> OBftSlot crypto -> ShowS #

show :: OBftSlot crypto -> String #

showList :: [OBftSlot crypto] -> ShowS #

Generic (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Associated Types

type Rep (OBftSlot crypto) :: Type -> Type #

Methods

from :: OBftSlot crypto -> Rep (OBftSlot crypto) x #

to :: Rep (OBftSlot crypto) x -> OBftSlot crypto #

NFData (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

rnf :: OBftSlot crypto -> () #

Crypto crypto => ToCBOR (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

toCBOR :: OBftSlot crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (OBftSlot crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [OBftSlot crypto] -> Size Source #

Crypto crypto => FromCBOR (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

Methods

fromCBOR :: Decoder s (OBftSlot crypto) Source #

label :: Proxy (OBftSlot crypto) -> Text Source #

NoThunks (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

type Rep (OBftSlot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OverlaySchedule

type Rep (OBftSlot crypto) = D1 ('MetaData "OBftSlot" "Shelley.Spec.Ledger.OverlaySchedule" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "NonActiveSlot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ActiveSlot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'Genesis crypto))))

newtype ProposedPPUpdates era Source #

Update operation for protocol parameters structure @PParams

Constructors

ProposedPPUpdates (Map (KeyHash 'Genesis (Crypto era)) (PParamsUpdate era)) 

Instances

Instances details
Eq (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Generic (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Associated Types

type Rep (ProposedPPUpdates era) :: Type -> Type #

NFData (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: ProposedPPUpdates era -> () #

Era era => ToCBOR (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Era era => FromCBOR (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NoThunks (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep (ProposedPPUpdates era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep (ProposedPPUpdates era) = D1 ('MetaData "ProposedPPUpdates" "Shelley.Spec.Ledger.PParams" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "ProposedPPUpdates" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (KeyHash 'Genesis (Crypto era)) (PParamsUpdate era)))))

data Update era Source #

Update Proposal

Constructors

Update !(ProposedPPUpdates era) !EpochNo 

Instances

Instances details
HasField "update" (TxBody era) (StrictMaybe (Update era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (Update era) #

Eq (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

(==) :: Update era -> Update era -> Bool #

(/=) :: Update era -> Update era -> Bool #

Show (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

showsPrec :: Int -> Update era -> ShowS #

show :: Update era -> String #

showList :: [Update era] -> ShowS #

Generic (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Associated Types

type Rep (Update era) :: Type -> Type #

Methods

from :: Update era -> Rep (Update era) x #

to :: Rep (Update era) x -> Update era #

NFData (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: Update era -> () #

Era era => ToCBOR (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: Update era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Update era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Update era] -> Size Source #

Era era => FromCBOR (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

fromCBOR :: Decoder s (Update era) Source #

label :: Proxy (Update era) -> Text Source #

NoThunks (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep (Update era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep (Update era) = D1 ('MetaData "Update" "Shelley.Spec.Ledger.PParams" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Update" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ProposedPPUpdates era)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 EpochNo)))

data ProtVer Source #

Constructors

ProtVer 

Fields

Instances

Instances details
Eq ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

(==) :: ProtVer -> ProtVer -> Bool #

(/=) :: ProtVer -> ProtVer -> Bool #

Ord ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Generic ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Associated Types

type Rep ProtVer :: Type -> Type #

Methods

from :: ProtVer -> Rep ProtVer x #

to :: Rep ProtVer x -> ProtVer #

NFData ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: ProtVer -> () #

ToJSON ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

FromJSON ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

ToCBOR ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: ProtVer -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy ProtVer -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [ProtVer] -> Size Source #

FromCBOR ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NoThunks ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

FromCBORGroup ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

ToCBORGroup ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep ProtVer Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep ProtVer = D1 ('MetaData "ProtVer" "Shelley.Spec.Ledger.PParams" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ProtVer" 'PrefixI 'True) (S1 ('MetaSel ('Just "pvMajor") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Natural) :*: S1 ('MetaSel ('Just "pvMinor") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Natural)))

data PParams' f era Source #

Protocol parameters.

We use the HKD type family so that the protocol parameters type and the type for the updates to the protocol parameters can share records fields. The protocol parameters will have type PParams' Identity, and the updates will have type PParams' StrictMaybe, though Identity will be hidden from use.

For example:

  myParameters =
    PParams
      { _minfeeA = 0,
        _minfeeB = 0,
        ...
      }

  myUpdate =
    PParamsUpdate
      { _minfeeA = SNothing,
        _minfeeB = SJust 42,
        ...
      }

Constructors

PParams 

Fields

Instances

Instances details
ToJSON (PParams era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

FromJSON (PParams era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Era era => ToCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: PParamsUpdate era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PParamsUpdate era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PParamsUpdate era] -> Size Source #

Era era => ToCBOR (PParams era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: PParams era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PParams era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PParams era] -> Size Source #

Era era => FromCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Era era => FromCBOR (PParams era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

fromCBOR :: Decoder s (PParams era) Source #

label :: Proxy (PParams era) -> Text Source #

NoThunks (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NoThunks (PParams era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Eq (PParams' Identity era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Eq (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Ord (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show (PParams' Identity era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Generic (PParams' f era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Associated Types

type Rep (PParams' f era) :: Type -> Type #

Methods

from :: PParams' f era -> Rep (PParams' f era) x #

to :: Rep (PParams' f era) x -> PParams' f era #

NFData (PParams' Identity era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: PParams' Identity era -> () #

NFData (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: PParams' StrictMaybe era -> () #

type Rep (PParams' f era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

type Rep (PParams' f era)

data OCert crypto Source #

Constructors

OCert 

Fields

Instances

Instances details
Crypto crypto => Eq (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

(==) :: OCert crypto -> OCert crypto -> Bool #

(/=) :: OCert crypto -> OCert crypto -> Bool #

Crypto crypto => Show (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

showsPrec :: Int -> OCert crypto -> ShowS #

show :: OCert crypto -> String #

showList :: [OCert crypto] -> ShowS #

Generic (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Associated Types

type Rep (OCert crypto) :: Type -> Type #

Methods

from :: OCert crypto -> Rep (OCert crypto) x #

to :: Rep (OCert crypto) x -> OCert crypto #

Crypto crypto => ToCBOR (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

toCBOR :: OCert crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (OCert crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [OCert crypto] -> Size Source #

Crypto crypto => NoThunks (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Crypto crypto => FromCBORGroup (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

fromCBORGroup :: Decoder s (OCert crypto) Source #

Crypto crypto => ToCBORGroup (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

toCBORGroup :: OCert crypto -> Encoding Source #

encodedGroupSizeExpr :: (forall x. ToCBOR x => Proxy x -> Size) -> Proxy (OCert crypto) -> Size Source #

listLen :: OCert crypto -> Word Source #

listLenBound :: Proxy (OCert crypto) -> Word Source #

type Rep (OCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

type Rep (OCert crypto) = D1 ('MetaData "OCert" "Shelley.Spec.Ledger.OCert" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "OCert" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ocertVkHot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyKES crypto)) :*: S1 ('MetaSel ('Just "ocertN") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "ocertKESPeriod") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 KESPeriod) :*: S1 ('MetaSel ('Just "ocertSigma") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignedDSIGN crypto (OCertSignable crypto))))))

newtype KESPeriod Source #

Constructors

KESPeriod 

Fields

Instances

Instances details
Eq KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Ord KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Show KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Generic KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Associated Types

type Rep KESPeriod :: Type -> Type #

ToCBOR KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

toCBOR :: KESPeriod -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy KESPeriod -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [KESPeriod] -> Size Source #

FromCBOR KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

NoThunks KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

type Rep KESPeriod Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

type Rep KESPeriod = D1 ('MetaData "KESPeriod" "Shelley.Spec.Ledger.OCert" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "KESPeriod" 'PrefixI 'True) (S1 ('MetaSel ('Just "unKESPeriod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

data OCertEnv crypto Source #

Constructors

OCertEnv 

Instances

Instances details
Eq (OCertEnv crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

(==) :: OCertEnv crypto -> OCertEnv crypto -> Bool #

(/=) :: OCertEnv crypto -> OCertEnv crypto -> Bool #

Show (OCertEnv crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.OCert

Methods

showsPrec :: Int -> OCertEnv crypto -> ShowS #

show :: OCertEnv crypto -> String #

showList :: [OCertEnv crypto] -> ShowS #

data Ptr Source #

Pointer to a slot, transaction index and index in certificate list.

Constructors

Ptr !SlotNo !Ix !Ix 

Instances

Instances details
Eq Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

(==) :: Ptr -> Ptr -> Bool #

(/=) :: Ptr -> Ptr -> Bool #

Ord Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

compare :: Ptr -> Ptr -> Ordering #

(<) :: Ptr -> Ptr -> Bool #

(<=) :: Ptr -> Ptr -> Bool #

(>) :: Ptr -> Ptr -> Bool #

(>=) :: Ptr -> Ptr -> Bool #

max :: Ptr -> Ptr -> Ptr #

min :: Ptr -> Ptr -> Ptr #

Show Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

showsPrec :: Int -> Ptr -> ShowS #

show :: Ptr -> String #

showList :: [Ptr] -> ShowS #

Generic Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Associated Types

type Rep Ptr :: Type -> Type #

Methods

from :: Ptr -> Rep Ptr x #

to :: Rep Ptr x -> Ptr #

NFData Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

rnf :: Ptr -> () #

ToCBOR Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

toCBOR :: Ptr -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Ptr -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Ptr] -> Size Source #

FromCBOR Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

NoThunks Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

FromCBORGroup Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

ToCBORGroup Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep Ptr Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep Ptr = D1 ('MetaData "Ptr" "Shelley.Spec.Ledger.Credential" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Ptr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SlotNo) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Ix) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Ix))))

data StakeReference crypto Source #

Instances

Instances details
Eq (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

(==) :: StakeReference crypto -> StakeReference crypto -> Bool #

(/=) :: StakeReference crypto -> StakeReference crypto -> Bool #

Ord (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

compare :: StakeReference crypto -> StakeReference crypto -> Ordering #

(<) :: StakeReference crypto -> StakeReference crypto -> Bool #

(<=) :: StakeReference crypto -> StakeReference crypto -> Bool #

(>) :: StakeReference crypto -> StakeReference crypto -> Bool #

(>=) :: StakeReference crypto -> StakeReference crypto -> Bool #

max :: StakeReference crypto -> StakeReference crypto -> StakeReference crypto #

min :: StakeReference crypto -> StakeReference crypto -> StakeReference crypto #

Show (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

showsPrec :: Int -> StakeReference crypto -> ShowS #

show :: StakeReference crypto -> String #

showList :: [StakeReference crypto] -> ShowS #

Generic (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Associated Types

type Rep (StakeReference crypto) :: Type -> Type #

Methods

from :: StakeReference crypto -> Rep (StakeReference crypto) x #

to :: Rep (StakeReference crypto) x -> StakeReference crypto #

NFData (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

rnf :: StakeReference crypto -> () #

NoThunks (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep (StakeReference crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep (StakeReference crypto) = D1 ('MetaData "StakeReference" "Shelley.Spec.Ledger.Credential" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "StakeRefBase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StakeCredential crypto))) :+: (C1 ('MetaCons "StakeRefPtr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Ptr)) :+: C1 ('MetaCons "StakeRefNull" 'PrefixI 'False) (U1 :: Type -> Type)))

data Credential (kr :: KeyRole) crypto Source #

Script hash or key hash for a payment or a staking object.

Note that credentials (unlike raw key hashes) do appear to vary from era to era, since they reference the hash of a script, which can change. This parameter is a phantom, however, so in actuality the instances will remain the same.

Constructors

ScriptHashObj !(ScriptHash crypto) 
KeyHashObj !(KeyHash kr crypto) 

Instances

Instances details
HasKeyRole Credential Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

coerceKeyRole :: forall (r :: KeyRole) crypto (r' :: KeyRole). Credential r crypto -> Credential r' crypto Source #

Embed (StakeCreds era) (Map (Credential 'Staking era) SlotNo) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

HasExp (StakeCreds era) (Map (Credential 'Staking era) SlotNo) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toExp :: StakeCreds era -> Exp (Map (Credential 'Staking era) SlotNo) Source #

Eq (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

(==) :: Credential kr crypto -> Credential kr crypto -> Bool #

(/=) :: Credential kr crypto -> Credential kr crypto -> Bool #

Ord (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

compare :: Credential kr crypto -> Credential kr crypto -> Ordering #

(<) :: Credential kr crypto -> Credential kr crypto -> Bool #

(<=) :: Credential kr crypto -> Credential kr crypto -> Bool #

(>) :: Credential kr crypto -> Credential kr crypto -> Bool #

(>=) :: Credential kr crypto -> Credential kr crypto -> Bool #

max :: Credential kr crypto -> Credential kr crypto -> Credential kr crypto #

min :: Credential kr crypto -> Credential kr crypto -> Credential kr crypto #

Show (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

showsPrec :: Int -> Credential kr crypto -> ShowS #

show :: Credential kr crypto -> String #

showList :: [Credential kr crypto] -> ShowS #

Generic (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Associated Types

type Rep (Credential kr crypto) :: Type -> Type #

Methods

from :: Credential kr crypto -> Rep (Credential kr crypto) x #

to :: Rep (Credential kr crypto) x -> Credential kr crypto #

NFData (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

rnf :: Credential kr crypto -> () #

ToJSON (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

toJSON :: Credential kr crypto -> Value Source #

toEncoding :: Credential kr crypto -> Encoding Source #

toJSONList :: [Credential kr crypto] -> Value Source #

toEncodingList :: [Credential kr crypto] -> Encoding Source #

ToJSONKey (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Crypto crypto => FromJSON (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

parseJSON :: Value -> Parser (Credential kr crypto) Source #

parseJSONList :: Value -> Parser [Credential kr crypto] Source #

Crypto crypto => FromJSONKey (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

(Typeable kr, Crypto crypto) => ToCBOR (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

toCBOR :: Credential kr crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Credential kr crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Credential kr crypto] -> Size Source #

(Typeable kr, Crypto crypto) => FromCBOR (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

Methods

fromCBOR :: Decoder s (Credential kr crypto) Source #

label :: Proxy (Credential kr crypto) -> Text Source #

NoThunks (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep (Credential kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Credential

type Rep (Credential kr crypto) = D1 ('MetaData "Credential" "Shelley.Spec.Ledger.Credential" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ScriptHashObj" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 (ScriptHash crypto))) :+: C1 ('MetaCons "KeyHashObj" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash kr crypto))))

data RewardAcnt crypto Source #

An account based address for rewards

Constructors

RewardAcnt 

Instances

Instances details
Eq (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

(==) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

(/=) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

Ord (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

compare :: RewardAcnt crypto -> RewardAcnt crypto -> Ordering #

(<) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

(<=) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

(>) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

(>=) :: RewardAcnt crypto -> RewardAcnt crypto -> Bool #

max :: RewardAcnt crypto -> RewardAcnt crypto -> RewardAcnt crypto #

min :: RewardAcnt crypto -> RewardAcnt crypto -> RewardAcnt crypto #

Show (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

showsPrec :: Int -> RewardAcnt crypto -> ShowS #

show :: RewardAcnt crypto -> String #

showList :: [RewardAcnt crypto] -> ShowS #

Generic (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Associated Types

type Rep (RewardAcnt crypto) :: Type -> Type #

Methods

from :: RewardAcnt crypto -> Rep (RewardAcnt crypto) x #

to :: Rep (RewardAcnt crypto) x -> RewardAcnt crypto #

NFData (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

rnf :: RewardAcnt crypto -> () #

ToJSON (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

ToJSONKey (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Crypto crypto => FromJSON (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Crypto crypto => FromJSONKey (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Crypto crypto => ToCBOR (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

toCBOR :: RewardAcnt crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (RewardAcnt crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [RewardAcnt crypto] -> Size Source #

Crypto crypto => FromCBOR (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

fromCBOR :: Decoder s (RewardAcnt crypto) Source #

label :: Proxy (RewardAcnt crypto) -> Text Source #

NoThunks (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

type Rep (RewardAcnt crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

type Rep (RewardAcnt crypto) = D1 ('MetaData "RewardAcnt" "Shelley.Spec.Ledger.Address" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "RewardAcnt" 'PrefixI 'True) (S1 ('MetaSel ('Just "getRwdNetwork") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Network) :*: S1 ('MetaSel ('Just "getRwdCred") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Credential 'Staking crypto))))

data Addr crypto Source #

An address for UTxO.

Instances

Instances details
Eq (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

(==) :: Addr crypto -> Addr crypto -> Bool #

(/=) :: Addr crypto -> Addr crypto -> Bool #

Ord (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

compare :: Addr crypto -> Addr crypto -> Ordering #

(<) :: Addr crypto -> Addr crypto -> Bool #

(<=) :: Addr crypto -> Addr crypto -> Bool #

(>) :: Addr crypto -> Addr crypto -> Bool #

(>=) :: Addr crypto -> Addr crypto -> Bool #

max :: Addr crypto -> Addr crypto -> Addr crypto #

min :: Addr crypto -> Addr crypto -> Addr crypto #

Show (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

showsPrec :: Int -> Addr crypto -> ShowS #

show :: Addr crypto -> String #

showList :: [Addr crypto] -> ShowS #

Generic (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Associated Types

type Rep (Addr crypto) :: Type -> Type #

Methods

from :: Addr crypto -> Rep (Addr crypto) x #

to :: Rep (Addr crypto) x -> Addr crypto #

NFData (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

rnf :: Addr crypto -> () #

ToJSON (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

toJSON :: Addr crypto -> Value Source #

toEncoding :: Addr crypto -> Encoding Source #

toJSONList :: [Addr crypto] -> Value Source #

toEncodingList :: [Addr crypto] -> Encoding Source #

ToJSONKey (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Crypto crypto => FromJSON (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

parseJSON :: Value -> Parser (Addr crypto) Source #

parseJSONList :: Value -> Parser [Addr crypto] Source #

Crypto crypto => FromJSONKey (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Crypto crypto => ToCBOR (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

toCBOR :: Addr crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Addr crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Addr crypto] -> Size Source #

Crypto crypto => FromCBOR (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

Methods

fromCBOR :: Decoder s (Addr crypto) Source #

label :: Proxy (Addr crypto) -> Text Source #

NoThunks (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

type Rep (Addr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address

computeStabilityWindow :: Word64 -> ActiveSlotCoeff -> Word64 Source #

Calculate the stability window (e.g. the number of slots needed for a block to become stable) from the security param and the active slot coefficient.

The value 3k/f is determined to be a suitabe value as per https://docs.google.com/document/d/1B8BNMx8jVWRjYiUBOaI3jfZ7dQNvNTSDODvT5iOuYCU/edit#heading=h.qh2zcajmu6hm

computeRandomnessStabilisationWindow :: Word64 -> ActiveSlotCoeff -> Word64 Source #

Calculate the randomness stabilisation window from the security param and the active slot coefficient.

The value 4k/f is determined to be a suitabe value as per https://docs.google.com/document/d/1B8BNMx8jVWRjYiUBOaI3jfZ7dQNvNTSDODvT5iOuYCU/edit#heading=h.qh2zcajmu6hm

newtype StakeCreds crypto Source #

Constructors

StakeCreds 

Instances

Instances details
Eq (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: StakeCreds crypto -> StakeCreds crypto -> Bool #

(/=) :: StakeCreds crypto -> StakeCreds crypto -> Bool #

Show (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> StakeCreds crypto -> ShowS #

show :: StakeCreds crypto -> String #

showList :: [StakeCreds crypto] -> ShowS #

Generic (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (StakeCreds crypto) :: Type -> Type #

Methods

from :: StakeCreds crypto -> Rep (StakeCreds crypto) x #

to :: Rep (StakeCreds crypto) x -> StakeCreds crypto #

NFData (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: StakeCreds crypto -> () #

ToJSON (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto crypto => FromJSON (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto crypto => ToCBOR (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: StakeCreds crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (StakeCreds crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [StakeCreds crypto] -> Size Source #

Crypto crypto => FromCBOR (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (StakeCreds crypto) Source #

label :: Proxy (StakeCreds crypto) -> Text Source #

NoThunks (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Embed (StakeCreds era) (Map (Credential 'Staking era) SlotNo) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

HasExp (StakeCreds era) (Map (Credential 'Staking era) SlotNo) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toExp :: StakeCreds era -> Exp (Map (Credential 'Staking era) SlotNo) Source #

type Rep (StakeCreds crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (StakeCreds crypto) = D1 ('MetaData "StakeCreds" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "StakeCreds" 'PrefixI 'True) (S1 ('MetaSel ('Just "unStakeCreds") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (Credential 'Staking crypto) SlotNo))))

data WitVKey kr crypto where Source #

Proof/Witness that a transaction is authorized by the given key holder.

Bundled Patterns

pattern WitVKey :: (Typeable kr, Crypto crypto) => VKey kr crypto -> SignedDSIGN crypto (Hash crypto EraIndependentTxBody) -> WitVKey kr crypto 

Instances

Instances details
(Typeable kr, Crypto crypto) => FromCBOR (Annotator (WitVKey kr crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (Annotator (WitVKey kr crypto)) Source #

label :: Proxy (Annotator (WitVKey kr crypto)) -> Text Source #

Crypto crypto => Eq (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

(/=) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

(Typeable kr, Crypto crypto) => Ord (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

compare :: WitVKey kr crypto -> WitVKey kr crypto -> Ordering #

(<) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

(<=) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

(>) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

(>=) :: WitVKey kr crypto -> WitVKey kr crypto -> Bool #

max :: WitVKey kr crypto -> WitVKey kr crypto -> WitVKey kr crypto #

min :: WitVKey kr crypto -> WitVKey kr crypto -> WitVKey kr crypto #

Crypto crypto => Show (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> WitVKey kr crypto -> ShowS #

show :: WitVKey kr crypto -> String #

showList :: [WitVKey kr crypto] -> ShowS #

Generic (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (WitVKey kr crypto) :: Type -> Type #

Methods

from :: WitVKey kr crypto -> Rep (WitVKey kr crypto) x #

to :: Rep (WitVKey kr crypto) x -> WitVKey kr crypto #

(Typeable kr, Crypto crypto) => ToCBOR (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: WitVKey kr crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (WitVKey kr crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [WitVKey kr crypto] -> Size Source #

(Crypto crypto, Typeable kr) => NoThunks (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

noThunks :: Context -> WitVKey kr crypto -> IO (Maybe ThunkInfo) Source #

wNoThunks :: Context -> WitVKey kr crypto -> IO (Maybe ThunkInfo) Source #

showTypeOf :: Proxy (WitVKey kr crypto) -> String Source #

type Rep (WitVKey kr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (WitVKey kr crypto) = D1 ('MetaData "WitVKey" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "WitVKey'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "wvkKey'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VKey kr crypto)) :*: S1 ('MetaSel ('Just "wvkSig'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignedDSIGN crypto (Hash crypto EraIndependentTxBody)))) :*: (S1 ('MetaSel ('Just "wvkKeyHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'Witness crypto)) :*: S1 ('MetaSel ('Just "wvkBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))

newtype TxBody era Source #

Constructors

TxBodyConstr (MemoBytes (TxBodyRaw era)) 

Bundled Patterns

pattern TxBody :: ProperTo era => Set (TxIn (Crypto era)) -> StrictSeq (TxOut era) -> StrictSeq (DCert (Crypto era)) -> Wdrl (Crypto era) -> Coin -> SlotNo -> StrictMaybe (Update era) -> StrictMaybe (AuxiliaryDataHash (Crypto era)) -> TxBody era

Pattern for use by external users

Instances

Instances details
HasField "ttl" (TxBody era) SlotNo Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> SlotNo #

HasField "txfee" (TxBody era) Coin Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Coin #

Crypto era ~ crypto => HasField "adHash" (TxBody era) (StrictMaybe (AuxiliaryDataHash crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (AuxiliaryDataHash crypto) #

Crypto era ~ crypto => HasField "certs" (TxBody era) (StrictSeq (DCert crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictSeq (DCert crypto) #

Crypto era ~ crypto => HasField "inputs" (TxBody era) (Set (TxIn crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Set (TxIn crypto) #

HasField "outputs" (TxBody era) (StrictSeq (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictSeq (TxOut era) #

HasField "update" (TxBody era) (StrictMaybe (Update era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (Update era) #

Crypto era ~ crypto => HasField "wdrls" (TxBody era) (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Wdrl crypto #

ProperVal era => Eq (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: TxBody era -> TxBody era -> Bool #

(/=) :: TxBody era -> TxBody era -> Bool #

ProperVal era => Show (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> TxBody era -> ShowS #

show :: TxBody era -> String #

showList :: [TxBody era] -> ShowS #

Generic (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (TxBody era) :: Type -> Type #

Methods

from :: TxBody era -> Rep (TxBody era) x #

to :: Rep (TxBody era) x -> TxBody era #

Crypto (Crypto era) => NFData (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: TxBody era -> () #

Era era => ToCBOR (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: TxBody era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (TxBody era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxBody era] -> Size Source #

ProperFrom era => FromCBOR (Annotator (TxBody era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Typeable era => NoThunks (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Era era => HashAnnotated (TxBody era) era Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type HashIndex (TxBody era) Source #

Methods

hashAnnotated :: TxBody era -> Hash (HASH (Crypto era)) (HashIndex (TxBody era)) Source #

type Rep (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxBody era) = D1 ('MetaData "TxBody" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "TxBodyConstr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (MemoBytes (TxBodyRaw era)))))
type HashIndex (TxBody era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

data DCert crypto Source #

A heavyweight certificate.

Constructors

DCertDeleg !(DelegCert crypto) 
DCertPool !(PoolCert crypto) 
DCertGenesis !(GenesisDelegCert crypto) 
DCertMir !(MIRCert crypto) 

Instances

Instances details
Crypto era ~ crypto => HasField "certs" (TxBody era) (StrictSeq (DCert crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictSeq (DCert crypto) #

Eq (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: DCert crypto -> DCert crypto -> Bool #

(/=) :: DCert crypto -> DCert crypto -> Bool #

Show (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> DCert crypto -> ShowS #

show :: DCert crypto -> String #

showList :: [DCert crypto] -> ShowS #

Generic (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (DCert crypto) :: Type -> Type #

Methods

from :: DCert crypto -> Rep (DCert crypto) x #

to :: Rep (DCert crypto) x -> DCert crypto #

Crypto crypto => ToCBOR (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: DCert crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (DCert crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [DCert crypto] -> Size Source #

Crypto crypto => FromCBOR (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (DCert crypto) Source #

label :: Proxy (DCert crypto) -> Text Source #

NoThunks (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (DCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (DCert crypto) = D1 ('MetaData "DCert" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) ((C1 ('MetaCons "DCertDeleg" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (DelegCert crypto))) :+: C1 ('MetaCons "DCertPool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PoolCert crypto)))) :+: (C1 ('MetaCons "DCertGenesis" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (GenesisDelegCert crypto))) :+: C1 ('MetaCons "DCertMir" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (MIRCert crypto)))))

data MIRCert crypto Source #

Move instantaneous rewards certificate

Constructors

MIRCert 

Fields

Instances

Instances details
Eq (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: MIRCert crypto -> MIRCert crypto -> Bool #

(/=) :: MIRCert crypto -> MIRCert crypto -> Bool #

Show (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> MIRCert crypto -> ShowS #

show :: MIRCert crypto -> String #

showList :: [MIRCert crypto] -> ShowS #

Generic (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (MIRCert crypto) :: Type -> Type #

Methods

from :: MIRCert crypto -> Rep (MIRCert crypto) x #

to :: Rep (MIRCert crypto) x -> MIRCert crypto #

Crypto crypto => ToCBOR (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: MIRCert crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (MIRCert crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [MIRCert crypto] -> Size Source #

Crypto crypto => FromCBOR (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (MIRCert crypto) Source #

label :: Proxy (MIRCert crypto) -> Text Source #

NoThunks (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (MIRCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (MIRCert crypto) = D1 ('MetaData "MIRCert" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "MIRCert" 'PrefixI 'True) (S1 ('MetaSel ('Just "mirPot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MIRPot) :*: S1 ('MetaSel ('Just "mirRewards") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (Credential 'Staking crypto) Coin))))

data MIRPot Source #

Constructors

ReservesMIR 
TreasuryMIR 

Instances

Instances details
Eq MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: MIRPot -> MIRPot -> Bool #

(/=) :: MIRPot -> MIRPot -> Bool #

Show MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Generic MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep MIRPot :: Type -> Type #

Methods

from :: MIRPot -> Rep MIRPot x #

to :: Rep MIRPot x -> MIRPot #

ToCBOR MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: MIRPot -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy MIRPot -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [MIRPot] -> Size Source #

FromCBOR MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

NoThunks MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep MIRPot Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep MIRPot = D1 ('MetaData "MIRPot" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ReservesMIR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TreasuryMIR" 'PrefixI 'False) (U1 :: Type -> Type))

data GenesisDelegCert crypto Source #

Genesis key delegation certificate

Constructors

GenesisDelegCert !(KeyHash 'Genesis crypto) !(KeyHash 'GenesisDelegate crypto) !(Hash crypto (VerKeyVRF crypto)) 

Instances

Instances details
Eq (GenesisDelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: GenesisDelegCert crypto -> GenesisDelegCert crypto -> Bool #

(/=) :: GenesisDelegCert crypto -> GenesisDelegCert crypto -> Bool #

Show (GenesisDelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> GenesisDelegCert crypto -> ShowS #

show :: GenesisDelegCert crypto -> String #

showList :: [GenesisDelegCert crypto] -> ShowS #

Generic (GenesisDelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (GenesisDelegCert crypto) :: Type -> Type #

Methods

from :: GenesisDelegCert crypto -> Rep (GenesisDelegCert crypto) x #

to :: Rep (GenesisDelegCert crypto) x -> GenesisDelegCert crypto #

NoThunks (GenesisDelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (GenesisDelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (GenesisDelegCert crypto) = D1 ('MetaData "GenesisDelegCert" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "GenesisDelegCert" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'Genesis crypto)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'GenesisDelegate crypto)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash crypto (VerKeyVRF crypto))))))

data PoolCert crypto Source #

Constructors

RegPool !(PoolParams crypto)

A stake pool registration certificate.

RetirePool !(KeyHash 'StakePool crypto) !EpochNo

A stake pool retirement certificate.

Instances

Instances details
Eq (PoolCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: PoolCert crypto -> PoolCert crypto -> Bool #

(/=) :: PoolCert crypto -> PoolCert crypto -> Bool #

Show (PoolCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> PoolCert crypto -> ShowS #

show :: PoolCert crypto -> String #

showList :: [PoolCert crypto] -> ShowS #

Generic (PoolCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (PoolCert crypto) :: Type -> Type #

Methods

from :: PoolCert crypto -> Rep (PoolCert crypto) x #

to :: Rep (PoolCert crypto) x -> PoolCert crypto #

NoThunks (PoolCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (PoolCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (PoolCert crypto) = D1 ('MetaData "PoolCert" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "RegPool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PoolParams crypto))) :+: C1 ('MetaCons "RetirePool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'StakePool crypto)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 EpochNo)))

data DelegCert crypto Source #

Constructors

RegKey !(StakeCredential crypto)

A stake key registration certificate.

DeRegKey !(StakeCredential crypto)

A stake key deregistration certificate.

Delegate !(Delegation crypto)

A stake delegation certificate.

Instances

Instances details
Eq (DelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: DelegCert crypto -> DelegCert crypto -> Bool #

(/=) :: DelegCert crypto -> DelegCert crypto -> Bool #

Show (DelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> DelegCert crypto -> ShowS #

show :: DelegCert crypto -> String #

showList :: [DelegCert crypto] -> ShowS #

Generic (DelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (DelegCert crypto) :: Type -> Type #

Methods

from :: DelegCert crypto -> Rep (DelegCert crypto) x #

to :: Rep (DelegCert crypto) x -> DelegCert crypto #

NoThunks (DelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (DelegCert crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (DelegCert crypto) = D1 ('MetaData "DelegCert" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "RegKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StakeCredential crypto))) :+: (C1 ('MetaCons "DeRegKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StakeCredential crypto))) :+: C1 ('MetaCons "Delegate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Delegation crypto)))))

data TxOut era Source #

The output of a UTxO.

Constructors

TxOutCompact !(CompactAddr (Crypto era)) !(CompactForm (Value era)) 

Bundled Patterns

pattern TxOut :: (HasCallStack, ShelleyBased era) => Addr (Crypto era) -> Value era -> TxOut era 

Instances

Instances details
HasField "outputs" (TxBody era) (StrictSeq (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictSeq (TxOut era) #

(Eq (Value era), Eq (CompactForm (Value era)), Compactible (Value era)) => Eq (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: TxOut era -> TxOut era -> Bool #

(/=) :: TxOut era -> TxOut era -> Bool #

(Show (Value era), Era era, Compactible (Value era)) => Show (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> TxOut era -> ShowS #

show :: TxOut era -> String #

showList :: [TxOut era] -> ShowS #

NFData (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: TxOut era -> () #

(Era era, ToCBOR (CompactForm (Value era)), Compactible (Value era)) => ToCBOR (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: TxOut era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (TxOut era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxOut era] -> Size Source #

(Era era, DecodeNonNegative (CompactForm (Value era)), Compactible (Value era)) => FromCBOR (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (TxOut era) Source #

label :: Proxy (TxOut era) -> Text Source #

NoThunks (TxOut era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto era ~ crypto => Embed (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toBase :: UTxO era -> Map (TxIn crypto) (TxOut era) Source #

fromBase :: Map (TxIn crypto) (TxOut era) -> UTxO era Source #

Crypto era ~ crypto => HasExp (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toExp :: UTxO era -> Exp (Map (TxIn crypto) (TxOut era)) Source #

data TxIn crypto Source #

The input of a UTxO.

Constructors

TxInCompact !(TxId crypto) !Word64 

Bundled Patterns

pattern TxIn :: Crypto crypto => TxId crypto -> Natural -> TxIn crypto 

Instances

Instances details
Crypto era ~ crypto => HasField "inputs" (TxBody era) (Set (TxIn crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Set (TxIn crypto) #

Eq (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: TxIn crypto -> TxIn crypto -> Bool #

(/=) :: TxIn crypto -> TxIn crypto -> Bool #

Ord (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

compare :: TxIn crypto -> TxIn crypto -> Ordering #

(<) :: TxIn crypto -> TxIn crypto -> Bool #

(<=) :: TxIn crypto -> TxIn crypto -> Bool #

(>) :: TxIn crypto -> TxIn crypto -> Bool #

(>=) :: TxIn crypto -> TxIn crypto -> Bool #

max :: TxIn crypto -> TxIn crypto -> TxIn crypto #

min :: TxIn crypto -> TxIn crypto -> TxIn crypto #

Show (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> TxIn crypto -> ShowS #

show :: TxIn crypto -> String #

showList :: [TxIn crypto] -> ShowS #

Generic (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (TxIn crypto) :: Type -> Type #

Methods

from :: TxIn crypto -> Rep (TxIn crypto) x #

to :: Rep (TxIn crypto) x -> TxIn crypto #

Crypto crypto => NFData (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: TxIn crypto -> () #

Crypto crypto => ToCBOR (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: TxIn crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (TxIn crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxIn crypto] -> Size Source #

Crypto crypto => FromCBOR (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (TxIn crypto) Source #

label :: Proxy (TxIn crypto) -> Text Source #

NoThunks (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto era ~ crypto => Embed (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toBase :: UTxO era -> Map (TxIn crypto) (TxOut era) Source #

fromBase :: Map (TxIn crypto) (TxOut era) -> UTxO era Source #

Crypto era ~ crypto => HasExp (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toExp :: UTxO era -> Exp (Map (TxIn crypto) (TxOut era)) Source #

type Rep (TxIn crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxIn crypto) = D1 ('MetaData "TxIn" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "TxInCompact" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 (TxId crypto)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Word64)))

newtype TxId crypto Source #

A unique ID of a transaction, which is computable from the transaction.

Constructors

TxId 

Instances

Instances details
Eq (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: TxId crypto -> TxId crypto -> Bool #

(/=) :: TxId crypto -> TxId crypto -> Bool #

Ord (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

compare :: TxId crypto -> TxId crypto -> Ordering #

(<) :: TxId crypto -> TxId crypto -> Bool #

(<=) :: TxId crypto -> TxId crypto -> Bool #

(>) :: TxId crypto -> TxId crypto -> Bool #

(>=) :: TxId crypto -> TxId crypto -> Bool #

max :: TxId crypto -> TxId crypto -> TxId crypto #

min :: TxId crypto -> TxId crypto -> TxId crypto #

Show (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> TxId crypto -> ShowS #

show :: TxId crypto -> String #

showList :: [TxId crypto] -> ShowS #

Generic (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (TxId crypto) :: Type -> Type #

Methods

from :: TxId crypto -> Rep (TxId crypto) x #

to :: Rep (TxId crypto) x -> TxId crypto #

Crypto crypto => NFData (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: TxId crypto -> () #

Crypto crypto => ToCBOR (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: TxId crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (TxId crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [TxId crypto] -> Size Source #

Crypto crypto => FromCBOR (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (TxId crypto) Source #

label :: Proxy (TxId crypto) -> Text Source #

NoThunks (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxId crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxId crypto) = D1 ('MetaData "TxId" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "TxId" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unTxId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hash crypto EraIndependentTxBody))))

newtype Wdrl crypto Source #

Constructors

Wdrl 

Fields

Instances

Instances details
Crypto era ~ crypto => HasField "wdrls" (TxBody era) (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> Wdrl crypto #

Eq (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: Wdrl crypto -> Wdrl crypto -> Bool #

(/=) :: Wdrl crypto -> Wdrl crypto -> Bool #

Show (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> Wdrl crypto -> ShowS #

show :: Wdrl crypto -> String #

showList :: [Wdrl crypto] -> ShowS #

Generic (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (Wdrl crypto) :: Type -> Type #

Methods

from :: Wdrl crypto -> Rep (Wdrl crypto) x #

to :: Rep (Wdrl crypto) x -> Wdrl crypto #

NFData (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: Wdrl crypto -> () #

Crypto crypto => ToCBOR (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: Wdrl crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Wdrl crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Wdrl crypto] -> Size Source #

Crypto crypto => FromCBOR (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (Wdrl crypto) Source #

label :: Proxy (Wdrl crypto) -> Text Source #

NoThunks (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (Wdrl crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (Wdrl crypto) = D1 ('MetaData "Wdrl" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Wdrl" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWdrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (RewardAcnt crypto) Coin))))

data PoolParams crypto Source #

A stake pool.

Instances

Instances details
Eq (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: PoolParams crypto -> PoolParams crypto -> Bool #

(/=) :: PoolParams crypto -> PoolParams crypto -> Bool #

Ord (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

compare :: PoolParams crypto -> PoolParams crypto -> Ordering #

(<) :: PoolParams crypto -> PoolParams crypto -> Bool #

(<=) :: PoolParams crypto -> PoolParams crypto -> Bool #

(>) :: PoolParams crypto -> PoolParams crypto -> Bool #

(>=) :: PoolParams crypto -> PoolParams crypto -> Bool #

max :: PoolParams crypto -> PoolParams crypto -> PoolParams crypto #

min :: PoolParams crypto -> PoolParams crypto -> PoolParams crypto #

Show (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> PoolParams crypto -> ShowS #

show :: PoolParams crypto -> String #

showList :: [PoolParams crypto] -> ShowS #

Generic (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (PoolParams crypto) :: Type -> Type #

Methods

from :: PoolParams crypto -> Rep (PoolParams crypto) x #

to :: Rep (PoolParams crypto) x -> PoolParams crypto #

NFData (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: PoolParams crypto -> () #

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

Defined in Shelley.Spec.Ledger.TxBody

Crypto crypto => FromJSON (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto crypto => ToCBOR (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: PoolParams crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PoolParams crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PoolParams crypto] -> Size Source #

Crypto crypto => FromCBOR (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBOR :: Decoder s (PoolParams crypto) Source #

label :: Proxy (PoolParams crypto) -> Text Source #

NoThunks (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Crypto crypto => FromCBORGroup (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

fromCBORGroup :: Decoder s (PoolParams crypto) Source #

Crypto crypto => ToCBORGroup (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBORGroup :: PoolParams crypto -> Encoding Source #

encodedGroupSizeExpr :: (forall x. ToCBOR x => Proxy x -> Size) -> Proxy (PoolParams crypto) -> Size Source #

listLen :: PoolParams crypto -> Word Source #

listLenBound :: Proxy (PoolParams crypto) -> Word Source #

type Rep (PoolParams crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (PoolParams crypto) = D1 ('MetaData "PoolParams" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "PoolParams" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_poolId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'StakePool crypto)) :*: S1 ('MetaSel ('Just "_poolVrf") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash crypto (VerKeyVRF crypto)))) :*: (S1 ('MetaSel ('Just "_poolPledge") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin) :*: S1 ('MetaSel ('Just "_poolCost") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin))) :*: ((S1 ('MetaSel ('Just "_poolMargin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnitInterval) :*: S1 ('MetaSel ('Just "_poolRAcnt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (RewardAcnt crypto))) :*: (S1 ('MetaSel ('Just "_poolOwners") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set (KeyHash 'Staking crypto))) :*: (S1 ('MetaSel ('Just "_poolRelays") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictSeq StakePoolRelay)) :*: S1 ('MetaSel ('Just "_poolMD") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictMaybe PoolMetadata)))))))

data StakePoolRelay Source #

Constructors

SingleHostAddr !(StrictMaybe Port) !(StrictMaybe IPv4) !(StrictMaybe IPv6)

One or both of IPv4 & IPv6

SingleHostName !(StrictMaybe Port) !DnsName

An A or AAAA DNS record

MultiHostName !DnsName

A SRV DNS record

Instances

Instances details
Eq StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Ord StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Show StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Generic StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep StakePoolRelay :: Type -> Type #

NFData StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: StakePoolRelay -> () #

ToJSON StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

FromJSON StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

ToCBOR StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

FromCBOR StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

NoThunks StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep StakePoolRelay Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

data PoolMetadata Source #

Constructors

PoolMetadata 

Instances

Instances details
Eq PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Ord PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Show PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Generic PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep PoolMetadata :: Type -> Type #

NFData PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: PoolMetadata -> () #

ToJSON PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

FromJSON PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

ToCBOR PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

FromCBOR PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

NoThunks PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep PoolMetadata Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep PoolMetadata = D1 ('MetaData "PoolMetadata" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "PoolMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "_poolMDUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Url) :*: S1 ('MetaSel ('Just "_poolMDHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ByteString)))

data Delegation crypto Source #

The delegation of one stake key to another.

Constructors

Delegation 

Fields

Instances

Instances details
Eq (Delegation crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

(==) :: Delegation crypto -> Delegation crypto -> Bool #

(/=) :: Delegation crypto -> Delegation crypto -> Bool #

Show (Delegation crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

showsPrec :: Int -> Delegation crypto -> ShowS #

show :: Delegation crypto -> String #

showList :: [Delegation crypto] -> ShowS #

Generic (Delegation crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

type Rep (Delegation crypto) :: Type -> Type #

Methods

from :: Delegation crypto -> Rep (Delegation crypto) x #

to :: Rep (Delegation crypto) x -> Delegation crypto #

NoThunks (Delegation crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (Delegation crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (Delegation crypto) = D1 ('MetaData "Delegation" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Delegation" 'PrefixI 'True) (S1 ('MetaSel ('Just "_delegator") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StakeCredential crypto)) :*: S1 ('MetaSel ('Just "_delegatee") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (KeyHash 'StakePool crypto))))

data Tx era Source #

A fully formed transaction.

Constructors

Tx' !(TxBody era) !(WitnessSet era) !(StrictMaybe (AuxiliaryData era)) ByteString 

Bundled Patterns

pattern Tx :: (TxBodyConstraints era, ToCBOR (AuxiliaryData era)) => TxBody era -> WitnessSet era -> StrictMaybe (AuxiliaryData era) -> Tx era 

Instances

Instances details
ShelleyBased era => Eq (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Methods

(==) :: Tx era -> Tx era -> Bool #

(/=) :: Tx era -> Tx era -> Bool #

ShelleyBased era => Show (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Methods

showsPrec :: Int -> Tx era -> ShowS #

show :: Tx era -> String #

showList :: [Tx era] -> ShowS #

Generic (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Associated Types

type Rep (Tx era) :: Type -> Type #

Methods

from :: Tx era -> Rep (Tx era) x #

to :: Rep (Tx era) x -> Tx era #

ShelleyBased era => ToCBOR (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Methods

toCBOR :: Tx era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Tx era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Tx era] -> Size Source #

(ShelleyBased era, ValidateScript era) => FromCBOR (Annotator (Tx era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Methods

fromCBOR :: Decoder s (Annotator (Tx era)) Source #

label :: Proxy (Annotator (Tx era)) -> Text Source #

ShelleyBased era => NoThunks (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

ShelleyBased era => HashAnnotated (Tx era) era Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

Associated Types

type HashIndex (Tx era) Source #

Methods

hashAnnotated :: Tx era -> Hash (HASH (Crypto era)) (HashIndex (Tx era)) Source #

type Rep (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

type Rep (Tx era) = D1 ('MetaData "Tx" "Shelley.Spec.Ledger.Tx" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Tx'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_body'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (TxBody era)) :*: S1 ('MetaSel ('Just "_witnessSet'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (WitnessSet era))) :*: (S1 ('MetaSel ('Just "_metadata'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictMaybe (AuxiliaryData era))) :*: S1 ('MetaSel ('Just "txFullBytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))
type HashIndex (Tx era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Tx

newtype PoolDistr crypto Source #

Constructors

PoolDistr 

Fields

Instances

Instances details
Eq (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

(==) :: PoolDistr crypto -> PoolDistr crypto -> Bool #

(/=) :: PoolDistr crypto -> PoolDistr crypto -> Bool #

Show (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

showsPrec :: Int -> PoolDistr crypto -> ShowS #

show :: PoolDistr crypto -> String #

showList :: [PoolDistr crypto] -> ShowS #

NFData (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

rnf :: PoolDistr crypto -> () #

Crypto crypto => ToCBOR (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toCBOR :: PoolDistr crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PoolDistr crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PoolDistr crypto] -> Size Source #

Crypto crypto => FromCBOR (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

fromCBOR :: Decoder s (PoolDistr crypto) Source #

label :: Proxy (PoolDistr crypto) -> Text Source #

NoThunks (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Relation (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Associated Types

type Domain (PoolDistr crypto) Source #

type Range (PoolDistr crypto) Source #

Methods

singleton :: Domain (PoolDistr crypto) -> Range (PoolDistr crypto) -> PoolDistr crypto Source #

dom :: PoolDistr crypto -> Set (Domain (PoolDistr crypto)) Source #

range :: PoolDistr crypto -> Set (Range (PoolDistr crypto)) Source #

(◁) :: Set (Domain (PoolDistr crypto)) -> PoolDistr crypto -> PoolDistr crypto Source #

(<|) :: Set (Domain (PoolDistr crypto)) -> PoolDistr crypto -> PoolDistr crypto Source #

(⋪) :: Set (Domain (PoolDistr crypto)) -> PoolDistr crypto -> PoolDistr crypto Source #

(</|) :: Set (Domain (PoolDistr crypto)) -> PoolDistr crypto -> PoolDistr crypto Source #

(▷) :: PoolDistr crypto -> Set (Range (PoolDistr crypto)) -> PoolDistr crypto Source #

(|>) :: PoolDistr crypto -> Set (Range (PoolDistr crypto)) -> PoolDistr crypto Source #

(⋫) :: PoolDistr crypto -> Set (Range (PoolDistr crypto)) -> PoolDistr crypto Source #

(|/>) :: PoolDistr crypto -> Set (Range (PoolDistr crypto)) -> PoolDistr crypto Source #

(∪) :: PoolDistr crypto -> PoolDistr crypto -> PoolDistr crypto Source #

(⨃) :: PoolDistr crypto -> PoolDistr crypto -> PoolDistr crypto Source #

size :: Integral n => PoolDistr crypto -> n Source #

haskey :: Domain (PoolDistr crypto) -> PoolDistr crypto -> Bool Source #

addpair :: Domain (PoolDistr crypto) -> Range (PoolDistr crypto) -> PoolDistr crypto -> PoolDistr crypto Source #

removekey :: Domain (PoolDistr crypto) -> PoolDistr crypto -> PoolDistr crypto Source #

Embed (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toBase :: PoolDistr crypto -> Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto) Source #

fromBase :: Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto) -> PoolDistr crypto Source #

HasExp (PoolDistr crypto) (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toExp :: PoolDistr crypto -> Exp (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)) Source #

type Range (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

type Range (PoolDistr crypto) = Range (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto))
type Domain (PoolDistr crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

type Domain (PoolDistr crypto) = Domain (Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto))

newtype UTxO era Source #

The unspent transaction outputs.

Constructors

UTxO 

Fields

Instances

Instances details
ShelleyBased era => Eq (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

(==) :: UTxO era -> UTxO era -> Bool #

(/=) :: UTxO era -> UTxO era -> Bool #

ShelleyBased era => Show (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

showsPrec :: Int -> UTxO era -> ShowS #

show :: UTxO era -> String #

showList :: [UTxO era] -> ShowS #

Generic (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Associated Types

type Rep (UTxO era) :: Type -> Type #

Methods

from :: UTxO era -> Rep (UTxO era) x #

to :: Rep (UTxO era) x -> UTxO era #

Era era => NFData (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

rnf :: UTxO era -> () #

ShelleyBased era => ToCBOR (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toCBOR :: UTxO era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (UTxO era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [UTxO era] -> Size Source #

ShelleyBased era => FromCBOR (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

fromCBOR :: Decoder s (UTxO era) Source #

label :: Proxy (UTxO era) -> Text Source #

NoThunks (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Relation (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Associated Types

type Domain (UTxO era) Source #

type Range (UTxO era) Source #

Methods

singleton :: Domain (UTxO era) -> Range (UTxO era) -> UTxO era Source #

dom :: UTxO era -> Set (Domain (UTxO era)) Source #

range :: UTxO era -> Set (Range (UTxO era)) Source #

(◁) :: Set (Domain (UTxO era)) -> UTxO era -> UTxO era Source #

(<|) :: Set (Domain (UTxO era)) -> UTxO era -> UTxO era Source #

(⋪) :: Set (Domain (UTxO era)) -> UTxO era -> UTxO era Source #

(</|) :: Set (Domain (UTxO era)) -> UTxO era -> UTxO era Source #

(▷) :: UTxO era -> Set (Range (UTxO era)) -> UTxO era Source #

(|>) :: UTxO era -> Set (Range (UTxO era)) -> UTxO era Source #

(⋫) :: UTxO era -> Set (Range (UTxO era)) -> UTxO era Source #

(|/>) :: UTxO era -> Set (Range (UTxO era)) -> UTxO era Source #

(∪) :: UTxO era -> UTxO era -> UTxO era Source #

(⨃) :: UTxO era -> UTxO era -> UTxO era Source #

size :: Integral n => UTxO era -> n Source #

haskey :: Domain (UTxO era) -> UTxO era -> Bool Source #

addpair :: Domain (UTxO era) -> Range (UTxO era) -> UTxO era -> UTxO era Source #

removekey :: Domain (UTxO era) -> UTxO era -> UTxO era Source #

Crypto era ~ crypto => Embed (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toBase :: UTxO era -> Map (TxIn crypto) (TxOut era) Source #

fromBase :: Map (TxIn crypto) (TxOut era) -> UTxO era Source #

Crypto era ~ crypto => HasExp (UTxO era) (Map (TxIn crypto) (TxOut era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

Methods

toExp :: UTxO era -> Exp (Map (TxIn crypto) (TxOut era)) Source #

type Rep (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

type Rep (UTxO era) = D1 ('MetaData "UTxO" "Shelley.Spec.Ledger.UTxO" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "UTxO" 'PrefixI 'True) (S1 ('MetaSel ('Just "unUTxO") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (TxIn (Crypto era)) (TxOut era)))))
type Range (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

type Range (UTxO era) = TxOut era
type Domain (UTxO era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.UTxO

type Domain (UTxO era) = TxIn (Crypto era)

balance :: ShelleyBased era => UTxO era -> Value era Source #

Determine the total balance contained in the UTxO.

data ShelleyGenesis era Source #

Shelley genesis information

Note that this is needed only for a pure Shelley network, hence it being defined here rather than in its own module. In mainnet, Shelley will transition naturally from Byron, and thus will never have its own genesis information.

Instances

Instances details
Eq (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Show (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Generic (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Associated Types

type Rep (ShelleyGenesis era) :: Type -> Type #

Methods

from :: ShelleyGenesis era -> Rep (ShelleyGenesis era) x #

to :: Rep (ShelleyGenesis era) x -> ShelleyGenesis era #

Era era => ToJSON (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Era era => FromJSON (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Era era => ToCBOR (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Methods

toCBOR :: ShelleyGenesis era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (ShelleyGenesis era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [ShelleyGenesis era] -> Size Source #

Era era => FromCBOR (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Era era => NoThunks (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

type Rep (ShelleyGenesis era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

type Rep (ShelleyGenesis era) = D1 ('MetaData "ShelleyGenesis" "Shelley.Spec.Ledger.Genesis" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ShelleyGenesis" 'PrefixI 'True) (((S1 ('MetaSel ('Just "sgSystemStart") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: (S1 ('MetaSel ('Just "sgNetworkMagic") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word32) :*: S1 ('MetaSel ('Just "sgNetworkId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Network))) :*: ((S1 ('MetaSel ('Just "sgActiveSlotsCoeff") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rational) :*: S1 ('MetaSel ('Just "sgSecurityParam") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "sgEpochLength") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 EpochSize) :*: S1 ('MetaSel ('Just "sgSlotsPerKESPeriod") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64)))) :*: (((S1 ('MetaSel ('Just "sgMaxKESEvolutions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64) :*: S1 ('MetaSel ('Just "sgSlotLength") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 NominalDiffTime)) :*: (S1 ('MetaSel ('Just "sgUpdateQuorum") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64) :*: S1 ('MetaSel ('Just "sgMaxLovelaceSupply") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word64))) :*: ((S1 ('MetaSel ('Just "sgProtocolParams") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PParams era)) :*: S1 ('MetaSel ('Just "sgGenDelegs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'Genesis (Crypto era)) (GenDelegPair (Crypto era))))) :*: (S1 ('MetaSel ('Just "sgInitialFunds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Addr (Crypto era)) Coin)) :*: S1 ('MetaSel ('Just "sgStaking") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ShelleyGenesisStaking (Crypto era))))))))

data ShelleyGenesisStaking crypto Source #

Genesis Shelley staking configuration.

This allows us to configure some initial stake pools and delegation to them, in order to test Praos in a static configuration, without requiring on-chain registration and delegation.

For simplicity, pools defined in the genesis staking do not pay deposits for their registration.

Constructors

ShelleyGenesisStaking 

Fields

  • sgsPools :: !(Map (KeyHash 'StakePool crypto) (PoolParams crypto))

    Pools to register

    The key in this map is the hash of the public key of the _pool_. This need not correspond to any payment or staking key, but must correspond to the cold key held by TPraosIsCoreNode.

  • sgsStake :: !(Map (KeyHash 'Staking crypto) (KeyHash 'StakePool crypto))

    Stake-holding key hash credentials and the pools to delegate that stake to. We require the raw staking key hash in order to:

    • Avoid pointer addresses, which would be tricky when there's no slot or transaction to point to.
    • Avoid script credentials.

Instances

Instances details
Eq (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Show (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Generic (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Associated Types

type Rep (ShelleyGenesisStaking crypto) :: Type -> Type #

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

Defined in Shelley.Spec.Ledger.Genesis

Crypto crypto => FromJSON (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Crypto crypto => ToCBOR (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

Methods

toCBOR :: ShelleyGenesisStaking crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (ShelleyGenesisStaking crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [ShelleyGenesisStaking crypto] -> Size Source #

Crypto crypto => FromCBOR (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

NoThunks (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

type Rep (ShelleyGenesisStaking crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Genesis

type Rep (ShelleyGenesisStaking crypto) = D1 ('MetaData "ShelleyGenesisStaking" "Shelley.Spec.Ledger.Genesis" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ShelleyGenesisStaking" 'PrefixI 'True) (S1 ('MetaSel ('Just "sgsPools") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) (PoolParams crypto))) :*: S1 ('MetaSel ('Just "sgsStake") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'Staking crypto) (KeyHash 'StakePool crypto)))))

emptyGenesisStaking :: ShelleyGenesisStaking crypto Source #

Empty genesis staking

initialFundsPseudoTxIn :: forall crypto. Crypto crypto => Addr crypto -> TxIn crypto Source #

Compute the TxIn of the initial UTxO pseudo-transaction corresponding to the given address in the genesis initial funds.

The Shelley initial UTxO is constructed from the sgInitialFunds which is not a full UTxO but just a map from addresses to coin values.

This gets turned into a UTxO by making a pseudo-transaction for each address, with the 0th output being the coin value. So to spend from the initial UTxO we need this same TxIn to use as an input to the spending transaction.

validateGenesis :: forall era. Era era => ShelleyGenesis era -> Either [ValidationErr] () Source #

Do some basic sanity checking on the Shelley genesis file.

data SnapShots crypto Source #

Snapshots of the stake distribution.

Constructors

SnapShots 

Fields

Instances

Instances details
Eq (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

(==) :: SnapShots crypto -> SnapShots crypto -> Bool #

(/=) :: SnapShots crypto -> SnapShots crypto -> Bool #

Show (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

showsPrec :: Int -> SnapShots crypto -> ShowS #

show :: SnapShots crypto -> String #

showList :: [SnapShots crypto] -> ShowS #

Generic (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Associated Types

type Rep (SnapShots crypto) :: Type -> Type #

Methods

from :: SnapShots crypto -> Rep (SnapShots crypto) x #

to :: Rep (SnapShots crypto) x -> SnapShots crypto #

NFData (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

rnf :: SnapShots crypto -> () #

Crypto crypto => ToCBOR (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

toCBOR :: SnapShots crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (SnapShots crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [SnapShots crypto] -> Size Source #

Crypto crypto => FromCBOR (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

fromCBOR :: Decoder s (SnapShots crypto) Source #

label :: Proxy (SnapShots crypto) -> Text Source #

NoThunks (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

type Rep (SnapShots crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

type Rep (SnapShots crypto) = D1 ('MetaData "SnapShots" "Shelley.Spec.Ledger.EpochBoundary" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "SnapShots" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_pstakeMark") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SnapShot crypto)) :*: S1 ('MetaSel ('Just "_pstakeSet") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SnapShot crypto))) :*: (S1 ('MetaSel ('Just "_pstakeGo") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SnapShot crypto)) :*: S1 ('MetaSel ('Just "_feeSS") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin))))

data SnapShot crypto Source #

Snapshot of the stake distribution.

Constructors

SnapShot 

Fields

Instances

Instances details
Eq (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

(==) :: SnapShot crypto -> SnapShot crypto -> Bool #

(/=) :: SnapShot crypto -> SnapShot crypto -> Bool #

Show (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

showsPrec :: Int -> SnapShot crypto -> ShowS #

show :: SnapShot crypto -> String #

showList :: [SnapShot crypto] -> ShowS #

Generic (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Associated Types

type Rep (SnapShot crypto) :: Type -> Type #

Methods

from :: SnapShot crypto -> Rep (SnapShot crypto) x #

to :: Rep (SnapShot crypto) x -> SnapShot crypto #

NFData (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

rnf :: SnapShot crypto -> () #

Crypto crypto => ToCBOR (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

toCBOR :: SnapShot crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (SnapShot crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [SnapShot crypto] -> Size Source #

Crypto crypto => FromCBOR (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

fromCBOR :: Decoder s (SnapShot crypto) Source #

label :: Proxy (SnapShot crypto) -> Text Source #

NoThunks (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

type Rep (SnapShot crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

type Rep (SnapShot crypto) = D1 ('MetaData "SnapShot" "Shelley.Spec.Ledger.EpochBoundary" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "SnapShot" 'PrefixI 'True) (S1 ('MetaSel ('Just "_stake") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Stake crypto)) :*: (S1 ('MetaSel ('Just "_delegations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Credential 'Staking crypto) (KeyHash 'StakePool crypto))) :*: S1 ('MetaSel ('Just "_poolParams") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) (PoolParams crypto))))))

newtype Stake crypto Source #

Type of stake as map from hash key to coins associated.

Constructors

Stake 

Fields

Instances

Instances details
Eq (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

(==) :: Stake crypto -> Stake crypto -> Bool #

(/=) :: Stake crypto -> Stake crypto -> Bool #

Ord (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

compare :: Stake crypto -> Stake crypto -> Ordering #

(<) :: Stake crypto -> Stake crypto -> Bool #

(<=) :: Stake crypto -> Stake crypto -> Bool #

(>) :: Stake crypto -> Stake crypto -> Bool #

(>=) :: Stake crypto -> Stake crypto -> Bool #

max :: Stake crypto -> Stake crypto -> Stake crypto #

min :: Stake crypto -> Stake crypto -> Stake crypto #

Show (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

showsPrec :: Int -> Stake crypto -> ShowS #

show :: Stake crypto -> String #

showList :: [Stake crypto] -> ShowS #

NFData (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

rnf :: Stake crypto -> () #

Crypto crypto => ToCBOR (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

toCBOR :: Stake crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Stake crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Stake crypto] -> Size Source #

Crypto crypto => FromCBOR (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

Methods

fromCBOR :: Decoder s (Stake crypto) Source #

label :: Proxy (Stake crypto) -> Text Source #

NoThunks (Stake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.EpochBoundary

data NonMyopic crypto Source #

Instances

Instances details
Eq (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Methods

(==) :: NonMyopic crypto -> NonMyopic crypto -> Bool #

(/=) :: NonMyopic crypto -> NonMyopic crypto -> Bool #

Show (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Methods

showsPrec :: Int -> NonMyopic crypto -> ShowS #

show :: NonMyopic crypto -> String #

showList :: [NonMyopic crypto] -> ShowS #

Generic (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Associated Types

type Rep (NonMyopic crypto) :: Type -> Type #

Methods

from :: NonMyopic crypto -> Rep (NonMyopic crypto) x #

to :: Rep (NonMyopic crypto) x -> NonMyopic crypto #

NFData (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Methods

rnf :: NonMyopic crypto -> () #

Crypto crypto => ToCBOR (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Methods

toCBOR :: NonMyopic crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (NonMyopic crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [NonMyopic crypto] -> Size Source #

Crypto crypto => FromCBOR (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

Methods

fromCBOR :: Decoder s (NonMyopic crypto) Source #

label :: Proxy (NonMyopic crypto) -> Text Source #

NoThunks (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

type Rep (NonMyopic crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Rewards

type Rep (NonMyopic crypto) = D1 ('MetaData "NonMyopic" "Shelley.Spec.Ledger.Rewards" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "NonMyopic" 'PrefixI 'True) (S1 ('MetaSel ('Just "likelihoodsNM") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) Likelihood)) :*: S1 ('MetaSel ('Just "rewardPotNM") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin)))

newtype WitHashes crypto Source #

Constructors

WitHashes 

Fields

Instances

Instances details
Eq (WitHashes crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: WitHashes crypto -> WitHashes crypto -> Bool #

(/=) :: WitHashes crypto -> WitHashes crypto -> Bool #

Show (WitHashes crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> WitHashes crypto -> ShowS #

show :: WitHashes crypto -> String #

showList :: [WitHashes crypto] -> ShowS #

Generic (WitHashes crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (WitHashes crypto) :: Type -> Type #

Methods

from :: WitHashes crypto -> Rep (WitHashes crypto) x #

to :: Rep (WitHashes crypto) x -> WitHashes crypto #

NoThunks (WitHashes crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (WitHashes crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (WitHashes crypto) = D1 ('MetaData "WitHashes" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "WitHashes" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWitHashes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set (KeyHash 'Witness crypto)))))

data LedgerState era Source #

The state associated with a Ledger.

Constructors

LedgerState 

Fields

Instances

Instances details
ShelleyBased era => Eq (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: LedgerState era -> LedgerState era -> Bool #

(/=) :: LedgerState era -> LedgerState era -> Bool #

ShelleyBased era => Show (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> LedgerState era -> ShowS #

show :: LedgerState era -> String #

showList :: [LedgerState era] -> ShowS #

Generic (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (LedgerState era) :: Type -> Type #

Methods

from :: LedgerState era -> Rep (LedgerState era) x #

to :: Rep (LedgerState era) x -> LedgerState era #

Era era => NFData (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: LedgerState era -> () #

ShelleyBased era => ToCBOR (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: LedgerState era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (LedgerState era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [LedgerState era] -> Size Source #

ShelleyBased era => FromCBOR (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (LedgerState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (LedgerState era) = D1 ('MetaData "LedgerState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "LedgerState" 'PrefixI 'True) (S1 ('MetaSel ('Just "_utxoState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (UTxOState era)) :*: S1 ('MetaSel ('Just "_delegationState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (DPState (Crypto era)))))

data NewEpochState era Source #

New Epoch state and environment

Constructors

NewEpochState 

Fields

Instances

Instances details
ShelleyBased era => Eq (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: NewEpochState era -> NewEpochState era -> Bool #

(/=) :: NewEpochState era -> NewEpochState era -> Bool #

ShelleyBased era => Show (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Generic (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (NewEpochState era) :: Type -> Type #

Methods

from :: NewEpochState era -> Rep (NewEpochState era) x #

to :: Rep (NewEpochState era) x -> NewEpochState era #

Era era => NFData (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: NewEpochState era -> () #

ShelleyBased era => ToCBOR (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: NewEpochState era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (NewEpochState era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [NewEpochState era] -> Size Source #

ShelleyBased era => FromCBOR (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (NewEpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (NewEpochState era) = D1 ('MetaData "NewEpochState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "NewEpochState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "nesEL") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 EpochNo) :*: (S1 ('MetaSel ('Just "nesBprev") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (BlocksMade (Crypto era))) :*: S1 ('MetaSel ('Just "nesBcur") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (BlocksMade (Crypto era))))) :*: (S1 ('MetaSel ('Just "nesEs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (EpochState era)) :*: (S1 ('MetaSel ('Just "nesRu") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictMaybe (RewardUpdate (Crypto era)))) :*: S1 ('MetaSel ('Just "nesPd") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PoolDistr (Crypto era)))))))

data UTxOState era Source #

Constructors

UTxOState 

Fields

Instances

Instances details
ShelleyBased era => Eq (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: UTxOState era -> UTxOState era -> Bool #

(/=) :: UTxOState era -> UTxOState era -> Bool #

ShelleyBased era => Show (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> UTxOState era -> ShowS #

show :: UTxOState era -> String #

showList :: [UTxOState era] -> ShowS #

Generic (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (UTxOState era) :: Type -> Type #

Methods

from :: UTxOState era -> Rep (UTxOState era) x #

to :: Rep (UTxOState era) x -> UTxOState era #

Era era => NFData (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: UTxOState era -> () #

ShelleyBased era => ToCBOR (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: UTxOState era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (UTxOState era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [UTxOState era] -> Size Source #

ShelleyBased era => FromCBOR (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (UTxOState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (UTxOState era) = D1 ('MetaData "UTxOState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "UTxOState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_utxo") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (UTxO era)) :*: S1 ('MetaSel ('Just "_deposited") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin)) :*: (S1 ('MetaSel ('Just "_fees") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin) :*: S1 ('MetaSel ('Just "_ppups") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PPUPState era)))))

data PPUPState era Source #

Constructors

PPUPState 

Instances

Instances details
Eq (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: PPUPState era -> PPUPState era -> Bool #

(/=) :: PPUPState era -> PPUPState era -> Bool #

Show (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> PPUPState era -> ShowS #

show :: PPUPState era -> String #

showList :: [PPUPState era] -> ShowS #

Generic (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (PPUPState era) :: Type -> Type #

Methods

from :: PPUPState era -> Rep (PPUPState era) x #

to :: Rep (PPUPState era) x -> PPUPState era #

NFData (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: PPUPState era -> () #

Era era => ToCBOR (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: PPUPState era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PPUPState era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PPUPState era] -> Size Source #

Era era => FromCBOR (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (PPUPState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (PPUPState era) = D1 ('MetaData "PPUPState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "PPUPState" 'PrefixI 'True) (S1 ('MetaSel ('Just "proposals") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ProposedPPUpdates era)) :*: S1 ('MetaSel ('Just "futureProposals") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ProposedPPUpdates era))))

data EpochState era Source #

Constructors

EpochState 

Fields

Instances

Instances details
ShelleyBased era => Eq (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: EpochState era -> EpochState era -> Bool #

(/=) :: EpochState era -> EpochState era -> Bool #

ShelleyBased era => Show (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> EpochState era -> ShowS #

show :: EpochState era -> String #

showList :: [EpochState era] -> ShowS #

Generic (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (EpochState era) :: Type -> Type #

Methods

from :: EpochState era -> Rep (EpochState era) x #

to :: Rep (EpochState era) x -> EpochState era #

Era era => NFData (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: EpochState era -> () #

ShelleyBased era => ToCBOR (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: EpochState era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (EpochState era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [EpochState era] -> Size Source #

ShelleyBased era => FromCBOR (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (EpochState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (EpochState era) = D1 ('MetaData "EpochState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "EpochState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "esAccountState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AccountState) :*: (S1 ('MetaSel ('Just "esSnapshots") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SnapShots (Crypto era))) :*: S1 ('MetaSel ('Just "esLState") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LedgerState era)))) :*: (S1 ('MetaSel ('Just "esPrevPp") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PParams era)) :*: (S1 ('MetaSel ('Just "esPp") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PParams era)) :*: S1 ('MetaSel ('Just "esNonMyopic") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonMyopic (Crypto era)))))))

data AccountState Source #

Constructors

AccountState 

Fields

Instances

Instances details
Eq AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Show AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Generic AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep AccountState :: Type -> Type #

NFData AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: AccountState -> () #

ToCBOR AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

FromCBOR AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep AccountState Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep AccountState = D1 ('MetaData "AccountState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "AccountState" 'PrefixI 'True) (S1 ('MetaSel ('Just "_treasury") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin) :*: S1 ('MetaSel ('Just "_reserves") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin)))

data RewardUpdate crypto Source #

Constructors

RewardUpdate 

Fields

Instances

Instances details
Eq (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: RewardUpdate crypto -> RewardUpdate crypto -> Bool #

(/=) :: RewardUpdate crypto -> RewardUpdate crypto -> Bool #

Show (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> RewardUpdate crypto -> ShowS #

show :: RewardUpdate crypto -> String #

showList :: [RewardUpdate crypto] -> ShowS #

Generic (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (RewardUpdate crypto) :: Type -> Type #

Methods

from :: RewardUpdate crypto -> Rep (RewardUpdate crypto) x #

to :: Rep (RewardUpdate crypto) x -> RewardUpdate crypto #

NFData (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: RewardUpdate crypto -> () #

Crypto crypto => ToCBOR (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: RewardUpdate crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (RewardUpdate crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [RewardUpdate crypto] -> Size Source #

Crypto crypto => FromCBOR (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

fromCBOR :: Decoder s (RewardUpdate crypto) Source #

label :: Proxy (RewardUpdate crypto) -> Text Source #

NoThunks (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (RewardUpdate crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (RewardUpdate crypto) = D1 ('MetaData "RewardUpdate" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "RewardUpdate" 'PrefixI 'True) ((S1 ('MetaSel ('Just "deltaT") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DeltaCoin) :*: S1 ('MetaSel ('Just "deltaR") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DeltaCoin)) :*: (S1 ('MetaSel ('Just "rs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Credential 'Staking crypto) Coin)) :*: (S1 ('MetaSel ('Just "deltaF") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DeltaCoin) :*: S1 ('MetaSel ('Just "nonMyopic") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonMyopic crypto))))))

data DPState crypto Source #

The state associated with the current stake delegation.

Constructors

DPState 

Fields

Instances

Instances details
Eq (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: DPState crypto -> DPState crypto -> Bool #

(/=) :: DPState crypto -> DPState crypto -> Bool #

Show (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> DPState crypto -> ShowS #

show :: DPState crypto -> String #

showList :: [DPState crypto] -> ShowS #

Generic (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (DPState crypto) :: Type -> Type #

Methods

from :: DPState crypto -> Rep (DPState crypto) x #

to :: Rep (DPState crypto) x -> DPState crypto #

NFData (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: DPState crypto -> () #

Crypto crypto => ToCBOR (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: DPState crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (DPState crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [DPState crypto] -> Size Source #

Crypto crypto => FromCBOR (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

fromCBOR :: Decoder s (DPState crypto) Source #

label :: Proxy (DPState crypto) -> Text Source #

NoThunks (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (DPState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (DPState crypto) = D1 ('MetaData "DPState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "DPState" 'PrefixI 'True) (S1 ('MetaSel ('Just "_dstate") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (DState crypto)) :*: S1 ('MetaSel ('Just "_pstate") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PState crypto))))

data PState crypto Source #

Current state of staking pools and their certificate counters.

Constructors

PState 

Fields

Instances

Instances details
Eq (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: PState crypto -> PState crypto -> Bool #

(/=) :: PState crypto -> PState crypto -> Bool #

Show (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> PState crypto -> ShowS #

show :: PState crypto -> String #

showList :: [PState crypto] -> ShowS #

Generic (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (PState crypto) :: Type -> Type #

Methods

from :: PState crypto -> Rep (PState crypto) x #

to :: Rep (PState crypto) x -> PState crypto #

NFData (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: PState crypto -> () #

Crypto crypto => ToCBOR (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: PState crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PState crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PState crypto] -> Size Source #

Crypto crypto => FromCBOR (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

fromCBOR :: Decoder s (PState crypto) Source #

label :: Proxy (PState crypto) -> Text Source #

NoThunks (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (PState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (PState crypto) = D1 ('MetaData "PState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "PState" 'PrefixI 'True) (S1 ('MetaSel ('Just "_pParams") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) (PoolParams crypto))) :*: (S1 ('MetaSel ('Just "_fPParams") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) (PoolParams crypto))) :*: S1 ('MetaSel ('Just "_retiring") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'StakePool crypto) EpochNo)))))

data DState crypto Source #

State of staking pool delegations and rewards

Constructors

DState 

Fields

Instances

Instances details
Eq (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

(==) :: DState crypto -> DState crypto -> Bool #

(/=) :: DState crypto -> DState crypto -> Bool #

Show (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

showsPrec :: Int -> DState crypto -> ShowS #

show :: DState crypto -> String #

showList :: [DState crypto] -> ShowS #

Generic (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (DState crypto) :: Type -> Type #

Methods

from :: DState crypto -> Rep (DState crypto) x #

to :: Rep (DState crypto) x -> DState crypto #

NFData (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: DState crypto -> () #

Crypto crypto => ToCBOR (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: DState crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (DState crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [DState crypto] -> Size Source #

Crypto crypto => FromCBOR (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

fromCBOR :: Decoder s (DState crypto) Source #

label :: Proxy (DState crypto) -> Text Source #

NoThunks (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (DState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (DState crypto) = D1 ('MetaData "DState" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "DState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_rewards") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (RewardAccounts crypto)) :*: (S1 ('MetaSel ('Just "_delegations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Credential 'Staking crypto) (KeyHash 'StakePool crypto))) :*: S1 ('MetaSel ('Just "_ptrs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Bimap Ptr (Credential 'Staking crypto))))) :*: (S1 ('MetaSel ('Just "_fGenDelegs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (FutureGenDeleg crypto) (GenDelegPair crypto))) :*: (S1 ('MetaSel ('Just "_genDelegs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (GenDelegs crypto)) :*: S1 ('MetaSel ('Just "_irwd") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (InstantaneousRewards crypto))))))

data InstantaneousRewards crypto Source #

Constructors

InstantaneousRewards 

Fields

Instances

Instances details
Eq (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Show (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Generic (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Associated Types

type Rep (InstantaneousRewards crypto) :: Type -> Type #

Methods

from :: InstantaneousRewards crypto -> Rep (InstantaneousRewards crypto) x #

to :: Rep (InstantaneousRewards crypto) x -> InstantaneousRewards crypto #

NFData (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

rnf :: InstantaneousRewards crypto -> () #

Crypto crypto => ToCBOR (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

Methods

toCBOR :: InstantaneousRewards crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (InstantaneousRewards crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [InstantaneousRewards crypto] -> Size Source #

Crypto crypto => FromCBOR (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

NoThunks (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (InstantaneousRewards crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.LedgerState

type Rep (InstantaneousRewards crypto) = D1 ('MetaData "InstantaneousRewards" "Shelley.Spec.Ledger.LedgerState" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "InstantaneousRewards" 'PrefixI 'True) (S1 ('MetaSel ('Just "iRReserves") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Credential 'Staking crypto) Coin)) :*: S1 ('MetaSel ('Just "iRTreasury") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (Credential 'Staking crypto) Coin))))

type KeyPairs crypto = [(KeyPair 'Payment crypto, KeyPair 'Staking crypto)] Source #

Representation of a list of pairs of key pairs, e.g., pay and stake keys

data PPUPEnv era Source #

Constructors

PPUPEnv SlotNo (PParams era) (GenDelegs (Crypto era)) 

data PPUP era Source #

Instances

Instances details
Typeable era => STS (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

Associated Types

type State (PPUP era) Source #

type Signal (PPUP era) Source #

type Environment (PPUP era) Source #

type BaseM (PPUP era) :: Type -> Type Source #

type PredicateFailure (PPUP era) = (b :: Type) Source #

Crypto c => Embed (PPUP (ShelleyEra c)) (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

type PredicateFailure (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

type BaseM (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

type BaseM (PPUP era) = ShelleyBase
type Environment (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

type Environment (PPUP era) = PPUPEnv era
type Signal (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

type Signal (PPUP era) = Maybe (Update era)
type State (PPUP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ppup

type State (PPUP era) = PPUPState era

data UtxoEnv era Source #

Constructors

UtxoEnv SlotNo (PParams era) (Map (KeyHash 'StakePool (Crypto era)) (PoolParams (Crypto era))) (GenDelegs (Crypto era)) 

Instances

Instances details
Show (UtxoEnv era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

Methods

showsPrec :: Int -> UtxoEnv era -> ShowS #

show :: UtxoEnv era -> String #

showList :: [UtxoEnv era] -> ShowS #

data UTXO era Source #

Instances

Instances details
(Crypto c, TxBody (ShelleyEra c) ~ TxBody (ShelleyEra c)) => STS (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

Associated Types

type State (UTXO (ShelleyEra c)) Source #

type Signal (UTXO (ShelleyEra c)) Source #

type Environment (UTXO (ShelleyEra c)) Source #

type BaseM (UTXO (ShelleyEra c)) :: Type -> Type Source #

type PredicateFailure (UTXO (ShelleyEra c)) = (b :: Type) Source #

Crypto c => Embed (PPUP (ShelleyEra c)) (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

Crypto c => Embed (UTXO (ShelleyEra c)) (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

type PredicateFailure (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

type BaseM (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

type Environment (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

type Signal (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

type State (UTXO (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxo

data UTXOW era Source #

Instances

Instances details
(Crypto c, DSignable c (Hash c EraIndependentTxBody)) => STS (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

Crypto c => Embed (UTXO (ShelleyEra c)) (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

(ShelleyBased era, STS (UTXOW era), BaseM (UTXOW era) ~ ShelleyBase) => Embed (UTXOW era) (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type PredicateFailure (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

type BaseM (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

type Environment (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

type Signal (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

type State (UTXOW (ShelleyEra c)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Utxow

data POOLREAP era Source #

Instances

Instances details
Typeable era => STS (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

Associated Types

type State (POOLREAP era) Source #

type Signal (POOLREAP era) Source #

type Environment (POOLREAP era) Source #

type BaseM (POOLREAP era) :: Type -> Type Source #

type PredicateFailure (POOLREAP era) = (b :: Type) Source #

ShelleyBased era => Embed (POOLREAP era) (EPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Epoch

type PredicateFailure (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

type BaseM (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

type Environment (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

type Environment (POOLREAP era) = PParams era
type Signal (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

type Signal (POOLREAP era) = EpochNo
type State (POOLREAP era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.PoolReap

type State (POOLREAP era) = PoolreapState era

data PoolEnv era Source #

Constructors

PoolEnv SlotNo (PParams era) 

Instances

Instances details
Eq (PoolEnv era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

Methods

(==) :: PoolEnv era -> PoolEnv era -> Bool #

(/=) :: PoolEnv era -> PoolEnv era -> Bool #

Show (PoolEnv era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

Methods

showsPrec :: Int -> PoolEnv era -> ShowS #

show :: PoolEnv era -> String #

showList :: [PoolEnv era] -> ShowS #

data POOL (era :: Type) Source #

Instances

Instances details
Typeable era => STS (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

Associated Types

type State (POOL era) Source #

type Signal (POOL era) Source #

type Environment (POOL era) Source #

type BaseM (POOL era) :: Type -> Type Source #

type PredicateFailure (POOL era) = (b :: Type) Source #

Era era => Embed (POOL era) (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type PredicateFailure (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

type BaseM (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

type BaseM (POOL era) = ShelleyBase
type Environment (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

type Environment (POOL era) = PoolEnv era
type Signal (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

type Signal (POOL era) = DCert (Crypto era)
type State (POOL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Pool

type State (POOL era) = PState (Crypto era)

data NEWEPOCH era Source #

Instances

Instances details
ShelleyBased era => STS (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

Associated Types

type State (NEWEPOCH era) Source #

type Signal (NEWEPOCH era) Source #

type Environment (NEWEPOCH era) Source #

type BaseM (NEWEPOCH era) :: Type -> Type Source #

type PredicateFailure (NEWEPOCH era) = (b :: Type) Source #

ShelleyBased era => Embed (MIR era) (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

ShelleyBased era => Embed (EPOCH era) (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

ShelleyBased era => Embed (NEWEPOCH era) (TICKF era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

ShelleyBased era => Embed (NEWEPOCH era) (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type PredicateFailure (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

type BaseM (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

type Environment (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

type Environment (NEWEPOCH era) = ()
type Signal (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

type Signal (NEWEPOCH era) = EpochNo
type State (NEWEPOCH era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.NewEpoch

type State (NEWEPOCH era) = NewEpochState era

data TICK era Source #

Instances

Instances details
ShelleyBased era => STS (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

Associated Types

type State (TICK era) Source #

type Signal (TICK era) Source #

type Environment (TICK era) Source #

type BaseM (TICK era) :: Type -> Type Source #

type PredicateFailure (TICK era) = (b :: Type) Source #

ShelleyBased era => Embed (RUPD era) (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

ShelleyBased era => Embed (NEWEPOCH era) (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

(Era era, ShelleyBased era, STS (TICK era)) => Embed (TICK era) (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type PredicateFailure (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type BaseM (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type BaseM (TICK era) = ShelleyBase
type Environment (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type Environment (TICK era) = ()
type Signal (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type Signal (TICK era) = SlotNo
type State (TICK era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Tick

type State (TICK era) = NewEpochState era

data DelegEnv Source #

Constructors

DelegEnv 

Fields

Instances

Instances details
Eq DelegEnv Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

Show DelegEnv Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

data DELEG era Source #

Instances

Instances details
Typeable era => STS (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

Associated Types

type State (DELEG era) Source #

type Signal (DELEG era) Source #

type Environment (DELEG era) Source #

type BaseM (DELEG era) :: Type -> Type Source #

type PredicateFailure (DELEG era) = (b :: Type) Source #

Era era => Embed (DELEG era) (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type PredicateFailure (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

type BaseM (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

type BaseM (DELEG era) = ShelleyBase
type Environment (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

type Signal (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

type Signal (DELEG era) = DCert (Crypto era)
type State (DELEG era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Deleg

type State (DELEG era) = DState (Crypto era)

data DelplEnv era Source #

Constructors

DelplEnv 

data DELPL era Source #

Instances

Instances details
Era era => STS (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

Associated Types

type State (DELPL era) Source #

type Signal (DELPL era) Source #

type Environment (DELPL era) Source #

type BaseM (DELPL era) :: Type -> Type Source #

type PredicateFailure (DELPL era) = (b :: Type) Source #

Era era => Embed (POOL era) (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

Era era => Embed (DELEG era) (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

(Era era, ShelleyBased era, HasField "wdrls" (TxBody era) (Wdrl (Crypto era))) => Embed (DELPL era) (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type PredicateFailure (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type BaseM (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type BaseM (DELPL era) = ShelleyBase
type Environment (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type Environment (DELPL era) = DelplEnv era
type Signal (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type Signal (DELPL era) = DCert (Crypto era)
type State (DELPL era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delpl

type State (DELPL era) = DPState (Crypto era)

data DelegsEnv era Source #

Constructors

DelegsEnv 

Instances

Instances details
ShelleyBased era => Show (DelegsEnv era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

Methods

showsPrec :: Int -> DelegsEnv era -> ShowS #

show :: DelegsEnv era -> String #

showList :: [DelegsEnv era] -> ShowS #

data DELEGS era Source #

Instances

Instances details
(Era era, ShelleyBased era, HasField "wdrls" (TxBody era) (Wdrl (Crypto era))) => STS (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

Associated Types

type State (DELEGS era) Source #

type Signal (DELEGS era) Source #

type Environment (DELEGS era) Source #

type BaseM (DELEGS era) :: Type -> Type Source #

type PredicateFailure (DELEGS era) = (b :: Type) Source #

(Era era, ShelleyBased era, HasField "wdrls" (TxBody era) (Wdrl (Crypto era))) => Embed (DELPL era) (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

(ShelleyBased era, STS (DELEGS era)) => Embed (DELEGS era) (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type PredicateFailure (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type BaseM (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type BaseM (DELEGS era) = ShelleyBase
type Environment (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type Environment (DELEGS era) = DelegsEnv era
type Signal (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type Signal (DELEGS era) = Seq (DCert (Crypto era))
type State (DELEGS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Delegs

type State (DELEGS era) = DPState (Crypto era)

data LedgerEnv era Source #

Instances

Instances details
Show (LedgerEnv era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

Methods

showsPrec :: Int -> LedgerEnv era -> ShowS #

show :: LedgerEnv era -> String #

showList :: [LedgerEnv era] -> ShowS #

data LEDGER era Source #

Instances

Instances details
(Era era, DSignable (Crypto era) (Hash (Crypto era) EraIndependentTxBody), ShelleyBased era, Embed (DELEGS era) (LEDGER era), Embed (UTXOW era) (LEDGER era), Environment (UTXOW era) ~ UtxoEnv era, State (UTXOW era) ~ UTxOState era, Signal (UTXOW era) ~ Tx era, Environment (DELEGS era) ~ DelegsEnv era, State (DELEGS era) ~ DPState (Crypto era), Signal (DELEGS era) ~ Seq (DCert (Crypto era)), HasField "certs" (TxBody era) (StrictSeq (DCert (Crypto era)))) => STS (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

Associated Types

type State (LEDGER era) Source #

type Signal (LEDGER era) Source #

type Environment (LEDGER era) Source #

type BaseM (LEDGER era) :: Type -> Type Source #

type PredicateFailure (LEDGER era) = (b :: Type) Source #

(ShelleyBased era, STS (UTXOW era), BaseM (UTXOW era) ~ ShelleyBase) => Embed (UTXOW era) (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

(ShelleyBased era, STS (DELEGS era)) => Embed (DELEGS era) (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

(Era era, STS (LEDGER era), ShelleyBased era, DSignable (Crypto era) (Hash (Crypto era) EraIndependentTxBody), Environment (UTXO era) ~ UtxoEnv era, State (UTXO era) ~ UTxOState era) => Embed (LEDGER era) (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type PredicateFailure (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type BaseM (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type BaseM (LEDGER era) = ShelleyBase
type Environment (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type Environment (LEDGER era) = LedgerEnv era
type Signal (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type Signal (LEDGER era) = Tx era
type State (LEDGER era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledger

type State (LEDGER era) = (UTxOState era, DPState (Crypto era))

data LEDGERS era Source #

Instances

Instances details
(Era era, ShelleyBased era, Embed (LEDGER era) (LEDGERS era), DSignable (Crypto era) (Hash (Crypto era) EraIndependentTxBody)) => STS (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

Associated Types

type State (LEDGERS era) Source #

type Signal (LEDGERS era) Source #

type Environment (LEDGERS era) Source #

type BaseM (LEDGERS era) :: Type -> Type Source #

type PredicateFailure (LEDGERS era) = (b :: Type) Source #

(Era era, STS (LEDGER era), ShelleyBased era, DSignable (Crypto era) (Hash (Crypto era) EraIndependentTxBody), Environment (UTXO era) ~ UtxoEnv era, State (UTXO era) ~ UTxOState era) => Embed (LEDGER era) (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

(Era era, STS (LEDGERS era), DSignable (Crypto era) (Hash (Crypto era) EraIndependentTxBody), ShelleyBased era) => Embed (LEDGERS era) (BBODY era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Bbody

type PredicateFailure (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type BaseM (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type Environment (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type Environment (LEDGERS era) = LedgersEnv era
type Signal (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type Signal (LEDGERS era) = Seq (Tx era)
type State (LEDGERS era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Ledgers

type State (LEDGERS era) = LedgerState era

newtype LaxBlock era Source #

Constructors

LaxBlock (Block era) 

Instances

Instances details
ShelleyBased era => Show (LaxBlock era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> LaxBlock era -> ShowS #

show :: LaxBlock era -> String #

showList :: [LaxBlock era] -> ShowS #

Era era => ToCBOR (LaxBlock era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: LaxBlock era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (LaxBlock era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [LaxBlock era] -> Size Source #

(ShelleyBased era, ValidateScript era) => FromCBOR (Annotator (LaxBlock era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

data Block era Source #

Constructors

Block' !(BHeader (Crypto era)) !(TxSeq era) ByteString 

Bundled Patterns

pattern Block :: Era era => BHeader (Crypto era) -> TxSeq era -> Block era 

Instances

Instances details
ShelleyBased era => Eq (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: Block era -> Block era -> Bool #

(/=) :: Block era -> Block era -> Bool #

ShelleyBased era => Show (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> Block era -> ShowS #

show :: Block era -> String #

showList :: [Block era] -> ShowS #

Generic (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Associated Types

type Rep (Block era) :: Type -> Type #

Methods

from :: Block era -> Rep (Block era) x #

to :: Rep (Block era) x -> Block era #

Era era => ToCBOR (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: Block era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (Block era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Block era] -> Size Source #

(ShelleyBased era, ValidateScript era) => FromCBOR (Annotator (Block era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

ShelleyBased era => NoThunks (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (Block era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (Block era) = D1 ('MetaData "Block" "Shelley.Spec.Ledger.BlockChain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Block'" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (BHeader (Crypto era))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (TxSeq era)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString))))

data BHBody crypto Source #

Constructors

BHBody 

Fields

Instances

Instances details
Crypto crypto => Eq (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: BHBody crypto -> BHBody crypto -> Bool #

(/=) :: BHBody crypto -> BHBody crypto -> Bool #

Crypto crypto => Show (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> BHBody crypto -> ShowS #

show :: BHBody crypto -> String #

showList :: [BHBody crypto] -> ShowS #

Generic (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Associated Types

type Rep (BHBody crypto) :: Type -> Type #

Methods

from :: BHBody crypto -> Rep (BHBody crypto) x #

to :: Rep (BHBody crypto) x -> BHBody crypto #

Crypto crypto => ToCBOR (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: BHBody crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (BHBody crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [BHBody crypto] -> Size Source #

Crypto crypto => FromCBOR (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

fromCBOR :: Decoder s (BHBody crypto) Source #

label :: Proxy (BHBody crypto) -> Text Source #

Crypto crypto => SignableRepresentation (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Crypto crypto => NoThunks (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (BHBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (BHBody crypto) = D1 ('MetaData "BHBody" "Shelley.Spec.Ledger.BlockChain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "BHBody" 'PrefixI 'True) (((S1 ('MetaSel ('Just "bheaderBlockNo") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlockNo) :*: S1 ('MetaSel ('Just "bheaderSlotNo") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SlotNo)) :*: (S1 ('MetaSel ('Just "bheaderPrev") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (PrevHash crypto)) :*: (S1 ('MetaSel ('Just "bheaderVk") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VKey 'BlockIssuer crypto)) :*: S1 ('MetaSel ('Just "bheaderVrfVk") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyVRF crypto))))) :*: ((S1 ('MetaSel ('Just "bheaderEta") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (CertifiedVRF crypto Nonce)) :*: (S1 ('MetaSel ('Just "bheaderL") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (CertifiedVRF crypto Natural)) :*: S1 ('MetaSel ('Just "bsize") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Natural))) :*: (S1 ('MetaSel ('Just "bhash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HashBBody crypto)) :*: (S1 ('MetaSel ('Just "bheaderOCert") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (OCert crypto)) :*: S1 ('MetaSel ('Just "bprotver") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ProtVer))))))

data PrevHash crypto Source #

The previous hash of a block

Constructors

GenesisHash 
BlockHash !(HashHeader crypto) 

Instances

Instances details
Eq (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: PrevHash crypto -> PrevHash crypto -> Bool #

(/=) :: PrevHash crypto -> PrevHash crypto -> Bool #

Ord (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

compare :: PrevHash crypto -> PrevHash crypto -> Ordering #

(<) :: PrevHash crypto -> PrevHash crypto -> Bool #

(<=) :: PrevHash crypto -> PrevHash crypto -> Bool #

(>) :: PrevHash crypto -> PrevHash crypto -> Bool #

(>=) :: PrevHash crypto -> PrevHash crypto -> Bool #

max :: PrevHash crypto -> PrevHash crypto -> PrevHash crypto #

min :: PrevHash crypto -> PrevHash crypto -> PrevHash crypto #

Show (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> PrevHash crypto -> ShowS #

show :: PrevHash crypto -> String #

showList :: [PrevHash crypto] -> ShowS #

Generic (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Associated Types

type Rep (PrevHash crypto) :: Type -> Type #

Methods

from :: PrevHash crypto -> Rep (PrevHash crypto) x #

to :: Rep (PrevHash crypto) x -> PrevHash crypto #

Crypto crypto => ToCBOR (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: PrevHash crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PrevHash crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PrevHash crypto] -> Size Source #

Crypto crypto => FromCBOR (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

fromCBOR :: Decoder s (PrevHash crypto) Source #

label :: Proxy (PrevHash crypto) -> Text Source #

Crypto crypto => NoThunks (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (PrevHash crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (PrevHash crypto) = D1 ('MetaData "PrevHash" "Shelley.Spec.Ledger.BlockChain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "GenesisHash" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BlockHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HashHeader crypto))))

data BHeader crypto where Source #

Bundled Patterns

pattern BHeader :: Crypto crypto => BHBody crypto -> SignedKES crypto (BHBody crypto) -> BHeader crypto 

Instances

Instances details
Crypto crypto => Eq (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: BHeader crypto -> BHeader crypto -> Bool #

(/=) :: BHeader crypto -> BHeader crypto -> Bool #

Crypto crypto => Show (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> BHeader crypto -> ShowS #

show :: BHeader crypto -> String #

showList :: [BHeader crypto] -> ShowS #

Generic (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Associated Types

type Rep (BHeader crypto) :: Type -> Type #

Methods

from :: BHeader crypto -> Rep (BHeader crypto) x #

to :: Rep (BHeader crypto) x -> BHeader crypto #

Crypto crypto => ToCBOR (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: BHeader crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (BHeader crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [BHeader crypto] -> Size Source #

Crypto crypto => FromCBOR (Annotator (BHeader crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

fromCBOR :: Decoder s (Annotator (BHeader crypto)) Source #

label :: Proxy (Annotator (BHeader crypto)) -> Text Source #

Crypto crypto => NoThunks (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (BHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (BHeader crypto) = D1 ('MetaData "BHeader" "Shelley.Spec.Ledger.BlockChain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "BHeader'" 'PrefixI 'True) (S1 ('MetaSel ('Just "bHeaderBody'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (BHBody crypto)) :*: (S1 ('MetaSel ('Just "bHeaderSig'") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignedKES crypto (BHBody crypto))) :*: S1 ('MetaSel ('Just "bHeaderBytes") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ByteString))))

newtype HashBBody crypto Source #

Hash of block body

Instances

Instances details
Eq (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: HashBBody crypto -> HashBBody crypto -> Bool #

(/=) :: HashBBody crypto -> HashBBody crypto -> Bool #

Ord (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

compare :: HashBBody crypto -> HashBBody crypto -> Ordering #

(<) :: HashBBody crypto -> HashBBody crypto -> Bool #

(<=) :: HashBBody crypto -> HashBBody crypto -> Bool #

(>) :: HashBBody crypto -> HashBBody crypto -> Bool #

(>=) :: HashBBody crypto -> HashBBody crypto -> Bool #

max :: HashBBody crypto -> HashBBody crypto -> HashBBody crypto #

min :: HashBBody crypto -> HashBBody crypto -> HashBBody crypto #

Show (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> HashBBody crypto -> ShowS #

show :: HashBBody crypto -> String #

showList :: [HashBBody crypto] -> ShowS #

Crypto crypto => ToCBOR (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: HashBBody crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (HashBBody crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [HashBBody crypto] -> Size Source #

Crypto crypto => FromCBOR (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

fromCBOR :: Decoder s (HashBBody crypto) Source #

label :: Proxy (HashBBody crypto) -> Text Source #

NoThunks (HashBBody crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

newtype HashHeader crypto Source #

The hash of a Block Header

Constructors

HashHeader 

Fields

Instances

Instances details
Eq (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

(==) :: HashHeader crypto -> HashHeader crypto -> Bool #

(/=) :: HashHeader crypto -> HashHeader crypto -> Bool #

Ord (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

compare :: HashHeader crypto -> HashHeader crypto -> Ordering #

(<) :: HashHeader crypto -> HashHeader crypto -> Bool #

(<=) :: HashHeader crypto -> HashHeader crypto -> Bool #

(>) :: HashHeader crypto -> HashHeader crypto -> Bool #

(>=) :: HashHeader crypto -> HashHeader crypto -> Bool #

max :: HashHeader crypto -> HashHeader crypto -> HashHeader crypto #

min :: HashHeader crypto -> HashHeader crypto -> HashHeader crypto #

Show (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

showsPrec :: Int -> HashHeader crypto -> ShowS #

show :: HashHeader crypto -> String #

showList :: [HashHeader crypto] -> ShowS #

Generic (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Associated Types

type Rep (HashHeader crypto) :: Type -> Type #

Methods

from :: HashHeader crypto -> Rep (HashHeader crypto) x #

to :: Rep (HashHeader crypto) x -> HashHeader crypto #

NFData (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

Methods

rnf :: HashHeader crypto -> () #

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

Defined in Shelley.Spec.Ledger.BlockChain

Methods

toCBOR :: HashHeader crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (HashHeader crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [HashHeader crypto] -> Size Source #

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

Defined in Shelley.Spec.Ledger.BlockChain

Methods

fromCBOR :: Decoder s (HashHeader crypto) Source #

label :: Proxy (HashHeader crypto) -> Text Source #

NoThunks (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (HashHeader crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BlockChain

type Rep (HashHeader crypto) = D1 ('MetaData "HashHeader" "Shelley.Spec.Ledger.BlockChain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "HashHeader" 'PrefixI 'True) (S1 ('MetaSel ('Just "unHashHeader") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hash crypto (BHeader crypto)))))

bhHash :: forall crypto. Crypto crypto => BHeader crypto -> HashHeader crypto Source #

Hash a given block header

bbHash :: forall era. Era era => TxSeq era -> HashBBody (Crypto era) Source #

Hash a given block body

bHeaderSize :: forall crypto. Crypto crypto => BHeader crypto -> Int Source #

bheader :: Era era => Block era -> BHeader (Crypto era) Source #

bbody :: Era era => Block era -> TxSeq era Source #

bhbody :: Crypto crypto => BHeader crypto -> BHBody crypto Source #

data PrtlSeqFailure crypto Source #

Constructors

WrongSlotIntervalPrtclSeq 

Fields

WrongBlockNoPrtclSeq 

Fields

WrongBlockSequencePrtclSeq 

Fields

  • (PrevHash crypto)

    Last applied hash

  • (PrevHash crypto)

    Current block's previous hash

Instances

Instances details
Eq (PrtlSeqFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

(==) :: PrtlSeqFailure crypto -> PrtlSeqFailure crypto -> Bool #

(/=) :: PrtlSeqFailure crypto -> PrtlSeqFailure crypto -> Bool #

Show (PrtlSeqFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

showsPrec :: Int -> PrtlSeqFailure crypto -> ShowS #

show :: PrtlSeqFailure crypto -> String #

showList :: [PrtlSeqFailure crypto] -> ShowS #

Generic (PrtlSeqFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Associated Types

type Rep (PrtlSeqFailure crypto) :: Type -> Type #

Methods

from :: PrtlSeqFailure crypto -> Rep (PrtlSeqFailure crypto) x #

to :: Rep (PrtlSeqFailure crypto) x -> PrtlSeqFailure crypto #

Crypto crypto => NoThunks (PrtlSeqFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtlSeqFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

data PrtclPredicateFailure crypto Source #

Instances

Instances details
VRFAlgorithm (VRF crypto) => Eq (PrtclPredicateFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

VRFAlgorithm (VRF crypto) => Show (PrtclPredicateFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Generic (PrtclPredicateFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Associated Types

type Rep (PrtclPredicateFailure crypto) :: Type -> Type #

Crypto crypto => NoThunks (PrtclPredicateFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtclPredicateFailure crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtclPredicateFailure crypto) = D1 ('MetaData "PrtclPredicateFailure" "Shelley.Spec.Ledger.STS.Prtcl" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "OverlayFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PredicateFailure (OVERLAY crypto)))) :+: C1 ('MetaCons "UpdnFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PredicateFailure (UPDN crypto)))))

data PrtclEnv crypto Source #

Constructors

PrtclEnv UnitInterval (PoolDistr crypto) (GenDelegs crypto) Nonce 

Instances

Instances details
Generic (PrtclEnv crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Associated Types

type Rep (PrtclEnv crypto) :: Type -> Type #

Methods

from :: PrtclEnv crypto -> Rep (PrtclEnv crypto) x #

to :: Rep (PrtclEnv crypto) x -> PrtclEnv crypto #

NoThunks (PrtclEnv crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtclEnv crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

data PrtclState crypto Source #

Constructors

PrtclState 

Fields

Instances

Instances details
Eq (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

(==) :: PrtclState crypto -> PrtclState crypto -> Bool #

(/=) :: PrtclState crypto -> PrtclState crypto -> Bool #

Show (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

showsPrec :: Int -> PrtclState crypto -> ShowS #

show :: PrtclState crypto -> String #

showList :: [PrtclState crypto] -> ShowS #

Generic (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Associated Types

type Rep (PrtclState crypto) :: Type -> Type #

Methods

from :: PrtclState crypto -> Rep (PrtclState crypto) x #

to :: Rep (PrtclState crypto) x -> PrtclState crypto #

Crypto crypto => ToCBOR (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

toCBOR :: PrtclState crypto -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PrtclState crypto) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PrtclState crypto] -> Size Source #

Crypto crypto => FromCBOR (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

Methods

fromCBOR :: Decoder s (PrtclState crypto) Source #

label :: Proxy (PrtclState crypto) -> Text Source #

Crypto crypto => NoThunks (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtclState crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Prtcl

type Rep (PrtclState crypto) = D1 ('MetaData "PrtclState" "Shelley.Spec.Ledger.STS.Prtcl" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "PrtclState" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (KeyHash 'BlockIssuer crypto) Word64)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Nonce) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Nonce))))

prtlSeqChecks :: (MonadError (PrtlSeqFailure crypto) m, Crypto crypto) => WithOrigin (LastAppliedBlock crypto) -> BHeader crypto -> m () Source #

data ChainState era Source #

Instances

Instances details
ShelleyBased era => Eq (ChainState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

Methods

(==) :: ChainState era -> ChainState era -> Bool #

(/=) :: ChainState era -> ChainState era -> Bool #

ShelleyBased era => Show (ChainState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

Methods

showsPrec :: Int -> ChainState era -> ShowS #

show :: ChainState era -> String #

showList :: [ChainState era] -> ShowS #

Generic (ChainState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

Associated Types

type Rep (ChainState era) :: Type -> Type #

Methods

from :: ChainState era -> Rep (ChainState era) x #

to :: Rep (ChainState era) x -> ChainState era #

Era era => NFData (ChainState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

Methods

rnf :: ChainState era -> () #

type Rep (ChainState era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type Rep (ChainState era) = D1 ('MetaData "ChainState" "Shelley.Spec.Ledger.STS.Chain" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ChainState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "chainNes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NewEpochState era)) :*: (S1 ('MetaSel ('Just "chainOCertIssue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map (KeyHash 'BlockIssuer (Crypto era)) Word64)) :*: S1 ('MetaSel ('Just "chainEpochNonce") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nonce))) :*: ((S1 ('MetaSel ('Just "chainEvolvingNonce") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nonce) :*: S1 ('MetaSel ('Just "chainCandidateNonce") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nonce)) :*: (S1 ('MetaSel ('Just "chainPrevEpochNonce") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nonce) :*: S1 ('MetaSel ('Just "chainLastAppliedBlock") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (WithOrigin (LastAppliedBlock (Crypto era))))))))

data CHAIN era Source #

Instances

Instances details
(Era era, ShelleyBased era) => Embed TICKN (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

(Era era, c ~ Crypto era, ShelleyBased era, Embed (BBODY era) (CHAIN era), Embed TICKN (CHAIN era), Embed (TICK era) (CHAIN era), Embed (PRTCL (Crypto era)) (CHAIN era), DSignable c (OCertSignable c), DSignable c (Hash c EraIndependentTxBody), KESignable c (BHBody c), Signable (VRF c) Seed) => STS (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

Associated Types

type State (CHAIN era) Source #

type Signal (CHAIN era) Source #

type Environment (CHAIN era) Source #

type BaseM (CHAIN era) :: Type -> Type Source #

type PredicateFailure (CHAIN era) = (b :: Type) Source #

(Era era, ShelleyBased era, STS (TICK era)) => Embed (TICK era) (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

(Era era, c ~ Crypto era, ShelleyBased era, STS (PRTCL c)) => Embed (PRTCL c) (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

(Era era, ShelleyBased era, STS (BBODY era)) => Embed (BBODY era) (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type PredicateFailure (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type BaseM (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type BaseM (CHAIN era) = ShelleyBase
type Environment (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type Environment (CHAIN era) = ()
type Signal (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type Signal (CHAIN era) = Block era
type State (CHAIN era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.STS.Chain

type State (CHAIN era) = ChainState era

initialShelleyState :: WithOrigin (LastAppliedBlock (Crypto era)) -> EpochNo -> UTxO era -> Coin -> Map (KeyHash 'Genesis (Crypto era)) (GenDelegPair (Crypto era)) -> PParams era -> Nonce -> ChainState era Source #

Creates a valid initial chain state

class (ChainData (Tx era), AnnotatedData (Tx era), Eq (ApplyTxError era), Show (ApplyTxError era), Typeable (ApplyTxError era), SerialisableData (ApplyTxError era)) => ApplyTx era where Source #

Minimal complete definition

Nothing

Methods

applyTxs :: MonadError (ApplyTxError era) m => Globals -> SlotNo -> Seq (Tx era) -> NewEpochState era -> m (NewEpochState era) Source #

default applyTxs :: (MonadError (ApplyTxError era) m, STS (LEDGERS era)) => Globals -> SlotNo -> Seq (Tx era) -> NewEpochState era -> m (NewEpochState era) Source #

Instances

Instances details
PraosCrypto c => ApplyTx (ShelleyEra c) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API.Mempool

data ApplyTxError era Source #

Constructors

ApplyTxError [PredicateFailure (LEDGERS era)] 

Instances

Instances details
Eq (PredicateFailure (LEDGERS era)) => Eq (ApplyTxError era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API.Mempool

Methods

(==) :: ApplyTxError era -> ApplyTxError era -> Bool #

(/=) :: ApplyTxError era -> ApplyTxError era -> Bool #

Show (PredicateFailure (LEDGERS era)) => Show (ApplyTxError era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API.Mempool

(ShelleyBased era, ToCBOR (PredicateFailure (LEDGERS era))) => ToCBOR (ApplyTxError era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API.Mempool

Methods

toCBOR :: ApplyTxError era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (ApplyTxError era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [ApplyTxError era] -> Size Source #

(ShelleyBased era, FromCBOR (PredicateFailure (LEDGERS era))) => FromCBOR (ApplyTxError era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API.Mempool

class (PraosCrypto (Crypto era), ShelleyBased era, GetLedgerView era, ApplyBlock era, ApplyTx era) => ShelleyBasedEra era Source #

Instances

Instances details
PraosCrypto crypto => ShelleyBasedEra (ShelleyEra crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.API