shelley-spec-ledger-0.1.0.0
Safe HaskellNone
LanguageHaskell98

Shelley.Spec.Ledger.Delegation.Certificates

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

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

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

data IndividualPoolStake crypto Source #

Instances

Instances details
Eq (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Show (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Generic (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Associated Types

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

Methods

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

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

NFData (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

rnf :: IndividualPoolStake crypto -> () #

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

Defined in Shelley.Spec.Ledger.Delegation.Certificates

Methods

toCBOR :: IndividualPoolStake crypto -> Encoding Source #

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

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

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

Defined in Shelley.Spec.Ledger.Delegation.Certificates

NoThunks (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

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 Rep (IndividualPoolStake crypto) Source # 
Instance details

Defined in Shelley.Spec.Ledger.Delegation.Certificates

type Rep (IndividualPoolStake crypto) = D1 ('MetaData "IndividualPoolStake" "Shelley.Spec.Ledger.Delegation.Certificates" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "IndividualPoolStake" 'PrefixI 'True) (S1 ('MetaSel ('Just "individualPoolStake") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rational) :*: S1 ('MetaSel ('Just "individualPoolStakeVrf") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash crypto (VerKeyVRF crypto)))))

delegCWitness :: DelegCert crypto -> Credential 'Staking crypto Source #

Determine the certificate author

isRegKey :: DCert crypto -> Bool Source #

Check for RegKey constructor

isDeRegKey :: DCert crypto -> Bool Source #

Check for DeRegKey constructor

isDelegation :: DCert crypto -> Bool Source #

Check for Delegation constructor

isGenesisDelegation :: DCert crypto -> Bool Source #

Check for GenesisDelegate constructor

isRegPool :: DCert crypto -> Bool Source #

Check for RegPool constructor

isRetirePool :: DCert crypto -> Bool Source #

Check for RetirePool constructor

requiresVKeyWitness :: DCert crypto -> Bool Source #

Returns True for delegation certificates that require at least one witness, and False otherwise. It is mainly used to ensure that calling a variant of cwitness is safe.