cardano-crypto-class-2.0.0: Type classes abstracting over cryptography primitives for Cardano
Safe HaskellNone
LanguageHaskell2010

Cardano.Crypto.KES.Mock

Description

Mock key evolving signatures.

Documentation

data MockKES (t :: Nat) Source #

Instances

Instances details
Eq (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Eq (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Eq (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

(==) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(/=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(TypeError ('Text "Ord not supported for signing keys, use the hash instead") :: Constraint) => Ord (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

compare :: SigKES (MockKES t) -> SigKES (MockKES t) -> Ordering #

(<) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(<=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(>) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(>=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

max :: SigKES (MockKES t) -> SigKES (MockKES t) -> SigKES (MockKES t) #

min :: SigKES (MockKES t) -> SigKES (MockKES t) -> SigKES (MockKES t) #

Show (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Show (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Show (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

showsPrec :: Int -> SigKES (MockKES t) -> ShowS #

show :: SigKES (MockKES t) -> String #

showList :: [SigKES (MockKES t)] -> ShowS #

Generic (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (VerKeyKES (MockKES t)) :: Type -> Type #

Methods

from :: VerKeyKES (MockKES t) -> Rep (VerKeyKES (MockKES t)) x #

to :: Rep (VerKeyKES (MockKES t)) x -> VerKeyKES (MockKES t) #

Generic (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SignKeyKES (MockKES t)) :: Type -> Type #

Methods

from :: SignKeyKES (MockKES t) -> Rep (SignKeyKES (MockKES t)) x #

to :: Rep (SignKeyKES (MockKES t)) x -> SignKeyKES (MockKES t) #

Generic (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SigKES (MockKES t)) :: Type -> Type #

Methods

from :: SigKES (MockKES t) -> Rep (SigKES (MockKES t)) x #

to :: Rep (SigKES (MockKES t)) x -> SigKES (MockKES t) #

KnownNat t => ToCBOR (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: VerKeyKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (VerKeyKES (MockKES t)) -> Size Source #

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

KnownNat t => ToCBOR (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: SignKeyKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SignKeyKES (MockKES t)) -> Size Source #

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

KnownNat t => ToCBOR (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: SigKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SigKES (MockKES t)) -> Size Source #

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

KnownNat t => FromCBOR (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

KnownNat t => FromCBOR (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

KnownNat t => FromCBOR (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

NoThunks (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

NoThunks (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

NoThunks (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

KnownNat t => KESAlgorithm (MockKES t) Source #

Mock key evolving signatures.

What is the difference between Mock KES and Simple KES (Cardano.Crypto.KES.Simple), you may ask? Simple KES satisfies the outward appearance of a KES scheme through assembling a pre-generated list of keys and iterating through them. Mock KES, on the other hand, pretends to be KES but in fact does no key evolution whatsoever.

Simple KES is appropriate for testing, since it will for example reject old keys. Mock KES is more suitable for a basic testnet, since it doesn't suffer from the performance implications of shuffling a giant list of keys around

Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (VerKeyKES (MockKES t)) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "VerKeyMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))
type Rep (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (SignKeyKES (MockKES t)) = D1 ('MetaData "SignKeyKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "SignKeyMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyKES (MockKES t))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Period)))
type Rep (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (SigKES (MockKES t)) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "SigMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash MD5 ())) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignKeyKES (MockKES t)))))
type SeedSizeKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type SeedSizeKES (MockKES t) = 8
newtype VerKeyKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

data SignKeyKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

data SigKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type ContextKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type ContextKES (MockKES t) = ()
type Signable (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

data family VerKeyKES v :: Type Source #

Instances

Instances details
Eq (VerKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Eq (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => Eq (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Eq (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

(==) :: VerKeyKES (SumKES h d) -> VerKeyKES (SumKES h d) -> Bool #

(/=) :: VerKeyKES (SumKES h d) -> VerKeyKES (SumKES h d) -> Bool #

DSIGNAlgorithm d => Eq (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

(==) :: VerKeyKES (SimpleKES d t) -> VerKeyKES (SimpleKES d t) -> Bool #

(/=) :: VerKeyKES (SimpleKES d t) -> VerKeyKES (SimpleKES d t) -> Bool #

(TypeError ('Text "Ord not supported for verification keys, use the hash instead") :: Constraint, KESAlgorithm v) => Ord (VerKeyKES v) Source # 
Instance details

Defined in Cardano.Crypto.KES.Class

Show (VerKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Show (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => Show (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Show (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

showsPrec :: Int -> VerKeyKES (SumKES h d) -> ShowS #

show :: VerKeyKES (SumKES h d) -> String #

showList :: [VerKeyKES (SumKES h d)] -> ShowS #

DSIGNAlgorithm d => Show (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Generic (VerKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (VerKeyKES NeverKES) :: Type -> Type #

Generic (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (VerKeyKES (MockKES t)) :: Type -> Type #

Methods

from :: VerKeyKES (MockKES t) -> Rep (VerKeyKES (MockKES t)) x #

to :: Rep (VerKeyKES (MockKES t)) x -> VerKeyKES (MockKES t) #

Generic (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (VerKeyKES (SingleKES d)) :: Type -> Type #

Generic (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (VerKeyKES (SumKES h d)) :: Type -> Type #

Methods

from :: VerKeyKES (SumKES h d) -> Rep (VerKeyKES (SumKES h d)) x #

to :: Rep (VerKeyKES (SumKES h d)) x -> VerKeyKES (SumKES h d) #

Generic (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (VerKeyKES (SimpleKES d t)) :: Type -> Type #

Methods

from :: VerKeyKES (SimpleKES d t) -> Rep (VerKeyKES (SimpleKES d t)) x #

to :: Rep (VerKeyKES (SimpleKES d t)) x -> VerKeyKES (SimpleKES d t) #

KnownNat t => ToCBOR (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: VerKeyKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (VerKeyKES (MockKES t)) -> Size Source #

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

DSIGNAlgorithm d => ToCBOR (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

toCBOR :: VerKeyKES (SingleKES d) -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (VerKeyKES (SingleKES d)) -> Size Source #

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

(KESAlgorithm d, HashAlgorithm h, Typeable d) => ToCBOR (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

toCBOR :: VerKeyKES (SumKES h d) -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (VerKeyKES (SumKES h d)) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [VerKeyKES (SumKES h d)] -> Size Source #

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => ToCBOR (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

toCBOR :: VerKeyKES (SimpleKES d t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (VerKeyKES (SimpleKES d t)) -> Size Source #

encodedListSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy [VerKeyKES (SimpleKES d t)] -> Size Source #

KnownNat t => FromCBOR (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => FromCBOR (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

(KESAlgorithm d, HashAlgorithm h, Typeable d) => FromCBOR (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => FromCBOR (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

NFData (VerKeyDSIGN d) => NFData (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnf :: VerKeyKES (SingleKES d) -> () #

NFData (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnf :: VerKeyKES (SumKES h d) -> () #

NoThunks (VerKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

NoThunks (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => NoThunks (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

KESAlgorithm d => NoThunks (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

DSIGNAlgorithm d => NoThunks (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

data VerKeyKES NeverKES Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (VerKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (VerKeyKES NeverKES) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.NeverUsed" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "NeverUsedVerKeyKES" 'PrefixI 'False) (U1 :: Type -> Type))
type Rep (VerKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (VerKeyKES (MockKES t)) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "VerKeyMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))
type Rep (VerKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

type Rep (VerKeyKES (SingleKES d)) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.Single" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "VerKeySingleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (VerKeyDSIGN d))))
type Rep (VerKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

type Rep (VerKeyKES (SumKES h d)) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.Sum" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "VerKeySumKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hash h (VerKeyKES d, VerKeyKES d)))))
type Rep (VerKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

type Rep (VerKeyKES (SimpleKES d t)) = D1 ('MetaData "VerKeyKES" "Cardano.Crypto.KES.Simple" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "ThunkyVerKeySimpleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Vector (VerKeyDSIGN d)))))
newtype VerKeyKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

newtype VerKeyKES (SingleKES d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

newtype VerKeyKES (SumKES h d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

newtype VerKeyKES (SimpleKES d t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

data family SignKeyKES v :: Type Source #

Instances

Instances details
Eq (SignKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Eq (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

(TypeError ('Text "Ord not supported for signing keys, use the hash instead") :: Constraint, Eq (SignKeyKES v)) => Ord (SignKeyKES v) Source # 
Instance details

Defined in Cardano.Crypto.KES.Class

Show (SignKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Show (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => Show (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

KESAlgorithm d => Show (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

showsPrec :: Int -> SignKeyKES (SumKES h d) -> ShowS #

show :: SignKeyKES (SumKES h d) -> String #

showList :: [SignKeyKES (SumKES h d)] -> ShowS #

DSIGNAlgorithm d => Show (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Generic (SignKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SignKeyKES NeverKES) :: Type -> Type #

Generic (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SignKeyKES (MockKES t)) :: Type -> Type #

Methods

from :: SignKeyKES (MockKES t) -> Rep (SignKeyKES (MockKES t)) x #

to :: Rep (SignKeyKES (MockKES t)) x -> SignKeyKES (MockKES t) #

Generic (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (SignKeyKES (SingleKES d)) :: Type -> Type #

Generic (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (SignKeyKES (SumKES h d)) :: Type -> Type #

Methods

from :: SignKeyKES (SumKES h d) -> Rep (SignKeyKES (SumKES h d)) x #

to :: Rep (SignKeyKES (SumKES h d)) x -> SignKeyKES (SumKES h d) #

Generic (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (SignKeyKES (SimpleKES d t)) :: Type -> Type #

Methods

from :: SignKeyKES (SimpleKES d t) -> Rep (SignKeyKES (SimpleKES d t)) x #

to :: Rep (SignKeyKES (SimpleKES d t)) x -> SignKeyKES (SimpleKES d t) #

KnownNat t => ToCBOR (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: SignKeyKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SignKeyKES (MockKES t)) -> Size Source #

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

DSIGNAlgorithm d => ToCBOR (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

(KESAlgorithm d, HashAlgorithm h, Typeable d) => ToCBOR (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

toCBOR :: SignKeyKES (SumKES h d) -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (SignKeyKES (SumKES h d)) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [SignKeyKES (SumKES h d)] -> Size Source #

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => ToCBOR (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

toCBOR :: SignKeyKES (SimpleKES d t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SignKeyKES (SimpleKES d t)) -> Size Source #

encodedListSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy [SignKeyKES (SimpleKES d t)] -> Size Source #

KnownNat t => FromCBOR (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => FromCBOR (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

(KESAlgorithm d, HashAlgorithm h, Typeable d) => FromCBOR (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => FromCBOR (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

NFData (SignKeyDSIGN d) => NFData (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnf :: SignKeyKES (SingleKES d) -> () #

(NFData (SignKeyKES d), NFData (VerKeyKES d)) => NFData (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnf :: SignKeyKES (SumKES h d) -> () #

NoThunks (SignKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

NoThunks (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => NoThunks (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

KESAlgorithm d => NoThunks (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

DSIGNAlgorithm d => NoThunks (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

data SignKeyKES NeverKES Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (SignKeyKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (SignKeyKES NeverKES) = D1 ('MetaData "SignKeyKES" "Cardano.Crypto.KES.NeverUsed" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "NeverUsedSignKeyKES" 'PrefixI 'False) (U1 :: Type -> Type))
type Rep (SignKeyKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (SignKeyKES (MockKES t)) = D1 ('MetaData "SignKeyKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "SignKeyMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyKES (MockKES t))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Period)))
type Rep (SignKeyKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

type Rep (SignKeyKES (SingleKES d)) = D1 ('MetaData "SignKeyKES" "Cardano.Crypto.KES.Single" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "SignKeySingleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SignKeyDSIGN d))))
type Rep (SignKeyKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

type Rep (SignKeyKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

type Rep (SignKeyKES (SimpleKES d t)) = D1 ('MetaData "SignKeyKES" "Cardano.Crypto.KES.Simple" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "ThunkySignKeySimpleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Vector (SignKeyDSIGN d)))))
data SignKeyKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

newtype SignKeyKES (SingleKES d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

data SignKeyKES (SumKES h d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

newtype SignKeyKES (SimpleKES d t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

data family SigKES v :: Type Source #

Instances

Instances details
Eq (SigKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Eq (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

(==) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(/=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

DSIGNAlgorithm d => Eq (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

(==) :: SigKES (SingleKES d) -> SigKES (SingleKES d) -> Bool #

(/=) :: SigKES (SingleKES d) -> SigKES (SingleKES d) -> Bool #

KESAlgorithm d => Eq (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

(==) :: SigKES (SumKES h d) -> SigKES (SumKES h d) -> Bool #

(/=) :: SigKES (SumKES h d) -> SigKES (SumKES h d) -> Bool #

DSIGNAlgorithm d => Eq (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

(==) :: SigKES (SimpleKES d t) -> SigKES (SimpleKES d t) -> Bool #

(/=) :: SigKES (SimpleKES d t) -> SigKES (SimpleKES d t) -> Bool #

(TypeError ('Text "Ord not supported for signing keys, use the hash instead") :: Constraint) => Ord (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

compare :: SigKES (MockKES t) -> SigKES (MockKES t) -> Ordering #

(<) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(<=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(>) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

(>=) :: SigKES (MockKES t) -> SigKES (MockKES t) -> Bool #

max :: SigKES (MockKES t) -> SigKES (MockKES t) -> SigKES (MockKES t) #

min :: SigKES (MockKES t) -> SigKES (MockKES t) -> SigKES (MockKES t) #

Show (SigKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Show (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

showsPrec :: Int -> SigKES (MockKES t) -> ShowS #

show :: SigKES (MockKES t) -> String #

showList :: [SigKES (MockKES t)] -> ShowS #

DSIGNAlgorithm d => Show (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

KESAlgorithm d => Show (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

showsPrec :: Int -> SigKES (SumKES h d) -> ShowS #

show :: SigKES (SumKES h d) -> String #

showList :: [SigKES (SumKES h d)] -> ShowS #

DSIGNAlgorithm d => Show (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

showsPrec :: Int -> SigKES (SimpleKES d t) -> ShowS #

show :: SigKES (SimpleKES d t) -> String #

showList :: [SigKES (SimpleKES d t)] -> ShowS #

Generic (SigKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

Associated Types

type Rep (SigKES NeverKES) :: Type -> Type #

Generic (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Associated Types

type Rep (SigKES (MockKES t)) :: Type -> Type #

Methods

from :: SigKES (MockKES t) -> Rep (SigKES (MockKES t)) x #

to :: Rep (SigKES (MockKES t)) x -> SigKES (MockKES t) #

Generic (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Associated Types

type Rep (SigKES (SingleKES d)) :: Type -> Type #

Methods

from :: SigKES (SingleKES d) -> Rep (SigKES (SingleKES d)) x #

to :: Rep (SigKES (SingleKES d)) x -> SigKES (SingleKES d) #

Generic (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Associated Types

type Rep (SigKES (SumKES h d)) :: Type -> Type #

Methods

from :: SigKES (SumKES h d) -> Rep (SigKES (SumKES h d)) x #

to :: Rep (SigKES (SumKES h d)) x -> SigKES (SumKES h d) #

Generic (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Associated Types

type Rep (SigKES (SimpleKES d t)) :: Type -> Type #

Methods

from :: SigKES (SimpleKES d t) -> Rep (SigKES (SimpleKES d t)) x #

to :: Rep (SigKES (SimpleKES d t)) x -> SigKES (SimpleKES d t) #

KnownNat t => ToCBOR (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

Methods

toCBOR :: SigKES (MockKES t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SigKES (MockKES t)) -> Size Source #

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

DSIGNAlgorithm d => ToCBOR (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

toCBOR :: SigKES (SingleKES d) -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (SigKES (SingleKES d)) -> Size Source #

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

(KESAlgorithm d, HashAlgorithm h, Typeable d) => ToCBOR (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

toCBOR :: SigKES (SumKES h d) -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (SigKES (SumKES h d)) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [SigKES (SumKES h d)] -> Size Source #

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => ToCBOR (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

Methods

toCBOR :: SigKES (SimpleKES d t) -> Encoding Source #

encodedSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy (SigKES (SimpleKES d t)) -> Size Source #

encodedListSizeExpr :: (forall t0. ToCBOR t0 => Proxy t0 -> Size) -> Proxy [SigKES (SimpleKES d t)] -> Size Source #

KnownNat t => FromCBOR (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => FromCBOR (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

(KESAlgorithm d, HashAlgorithm h, Typeable d) => FromCBOR (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

fromCBOR :: Decoder s (SigKES (SumKES h d)) Source #

label :: Proxy (SigKES (SumKES h d)) -> Text Source #

(DSIGNAlgorithm d, Typeable d, KnownNat t, KnownNat (SeedSizeDSIGN d * t)) => FromCBOR (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

NFData (SigDSIGN d) => NFData (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

Methods

rnf :: SigKES (SingleKES d) -> () #

(NFData (SigKES d), NFData (VerKeyKES d)) => NFData (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

Methods

rnf :: SigKES (SumKES h d) -> () #

NoThunks (SigKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

NoThunks (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

DSIGNAlgorithm d => NoThunks (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

KESAlgorithm d => NoThunks (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

DSIGNAlgorithm d => NoThunks (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

data SigKES NeverKES Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (SigKES NeverKES) Source # 
Instance details

Defined in Cardano.Crypto.KES.NeverUsed

type Rep (SigKES NeverKES) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.NeverUsed" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "NeverUsedSigKES" 'PrefixI 'False) (U1 :: Type -> Type))
type Rep (SigKES (MockKES t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

type Rep (SigKES (MockKES t)) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.Mock" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "SigMockKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash MD5 ())) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SignKeyKES (MockKES t)))))
type Rep (SigKES (SingleKES d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

type Rep (SigKES (SingleKES d)) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.Single" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "SigSingleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SigDSIGN d))))
type Rep (SigKES (SumKES h d)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

type Rep (SigKES (SumKES h d)) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.Sum" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'False) (C1 ('MetaCons "SigSumKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (SigKES d)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyKES d)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (VerKeyKES d)))))
type Rep (SigKES (SimpleKES d t)) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple

type Rep (SigKES (SimpleKES d t)) = D1 ('MetaData "SigKES" "Cardano.Crypto.KES.Simple" "cardano-crypto-class-2.0.0-8Wg6S5FD924IEUDdpkXXc" 'True) (C1 ('MetaCons "SigSimpleKES" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SigDSIGN d))))
data SigKES (MockKES t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Mock

newtype SigKES (SingleKES d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Single

data SigKES (SumKES h d) Source # 
Instance details

Defined in Cardano.Crypto.KES.Sum

data SigKES (SumKES h d) = SigSumKES !(SigKES d) !(VerKeyKES d) !(VerKeyKES d)
newtype SigKES (SimpleKES d t) Source # 
Instance details

Defined in Cardano.Crypto.KES.Simple