shelley-spec-ledger-0.1.0.0
Safe HaskellNone
LanguageHaskell98

Shelley.Spec.Ledger.Address.Bootstrap

Synopsis

Documentation

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

newtype ChainCode Source #

Constructors

ChainCode 

Instances

Instances details
Eq ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Show ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Generic ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Associated Types

type Rep ChainCode :: Type -> Type #

ToCBOR ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

Methods

toCBOR :: ChainCode -> Encoding Source #

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

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

FromCBOR ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

NoThunks ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

type Rep ChainCode Source # 
Instance details

Defined in Shelley.Spec.Ledger.Address.Bootstrap

type Rep ChainCode = D1 ('MetaData "ChainCode" "Shelley.Spec.Ledger.Address.Bootstrap" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "ChainCode" 'PrefixI 'True) (S1 ('MetaSel ('Just "unChainCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

bootstrapWitKeyHash :: forall crypto. Crypto crypto => BootstrapWitness crypto -> KeyHash 'Witness crypto Source #

Rebuild the addrRoot of the corresponding address.

unpackByronVKey :: forall crypto. DSIGN crypto ~ Ed25519DSIGN => VerificationKey -> (VKey 'Witness crypto, ChainCode) Source #

verifyBootstrapWit :: forall crypto. (Crypto crypto, Signable (DSIGN crypto) (Hash crypto EraIndependentTxBody)) => Hash crypto EraIndependentTxBody -> BootstrapWitness crypto -> Bool Source #