shelley-spec-ledger-0.1.0.0
Safe HaskellNone
LanguageHaskell98

Shelley.Spec.Ledger.TxBody

Synopsis

Documentation

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 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 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 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 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 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 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 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 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 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))))

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

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

Constructors

TxBodyRaw 

Fields

Instances

Instances details
(Era era, ProperVal era) => Eq (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

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

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

(Era era, ProperVal era) => Show (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

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

show :: TxBodyRaw era -> String #

showList :: [TxBodyRaw era] -> ShowS #

Generic (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Associated Types

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

Methods

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

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

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

Defined in Shelley.Spec.Ledger.TxBody

Methods

rnf :: TxBodyRaw era -> () #

ProperTo era => ToCBOR (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

toCBOR :: TxBodyRaw era -> Encoding Source #

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

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

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

Defined in Shelley.Spec.Ledger.TxBody

ProperFrom era => FromCBOR (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

NoThunks (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxBodyRaw era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

type Rep (TxBodyRaw era) = D1 ('MetaData "TxBodyRaw" "Shelley.Spec.Ledger.TxBody" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "TxBodyRaw" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_inputsX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set (TxIn (Crypto era)))) :*: S1 ('MetaSel ('Just "_outputsX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictSeq (TxOut era)))) :*: (S1 ('MetaSel ('Just "_certsX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictSeq (DCert (Crypto era)))) :*: S1 ('MetaSel ('Just "_wdrlsX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Wdrl (Crypto era))))) :*: ((S1 ('MetaSel ('Just "_txfeeX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Coin) :*: S1 ('MetaSel ('Just "_ttlX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SlotNo)) :*: (S1 ('MetaSel ('Just "_txUpdateX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictMaybe (Update era))) :*: S1 ('MetaSel ('Just "_mdHashX") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (StrictMaybe (AuxiliaryDataHash (Crypto era))))))))

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))))

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)))

eraIndTxBodyHash :: forall era. Era era => TxBody era -> Hash (Crypto era) EraIndependentTxBody Source #

Compute an era-independent transaction body hash

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

Instances

Instances details
Eq Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Url -> Url -> Ordering #

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

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

(>) :: Url -> Url -> Bool #

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

max :: Url -> Url -> Url #

min :: Url -> Url -> Url #

Show Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Url -> ShowS #

show :: Url -> String #

showList :: [Url] -> ShowS #

Generic Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Url :: Type -> Type #

Methods

from :: Url -> Rep Url x #

to :: Rep Url x -> Url #

NFData Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Url -> () #

ToJSON Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Url -> Encoding Source #

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

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

FromCBOR Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

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

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 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))))

witKeyHash :: WitVKey kr crypto -> KeyHash 'Witness crypto Source #

data SizeOfPoolOwners Source #

The size of the _poolOwners Set. Only used to compute size of encoded PoolParams.

Constructors

SizeOfPoolOwners 

Instances

Instances details
ToCBOR SizeOfPoolOwners Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

data SizeOfPoolRelays Source #

The size of the _poolRelays Set. Only used to compute size of encoded PoolParams.

Constructors

SizeOfPoolRelays 

Instances

Instances details
ToCBOR SizeOfPoolRelays Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody