{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE UndecidableSuperClasses #-}
{-# LANGUAGE ViewPatterns #-}
{-# OPTIONS_GHC -Wno-unticked-promoted-constructors #-}
module Ouroboros.Consensus.Protocol.Praos (
ConsensusConfig (..)
, Praos
, PraosCannotForge (..)
, PraosCrypto
, PraosFields (..)
, PraosIsLeader (..)
, PraosParams (..)
, PraosState (..)
, PraosToSign (..)
, PraosValidationErr (..)
, Ticked (..)
, forgePraosFields
, praosCheckCanForge
) where
import Cardano.Binary (FromCBOR (..), ToCBOR (..), enforceSize)
import qualified Cardano.Crypto.DSIGN as DSIGN
import qualified Cardano.Crypto.KES as KES
import Cardano.Crypto.VRF (hashVerKeyVRF)
import qualified Cardano.Crypto.VRF as VRF
import Cardano.Ledger.BaseTypes (ActiveSlotCoeff, Nonce, (⭒))
import qualified Cardano.Ledger.BaseTypes as SL
import Cardano.Ledger.Crypto (Crypto, DSIGN, KES, StandardCrypto, VRF)
import Cardano.Ledger.Hashes (EraIndependentTxBody)
import Cardano.Ledger.Keys (KeyHash, KeyRole (BlockIssuer),
VKey (VKey), coerceKeyRole, hashKey)
import qualified Cardano.Ledger.Keys as SL
import Cardano.Ledger.PoolDistr
(IndividualPoolStake (IndividualPoolStake))
import Cardano.Ledger.Shelley.API (computeStabilityWindow)
import qualified Cardano.Ledger.Shelley.API as SL
import Cardano.Ledger.Slot (Duration (Duration), (+*))
import Cardano.Protocol.TPraos.BHeader (BoundedNatural (bvValue),
checkLeaderNatValue, prevHashToNonce)
import Cardano.Protocol.TPraos.OCert (KESPeriod (KESPeriod),
OCert (OCert), OCertSignable)
import qualified Cardano.Protocol.TPraos.OCert as OCert
import Cardano.Slotting.EpochInfo (EpochInfo, epochInfoEpoch,
epochInfoFirst, hoistEpochInfo)
import Cardano.Slotting.Slot (EpochNo (EpochNo), SlotNo (SlotNo),
WithOrigin, unSlotNo)
import Cardano.Slotting.Time (SystemStart)
import qualified Codec.CBOR.Encoding as CBOR
import Codec.Serialise (Serialise (decode, encode))
import Control.Exception (throw)
import Control.Monad (unless)
import Control.Monad.Except (Except, runExcept, throwError)
import Data.Coerce (coerce)
import Data.Functor.Identity (runIdentity)
import Data.Map.Strict (Map)
import qualified Data.Map.Strict as Map
import Data.Proxy (Proxy (Proxy))
import qualified Data.Set as Set
import Data.Word (Word64)
import GHC.Generics (Generic)
import NoThunks.Class (NoThunks)
import Numeric.Natural (Natural)
import Ouroboros.Consensus.Block (WithOrigin (NotOrigin))
import qualified Ouroboros.Consensus.HardFork.History as History
import Ouroboros.Consensus.Protocol.Abstract
import Ouroboros.Consensus.Protocol.Ledger.HotKey (HotKey)
import qualified Ouroboros.Consensus.Protocol.Ledger.HotKey as HotKey
import Ouroboros.Consensus.Protocol.Ledger.Util (isNewEpoch)
import Ouroboros.Consensus.Protocol.Praos.Common
import Ouroboros.Consensus.Protocol.Praos.Header (HeaderBody)
import Ouroboros.Consensus.Protocol.Praos.VRF (InputVRF, mkInputVRF,
vrfLeaderValue, vrfNonceValue)
import qualified Ouroboros.Consensus.Protocol.Praos.Views as Views
import Ouroboros.Consensus.Protocol.TPraos
(ConsensusConfig (TPraosConfig, tpraosEpochInfo, tpraosParams))
import Ouroboros.Consensus.Ticked (Ticked)
import Ouroboros.Consensus.Util.Versioned (VersionDecoder (Decode),
decodeVersion, encodeVersion)
data Praos c
class
( Crypto c,
DSIGN.Signable (DSIGN c) (OCertSignable c),
DSIGN.Signable (DSIGN c) (SL.Hash c EraIndependentTxBody),
KES.Signable (KES c) (HeaderBody c),
VRF.Signable (VRF c) InputVRF
) =>
PraosCrypto c
instance PraosCrypto StandardCrypto
data PraosFields c toSign = PraosFields
{ PraosFields c toSign -> SignedKES c toSign
praosSignature :: SL.SignedKES c toSign,
PraosFields c toSign -> toSign
praosToSign :: toSign
}
deriving ((forall x. PraosFields c toSign -> Rep (PraosFields c toSign) x)
-> (forall x. Rep (PraosFields c toSign) x -> PraosFields c toSign)
-> Generic (PraosFields c toSign)
forall x. Rep (PraosFields c toSign) x -> PraosFields c toSign
forall x. PraosFields c toSign -> Rep (PraosFields c toSign) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c toSign x.
Rep (PraosFields c toSign) x -> PraosFields c toSign
forall c toSign x.
PraosFields c toSign -> Rep (PraosFields c toSign) x
$cto :: forall c toSign x.
Rep (PraosFields c toSign) x -> PraosFields c toSign
$cfrom :: forall c toSign x.
PraosFields c toSign -> Rep (PraosFields c toSign) x
Generic)
deriving instance
(NoThunks toSign, PraosCrypto c) =>
NoThunks (PraosFields c toSign)
deriving instance
(Show toSign, PraosCrypto c) =>
Show (PraosFields c toSign)
data PraosToSign c = PraosToSign
{
PraosToSign c -> VKey 'BlockIssuer c
praosToSignIssuerVK :: SL.VKey 'SL.BlockIssuer c,
PraosToSign c -> VerKeyVRF c
praosToSignVrfVK :: SL.VerKeyVRF c,
PraosToSign c -> CertifiedVRF c InputVRF
praosToSignVrfRes :: SL.CertifiedVRF c InputVRF,
PraosToSign c -> OCert c
praosToSignOCert :: OCert.OCert c
}
deriving ((forall x. PraosToSign c -> Rep (PraosToSign c) x)
-> (forall x. Rep (PraosToSign c) x -> PraosToSign c)
-> Generic (PraosToSign c)
forall x. Rep (PraosToSign c) x -> PraosToSign c
forall x. PraosToSign c -> Rep (PraosToSign c) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x. Rep (PraosToSign c) x -> PraosToSign c
forall c x. PraosToSign c -> Rep (PraosToSign c) x
$cto :: forall c x. Rep (PraosToSign c) x -> PraosToSign c
$cfrom :: forall c x. PraosToSign c -> Rep (PraosToSign c) x
Generic)
instance PraosCrypto c => NoThunks (PraosToSign c)
deriving instance PraosCrypto c => Show (PraosToSign c)
forgePraosFields ::
( PraosCrypto c,
SL.KESignable c toSign,
Monad m
) =>
HotKey c m ->
CanBeLeader (Praos c) ->
IsLeader (Praos c) ->
(PraosToSign c -> toSign) ->
m (PraosFields c toSign)
forgePraosFields :: HotKey c m
-> CanBeLeader (Praos c)
-> IsLeader (Praos c)
-> (PraosToSign c -> toSign)
-> m (PraosFields c toSign)
forgePraosFields
HotKey c m
hotKey
PraosCanBeLeader
{ praosCanBeLeaderColdVerKey,
praosCanBeLeaderSignKeyVRF,
praosCanBeLeaderOpCert
}
PraosIsLeader {praosIsLeaderVrfRes}
PraosToSign c -> toSign
mkToSign = do
SignedKES (KES c) toSign
signature <- HotKey c m -> toSign -> m (SignedKES (KES c) toSign)
forall c toSign (m :: * -> *).
(KESignable c toSign, HasCallStack) =>
HotKey c m -> toSign -> m (SignedKES c toSign)
HotKey.sign HotKey c m
hotKey toSign
toSign
PraosFields c toSign -> m (PraosFields c toSign)
forall (m :: * -> *) a. Monad m => a -> m a
return
PraosFields :: forall c toSign.
SignedKES c toSign -> toSign -> PraosFields c toSign
PraosFields
{ praosSignature :: SignedKES (KES c) toSign
praosSignature = SignedKES (KES c) toSign
signature,
praosToSign :: toSign
praosToSign = toSign
toSign
}
where
toSign :: toSign
toSign = PraosToSign c -> toSign
mkToSign PraosToSign c
signedFields
signedFields :: PraosToSign c
signedFields =
PraosToSign :: forall c.
VKey 'BlockIssuer c
-> VerKeyVRF c
-> CertifiedVRF c InputVRF
-> OCert c
-> PraosToSign c
PraosToSign
{ praosToSignIssuerVK :: VKey 'BlockIssuer c
praosToSignIssuerVK = VKey 'BlockIssuer c
praosCanBeLeaderColdVerKey,
praosToSignVrfVK :: VerKeyVRF c
praosToSignVrfVK = SignKeyVRF (VRF c) -> VerKeyVRF c
forall v. VRFAlgorithm v => SignKeyVRF v -> VerKeyVRF v
VRF.deriveVerKeyVRF SignKeyVRF (VRF c)
praosCanBeLeaderSignKeyVRF,
praosToSignVrfRes :: CertifiedVRF c InputVRF
praosToSignVrfRes = CertifiedVRF c InputVRF
praosIsLeaderVrfRes,
praosToSignOCert :: OCert c
praosToSignOCert = OCert c
praosCanBeLeaderOpCert
}
data PraosParams = PraosParams
{
PraosParams -> Word64
praosSlotsPerKESPeriod :: !Word64,
PraosParams -> ActiveSlotCoeff
praosLeaderF :: !SL.ActiveSlotCoeff,
PraosParams -> SecurityParam
praosSecurityParam :: !SecurityParam,
PraosParams -> Word64
praosMaxKESEvo :: !Word64,
PraosParams -> Word64
praosQuorum :: !Word64,
PraosParams -> MaxMajorProtVer
praosMaxMajorPV :: !MaxMajorProtVer,
PraosParams -> Word64
praosMaxLovelaceSupply :: !Word64,
PraosParams -> Network
praosNetworkId :: !SL.Network,
PraosParams -> SystemStart
praosSystemStart :: !SystemStart
}
deriving ((forall x. PraosParams -> Rep PraosParams x)
-> (forall x. Rep PraosParams x -> PraosParams)
-> Generic PraosParams
forall x. Rep PraosParams x -> PraosParams
forall x. PraosParams -> Rep PraosParams x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep PraosParams x -> PraosParams
$cfrom :: forall x. PraosParams -> Rep PraosParams x
Generic, Context -> PraosParams -> IO (Maybe ThunkInfo)
Proxy PraosParams -> String
(Context -> PraosParams -> IO (Maybe ThunkInfo))
-> (Context -> PraosParams -> IO (Maybe ThunkInfo))
-> (Proxy PraosParams -> String)
-> NoThunks PraosParams
forall a.
(Context -> a -> IO (Maybe ThunkInfo))
-> (Context -> a -> IO (Maybe ThunkInfo))
-> (Proxy a -> String)
-> NoThunks a
showTypeOf :: Proxy PraosParams -> String
$cshowTypeOf :: Proxy PraosParams -> String
wNoThunks :: Context -> PraosParams -> IO (Maybe ThunkInfo)
$cwNoThunks :: Context -> PraosParams -> IO (Maybe ThunkInfo)
noThunks :: Context -> PraosParams -> IO (Maybe ThunkInfo)
$cnoThunks :: Context -> PraosParams -> IO (Maybe ThunkInfo)
NoThunks)
newtype PraosIsLeader c = PraosIsLeader
{ PraosIsLeader c -> CertifiedVRF c InputVRF
praosIsLeaderVrfRes :: SL.CertifiedVRF c InputVRF
}
deriving ((forall x. PraosIsLeader c -> Rep (PraosIsLeader c) x)
-> (forall x. Rep (PraosIsLeader c) x -> PraosIsLeader c)
-> Generic (PraosIsLeader c)
forall x. Rep (PraosIsLeader c) x -> PraosIsLeader c
forall x. PraosIsLeader c -> Rep (PraosIsLeader c) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x. Rep (PraosIsLeader c) x -> PraosIsLeader c
forall c x. PraosIsLeader c -> Rep (PraosIsLeader c) x
$cto :: forall c x. Rep (PraosIsLeader c) x -> PraosIsLeader c
$cfrom :: forall c x. PraosIsLeader c -> Rep (PraosIsLeader c) x
Generic)
instance PraosCrypto c => NoThunks (PraosIsLeader c)
data instance ConsensusConfig (Praos c) = PraosConfig
{ ConsensusConfig (Praos c) -> PraosParams
praosParams :: !PraosParams,
ConsensusConfig (Praos c)
-> EpochInfo (Except PastHorizonException)
praosEpochInfo :: !(EpochInfo (Except History.PastHorizonException))
}
deriving ((forall x.
ConsensusConfig (Praos c) -> Rep (ConsensusConfig (Praos c)) x)
-> (forall x.
Rep (ConsensusConfig (Praos c)) x -> ConsensusConfig (Praos c))
-> Generic (ConsensusConfig (Praos c))
forall x.
Rep (ConsensusConfig (Praos c)) x -> ConsensusConfig (Praos c)
forall x.
ConsensusConfig (Praos c) -> Rep (ConsensusConfig (Praos c)) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x.
Rep (ConsensusConfig (Praos c)) x -> ConsensusConfig (Praos c)
forall c x.
ConsensusConfig (Praos c) -> Rep (ConsensusConfig (Praos c)) x
$cto :: forall c x.
Rep (ConsensusConfig (Praos c)) x -> ConsensusConfig (Praos c)
$cfrom :: forall c x.
ConsensusConfig (Praos c) -> Rep (ConsensusConfig (Praos c)) x
Generic)
instance PraosCrypto c => NoThunks (ConsensusConfig (Praos c))
type PraosValidateView c = Views.HeaderView c
newtype instance Ticked (Views.LedgerView c) = TickedPraosLedgerView
{ Ticked (LedgerView c) -> LedgerView c
getTickedPraosLedgerView :: Views.LedgerView c }
data PraosState c = PraosState
{ PraosState c -> WithOrigin SlotNo
praosStateLastSlot :: !(WithOrigin SlotNo),
PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters :: !(Map (KeyHash 'BlockIssuer c) Word64),
PraosState c -> Nonce
praosStateEvolvingNonce :: !Nonce,
PraosState c -> Nonce
praosStateCandidateNonce :: !Nonce,
PraosState c -> Nonce
praosStateEpochNonce :: !Nonce,
PraosState c -> Nonce
praosStateLabNonce :: !Nonce,
PraosState c -> Nonce
praosStateLastEpochBlockNonce :: !Nonce
}
deriving ((forall x. PraosState c -> Rep (PraosState c) x)
-> (forall x. Rep (PraosState c) x -> PraosState c)
-> Generic (PraosState c)
forall x. Rep (PraosState c) x -> PraosState c
forall x. PraosState c -> Rep (PraosState c) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x. Rep (PraosState c) x -> PraosState c
forall c x. PraosState c -> Rep (PraosState c) x
$cto :: forall c x. Rep (PraosState c) x -> PraosState c
$cfrom :: forall c x. PraosState c -> Rep (PraosState c) x
Generic, Int -> PraosState c -> ShowS
[PraosState c] -> ShowS
PraosState c -> String
(Int -> PraosState c -> ShowS)
-> (PraosState c -> String)
-> ([PraosState c] -> ShowS)
-> Show (PraosState c)
forall c. Int -> PraosState c -> ShowS
forall c. [PraosState c] -> ShowS
forall c. PraosState c -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PraosState c] -> ShowS
$cshowList :: forall c. [PraosState c] -> ShowS
show :: PraosState c -> String
$cshow :: forall c. PraosState c -> String
showsPrec :: Int -> PraosState c -> ShowS
$cshowsPrec :: forall c. Int -> PraosState c -> ShowS
Show, PraosState c -> PraosState c -> Bool
(PraosState c -> PraosState c -> Bool)
-> (PraosState c -> PraosState c -> Bool) -> Eq (PraosState c)
forall c. PraosState c -> PraosState c -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PraosState c -> PraosState c -> Bool
$c/= :: forall c. PraosState c -> PraosState c -> Bool
== :: PraosState c -> PraosState c -> Bool
$c== :: forall c. PraosState c -> PraosState c -> Bool
Eq)
instance PraosCrypto c => NoThunks (PraosState c)
instance PraosCrypto c => ToCBOR (PraosState c) where
toCBOR :: PraosState c -> Encoding
toCBOR = PraosState c -> Encoding
forall a. Serialise a => a -> Encoding
encode
instance PraosCrypto c => FromCBOR (PraosState c) where
fromCBOR :: Decoder s (PraosState c)
fromCBOR = Decoder s (PraosState c)
forall a s. Serialise a => Decoder s a
decode
instance PraosCrypto c => Serialise (PraosState c) where
encode :: PraosState c -> Encoding
encode
PraosState
{ WithOrigin SlotNo
praosStateLastSlot :: WithOrigin SlotNo
praosStateLastSlot :: forall c. PraosState c -> WithOrigin SlotNo
praosStateLastSlot,
Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters :: Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters :: forall c. PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters,
Nonce
praosStateEvolvingNonce :: Nonce
praosStateEvolvingNonce :: forall c. PraosState c -> Nonce
praosStateEvolvingNonce,
Nonce
praosStateCandidateNonce :: Nonce
praosStateCandidateNonce :: forall c. PraosState c -> Nonce
praosStateCandidateNonce,
Nonce
praosStateEpochNonce :: Nonce
praosStateEpochNonce :: forall c. PraosState c -> Nonce
praosStateEpochNonce,
Nonce
praosStateLabNonce :: Nonce
praosStateLabNonce :: forall c. PraosState c -> Nonce
praosStateLabNonce,
Nonce
praosStateLastEpochBlockNonce :: Nonce
praosStateLastEpochBlockNonce :: forall c. PraosState c -> Nonce
praosStateLastEpochBlockNonce
} =
VersionNumber -> Encoding -> Encoding
encodeVersion VersionNumber
0 (Encoding -> Encoding) -> Encoding -> Encoding
forall a b. (a -> b) -> a -> b
$
[Encoding] -> Encoding
forall a. Monoid a => [a] -> a
mconcat
[ Word -> Encoding
CBOR.encodeListLen Word
7,
WithOrigin SlotNo -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR WithOrigin SlotNo
praosStateLastSlot,
Map (KeyHash 'BlockIssuer c) Word64 -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters,
Nonce -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Nonce
praosStateEvolvingNonce,
Nonce -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Nonce
praosStateCandidateNonce,
Nonce -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Nonce
praosStateEpochNonce,
Nonce -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Nonce
praosStateLabNonce,
Nonce -> Encoding
forall a. ToCBOR a => a -> Encoding
toCBOR Nonce
praosStateLastEpochBlockNonce
]
decode :: Decoder s (PraosState c)
decode =
[(VersionNumber, VersionDecoder (PraosState c))]
-> forall s. Decoder s (PraosState c)
forall a.
[(VersionNumber, VersionDecoder a)] -> forall s. Decoder s a
decodeVersion
[(VersionNumber
0, (forall s. Decoder s (PraosState c))
-> VersionDecoder (PraosState c)
forall a. (forall s. Decoder s a) -> VersionDecoder a
Decode forall s. Decoder s (PraosState c)
decodePraosState)]
where
decodePraosState :: Decoder s (PraosState c)
decodePraosState = do
Text -> Int -> Decoder s ()
forall s. Text -> Int -> Decoder s ()
enforceSize Text
"PraosState" Int
7
WithOrigin SlotNo
-> Map (KeyHash 'BlockIssuer c) Word64
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> PraosState c
forall c.
WithOrigin SlotNo
-> Map (KeyHash 'BlockIssuer c) Word64
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> PraosState c
PraosState
(WithOrigin SlotNo
-> Map (KeyHash 'BlockIssuer c) Word64
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> Nonce
-> PraosState c)
-> Decoder s (WithOrigin SlotNo)
-> Decoder
s
(Map (KeyHash 'BlockIssuer c) Word64
-> Nonce -> Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Decoder s (WithOrigin SlotNo)
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder
s
(Map (KeyHash 'BlockIssuer c) Word64
-> Nonce -> Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
-> Decoder s (Map (KeyHash 'BlockIssuer c) Word64)
-> Decoder
s (Nonce -> Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s (Map (KeyHash 'BlockIssuer c) Word64)
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder
s (Nonce -> Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
-> Decoder s Nonce
-> Decoder s (Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s Nonce
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder s (Nonce -> Nonce -> Nonce -> Nonce -> PraosState c)
-> Decoder s Nonce
-> Decoder s (Nonce -> Nonce -> Nonce -> PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s Nonce
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder s (Nonce -> Nonce -> Nonce -> PraosState c)
-> Decoder s Nonce -> Decoder s (Nonce -> Nonce -> PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s Nonce
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder s (Nonce -> Nonce -> PraosState c)
-> Decoder s Nonce -> Decoder s (Nonce -> PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s Nonce
forall a s. FromCBOR a => Decoder s a
fromCBOR
Decoder s (Nonce -> PraosState c)
-> Decoder s Nonce -> Decoder s (PraosState c)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Decoder s Nonce
forall a s. FromCBOR a => Decoder s a
fromCBOR
data instance Ticked (PraosState c) = TickedPraosState
{ Ticked (PraosState c) -> PraosState c
tickedPraosStateChainDepState :: PraosState c,
Ticked (PraosState c) -> Ticked (LedgerView c)
tickedPraosStateLedgerView :: Ticked (Views.LedgerView c)
}
data PraosValidationErr c
= VRFKeyUnknown
!(KeyHash SL.StakePool c)
| VRFKeyWrongVRFKey
!(KeyHash SL.StakePool c)
!(SL.Hash c (SL.VerKeyVRF c))
!(SL.Hash c (SL.VerKeyVRF c))
| VRFKeyBadProof
!SlotNo
!Nonce
!(VRF.CertifiedVRF (VRF c) InputVRF)
| VRFLeaderValueTooBig Natural Rational ActiveSlotCoeff
| KESBeforeStartOCERT
!KESPeriod
!KESPeriod
| KESAfterEndOCERT
!KESPeriod
!KESPeriod
!Word64
| CounterTooSmallOCERT
!Word64
!Word64
|
CounterOverIncrementedOCERT
!Word64
!Word64
| InvalidSignatureOCERT
!Word64
!KESPeriod
!String
| InvalidKesSignatureOCERT
!Word
!Word
!Word
!String
| NoCounterForKeyHashOCERT
!(KeyHash 'BlockIssuer c)
deriving ((forall x. PraosValidationErr c -> Rep (PraosValidationErr c) x)
-> (forall x. Rep (PraosValidationErr c) x -> PraosValidationErr c)
-> Generic (PraosValidationErr c)
forall x. Rep (PraosValidationErr c) x -> PraosValidationErr c
forall x. PraosValidationErr c -> Rep (PraosValidationErr c) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x. Rep (PraosValidationErr c) x -> PraosValidationErr c
forall c x. PraosValidationErr c -> Rep (PraosValidationErr c) x
$cto :: forall c x. Rep (PraosValidationErr c) x -> PraosValidationErr c
$cfrom :: forall c x. PraosValidationErr c -> Rep (PraosValidationErr c) x
Generic)
deriving instance PraosCrypto c => Eq (PraosValidationErr c)
deriving instance PraosCrypto c => NoThunks (PraosValidationErr c)
deriving instance PraosCrypto c => Show (PraosValidationErr c)
instance PraosCrypto c => ConsensusProtocol (Praos c) where
type ChainDepState _ = PraosState c
type IsLeader _ = PraosIsLeader c
type CanBeLeader _ = PraosCanBeLeader c
type SelectView _ = PraosChainSelectView c
type LedgerView _ = Views.LedgerView c
type ValidationErr _ = PraosValidationErr c
type ValidateView _ = PraosValidateView c
protocolSecurityParam :: ConsensusConfig (Praos c) -> SecurityParam
protocolSecurityParam = PraosParams -> SecurityParam
praosSecurityParam (PraosParams -> SecurityParam)
-> (ConsensusConfig (Praos c) -> PraosParams)
-> ConsensusConfig (Praos c)
-> SecurityParam
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ConsensusConfig (Praos c) -> PraosParams
forall c. ConsensusConfig (Praos c) -> PraosParams
praosParams
checkIsLeader :: ConsensusConfig (Praos c)
-> CanBeLeader (Praos c)
-> SlotNo
-> Ticked (ChainDepState (Praos c))
-> Maybe (IsLeader (Praos c))
checkIsLeader
ConsensusConfig (Praos c)
cfg
PraosCanBeLeader
{ praosCanBeLeaderSignKeyVRF,
praosCanBeLeaderColdVerKey
}
SlotNo
slot
Ticked (ChainDepState (Praos c))
cs =
if ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> KeyHash 'StakePool c
-> CertifiedVRF (VRF c) InputVRF
-> Bool
forall c.
PraosCrypto c =>
ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> KeyHash 'StakePool c
-> CertifiedVRF (VRF c) InputVRF
-> Bool
meetsLeaderThreshold ConsensusConfig (Praos c)
cfg LedgerView (Praos c)
LedgerView c
lv (KeyHash 'BlockIssuer c -> KeyHash 'StakePool c
forall (a :: KeyRole -> * -> *) (r :: KeyRole) crypto
(r' :: KeyRole).
HasKeyRole a =>
a r crypto -> a r' crypto
SL.coerceKeyRole KeyHash 'BlockIssuer c
vkhCold) CertifiedVRF (VRF c) InputVRF
rho
then
PraosIsLeader c -> Maybe (PraosIsLeader c)
forall a. a -> Maybe a
Just
PraosIsLeader :: forall c. CertifiedVRF c InputVRF -> PraosIsLeader c
PraosIsLeader
{ praosIsLeaderVrfRes :: CertifiedVRF (VRF c) InputVRF
praosIsLeaderVrfRes = CertifiedVRF (VRF c) InputVRF -> CertifiedVRF (VRF c) InputVRF
coerce CertifiedVRF (VRF c) InputVRF
rho
}
else Maybe (IsLeader (Praos c))
forall a. Maybe a
Nothing
where
chainState :: PraosState c
chainState = Ticked (PraosState c) -> PraosState c
forall c. Ticked (PraosState c) -> PraosState c
tickedPraosStateChainDepState Ticked (ChainDepState (Praos c))
Ticked (PraosState c)
cs
lv :: LedgerView c
lv = Ticked (LedgerView c) -> LedgerView c
forall c. Ticked (LedgerView c) -> LedgerView c
getTickedPraosLedgerView (Ticked (LedgerView c) -> LedgerView c)
-> Ticked (LedgerView c) -> LedgerView c
forall a b. (a -> b) -> a -> b
$ Ticked (PraosState c) -> Ticked (LedgerView c)
forall c. Ticked (PraosState c) -> Ticked (LedgerView c)
tickedPraosStateLedgerView Ticked (ChainDepState (Praos c))
Ticked (PraosState c)
cs
eta0 :: Nonce
eta0 = PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateEpochNonce PraosState c
chainState
vkhCold :: KeyHash 'BlockIssuer c
vkhCold = VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall crypto (kd :: KeyRole).
Crypto crypto =>
VKey kd crypto -> KeyHash kd crypto
SL.hashKey VKey 'BlockIssuer c
praosCanBeLeaderColdVerKey
rho' :: InputVRF
rho' = SlotNo -> Nonce -> InputVRF
mkInputVRF SlotNo
slot Nonce
eta0
rho :: CertifiedVRF (VRF c) InputVRF
rho = ContextVRF (VRF c)
-> InputVRF -> SignKeyVRF (VRF c) -> CertifiedVRF (VRF c) InputVRF
forall v a.
(VRFAlgorithm v, Signable v a) =>
ContextVRF v -> a -> SignKeyVRF v -> CertifiedVRF v a
VRF.evalCertified () InputVRF
rho' SignKeyVRF (VRF c)
praosCanBeLeaderSignKeyVRF
tickChainDepState :: ConsensusConfig (Praos c)
-> Ticked (LedgerView (Praos c))
-> SlotNo
-> ChainDepState (Praos c)
-> Ticked (ChainDepState (Praos c))
tickChainDepState
PraosConfig {praosEpochInfo}
(TickedPraosLedgerView lv)
SlotNo
slot
ChainDepState (Praos c)
st =
TickedPraosState :: forall c.
PraosState c -> Ticked (LedgerView c) -> Ticked (PraosState c)
TickedPraosState
{ tickedPraosStateChainDepState :: PraosState c
tickedPraosStateChainDepState = PraosState c
st',
tickedPraosStateLedgerView :: Ticked (LedgerView c)
tickedPraosStateLedgerView = LedgerView c -> Ticked (LedgerView c)
forall c. LedgerView c -> Ticked (LedgerView c)
TickedPraosLedgerView LedgerView c
lv
}
where
newEpoch :: Bool
newEpoch =
EpochInfo Identity -> WithOrigin SlotNo -> SlotNo -> Bool
isNewEpoch
(EpochInfo (Except PastHorizonException) -> EpochInfo Identity
forall (f :: * -> *).
Applicative f =>
EpochInfo (Except PastHorizonException) -> EpochInfo f
History.toPureEpochInfo EpochInfo (Except PastHorizonException)
praosEpochInfo)
(PraosState c -> WithOrigin SlotNo
forall c. PraosState c -> WithOrigin SlotNo
praosStateLastSlot ChainDepState (Praos c)
PraosState c
st)
SlotNo
slot
st' :: PraosState c
st' =
if Bool
newEpoch
then
ChainDepState (Praos c)
PraosState c
st
{ praosStateEpochNonce :: Nonce
praosStateEpochNonce =
PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateCandidateNonce ChainDepState (Praos c)
PraosState c
st
Nonce -> Nonce -> Nonce
⭒ PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateLastEpochBlockNonce ChainDepState (Praos c)
PraosState c
st,
praosStateLastEpochBlockNonce :: Nonce
praosStateLastEpochBlockNonce = PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateLabNonce ChainDepState (Praos c)
PraosState c
st
}
else ChainDepState (Praos c)
PraosState c
st
updateChainDepState :: ConsensusConfig (Praos c)
-> ValidateView (Praos c)
-> SlotNo
-> Ticked (ChainDepState (Praos c))
-> Except (ValidationErr (Praos c)) (ChainDepState (Praos c))
updateChainDepState
cfg :: ConsensusConfig (Praos c)
cfg@( PraosConfig
PraosParams {praosLeaderF}
_
)
ValidateView (Praos c)
b
SlotNo
slot
Ticked (ChainDepState (Praos c))
tcs = do
ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> Map (KeyHash 'BlockIssuer c) Word64
-> HeaderView c
-> Except (PraosValidationErr c) ()
forall c.
PraosCrypto c =>
ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> Map (KeyHash 'BlockIssuer c) Word64
-> HeaderView c
-> Except (PraosValidationErr c) ()
validateKESSignature ConsensusConfig (Praos c)
cfg LedgerView (Praos c)
LedgerView c
lv (PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
forall c. PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters PraosState c
cs) ValidateView (Praos c)
HeaderView c
b
Nonce
-> LedgerView c
-> ActiveSlotCoeff
-> HeaderView c
-> Except (PraosValidationErr c) ()
forall c.
PraosCrypto c =>
Nonce
-> LedgerView c
-> ActiveSlotCoeff
-> HeaderView c
-> Except (PraosValidationErr c) ()
validateVRFSignature (PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateEpochNonce PraosState c
cs) LedgerView c
lv ActiveSlotCoeff
praosLeaderF ValidateView (Praos c)
HeaderView c
b
PraosState c
-> ExceptT (PraosValidationErr c) Identity (PraosState c)
forall (f :: * -> *) a. Applicative f => a -> f a
pure (PraosState c
-> ExceptT (PraosValidationErr c) Identity (PraosState c))
-> PraosState c
-> ExceptT (PraosValidationErr c) Identity (PraosState c)
forall a b. (a -> b) -> a -> b
$ ConsensusConfig (Praos c)
-> ValidateView (Praos c)
-> SlotNo
-> Ticked (ChainDepState (Praos c))
-> ChainDepState (Praos c)
forall p.
(ConsensusProtocol p, HasCallStack) =>
ConsensusConfig p
-> ValidateView p
-> SlotNo
-> Ticked (ChainDepState p)
-> ChainDepState p
reupdateChainDepState ConsensusConfig (Praos c)
cfg ValidateView (Praos c)
b SlotNo
slot Ticked (ChainDepState (Praos c))
tcs
where
lv :: LedgerView c
lv = Ticked (LedgerView c) -> LedgerView c
forall c. Ticked (LedgerView c) -> LedgerView c
getTickedPraosLedgerView (Ticked (PraosState c) -> Ticked (LedgerView c)
forall c. Ticked (PraosState c) -> Ticked (LedgerView c)
tickedPraosStateLedgerView Ticked (ChainDepState (Praos c))
Ticked (PraosState c)
tcs)
cs :: PraosState c
cs = Ticked (PraosState c) -> PraosState c
forall c. Ticked (PraosState c) -> PraosState c
tickedPraosStateChainDepState Ticked (ChainDepState (Praos c))
Ticked (PraosState c)
tcs
reupdateChainDepState :: ConsensusConfig (Praos c)
-> ValidateView (Praos c)
-> SlotNo
-> Ticked (ChainDepState (Praos c))
-> ChainDepState (Praos c)
reupdateChainDepState
_cfg :: ConsensusConfig (Praos c)
_cfg@( PraosConfig
PraosParams {praosSecurityParam, praosLeaderF}
ei
)
ValidateView (Praos c)
b
SlotNo
slot
Ticked (ChainDepState (Praos c))
tcs =
PraosState c
cs
{ praosStateLastSlot :: WithOrigin SlotNo
praosStateLastSlot = SlotNo -> WithOrigin SlotNo
forall t. t -> WithOrigin t
NotOrigin SlotNo
slot,
praosStateLabNonce :: Nonce
praosStateLabNonce = PrevHash c -> Nonce
forall crypto. PrevHash crypto -> Nonce
prevHashToNonce (HeaderView c -> PrevHash c
forall crypto. HeaderView crypto -> PrevHash crypto
Views.hvPrevHash ValidateView (Praos c)
HeaderView c
b),
praosStateEvolvingNonce :: Nonce
praosStateEvolvingNonce = Nonce
newEvolvingNonce,
praosStateCandidateNonce :: Nonce
praosStateCandidateNonce =
if SlotNo
slot SlotNo -> Duration -> SlotNo
+* Word64 -> Duration
Duration Word64
stabilityWindow SlotNo -> SlotNo -> Bool
forall a. Ord a => a -> a -> Bool
< SlotNo
firstSlotNextEpoch
then Nonce
newEvolvingNonce
else PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateCandidateNonce PraosState c
cs,
praosStateOCertCounters :: Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters =
KeyHash 'BlockIssuer c
-> Word64
-> Map (KeyHash 'BlockIssuer c) Word64
-> Map (KeyHash 'BlockIssuer c) Word64
forall k a. Ord k => k -> a -> Map k a -> Map k a
Map.insert KeyHash 'BlockIssuer c
hk Word64
n (Map (KeyHash 'BlockIssuer c) Word64
-> Map (KeyHash 'BlockIssuer c) Word64)
-> Map (KeyHash 'BlockIssuer c) Word64
-> Map (KeyHash 'BlockIssuer c) Word64
forall a b. (a -> b) -> a -> b
$ PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
forall c. PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters PraosState c
cs
}
where
epochInfoWithErr :: EpochInfo Identity
epochInfoWithErr =
(forall a. Except PastHorizonException a -> Identity a)
-> EpochInfo (Except PastHorizonException) -> EpochInfo Identity
forall (m :: * -> *) (n :: * -> *).
(forall a. m a -> n a) -> EpochInfo m -> EpochInfo n
hoistEpochInfo
((PastHorizonException -> Identity a)
-> (a -> Identity a) -> Either PastHorizonException a -> Identity a
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either PastHorizonException -> Identity a
forall a e. Exception e => e -> a
throw a -> Identity a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (Either PastHorizonException a -> Identity a)
-> (Except PastHorizonException a -> Either PastHorizonException a)
-> Except PastHorizonException a
-> Identity a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Except PastHorizonException a -> Either PastHorizonException a
forall e a. Except e a -> Either e a
runExcept)
EpochInfo (Except PastHorizonException)
ei
firstSlotNextEpoch :: SlotNo
firstSlotNextEpoch = Identity SlotNo -> SlotNo
forall a. Identity a -> a
runIdentity (Identity SlotNo -> SlotNo) -> Identity SlotNo -> SlotNo
forall a b. (a -> b) -> a -> b
$ do
EpochNo Word64
currentEpochNo <- EpochInfo Identity -> SlotNo -> Identity EpochNo
forall (m :: * -> *).
HasCallStack =>
EpochInfo m -> SlotNo -> m EpochNo
epochInfoEpoch EpochInfo Identity
epochInfoWithErr SlotNo
slot
let nextEpoch :: EpochNo
nextEpoch = Word64 -> EpochNo
EpochNo (Word64 -> EpochNo) -> Word64 -> EpochNo
forall a b. (a -> b) -> a -> b
$ Word64
currentEpochNo Word64 -> Word64 -> Word64
forall a. Num a => a -> a -> a
+ Word64
1
EpochInfo Identity -> EpochNo -> Identity SlotNo
forall (m :: * -> *).
HasCallStack =>
EpochInfo m -> EpochNo -> m SlotNo
epochInfoFirst EpochInfo Identity
epochInfoWithErr EpochNo
nextEpoch
cs :: PraosState c
cs = Ticked (PraosState c) -> PraosState c
forall c. Ticked (PraosState c) -> PraosState c
tickedPraosStateChainDepState Ticked (ChainDepState (Praos c))
Ticked (PraosState c)
tcs
stabilityWindow :: Word64
stabilityWindow =
Word64 -> ActiveSlotCoeff -> Word64
computeStabilityWindow (SecurityParam -> Word64
maxRollbacks SecurityParam
praosSecurityParam) ActiveSlotCoeff
praosLeaderF
eta :: Nonce
eta = Proxy c -> CertifiedVRF (VRF c) InputVRF -> Nonce
forall c (proxy :: * -> *).
Crypto c =>
proxy c -> CertifiedVRF (VRF c) InputVRF -> Nonce
vrfNonceValue (Proxy c
forall k (t :: k). Proxy t
Proxy @c) (CertifiedVRF (VRF c) InputVRF -> Nonce)
-> CertifiedVRF (VRF c) InputVRF -> Nonce
forall a b. (a -> b) -> a -> b
$ HeaderView c -> CertifiedVRF (VRF c) InputVRF
forall crypto.
HeaderView crypto -> CertifiedVRF (VRF crypto) InputVRF
Views.hvVrfRes ValidateView (Praos c)
HeaderView c
b
newEvolvingNonce :: Nonce
newEvolvingNonce = PraosState c -> Nonce
forall c. PraosState c -> Nonce
praosStateEvolvingNonce PraosState c
cs Nonce -> Nonce -> Nonce
⭒ Nonce
eta
OCert VerKeyKES c
_ Word64
n KESPeriod
_ SignedDSIGN c (OCertSignable c)
_ = HeaderView c -> OCert c
forall crypto. HeaderView crypto -> OCert crypto
Views.hvOCert ValidateView (Praos c)
HeaderView c
b
hk :: KeyHash 'BlockIssuer c
hk = VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall crypto (kd :: KeyRole).
Crypto crypto =>
VKey kd crypto -> KeyHash kd crypto
hashKey (VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c)
-> VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall a b. (a -> b) -> a -> b
$ HeaderView c -> VKey 'BlockIssuer c
forall crypto. HeaderView crypto -> VKey 'BlockIssuer crypto
Views.hvVK ValidateView (Praos c)
HeaderView c
b
meetsLeaderThreshold ::
forall c.
PraosCrypto c =>
ConsensusConfig (Praos c) ->
LedgerView (Praos c) ->
SL.KeyHash 'SL.StakePool c ->
VRF.CertifiedVRF (VRF c) InputVRF ->
Bool
meetsLeaderThreshold :: ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> KeyHash 'StakePool c
-> CertifiedVRF (VRF c) InputVRF
-> Bool
meetsLeaderThreshold
PraosConfig {praosParams}
Views.LedgerView {Views.lvPoolDistr}
KeyHash 'StakePool c
keyHash
CertifiedVRF (VRF c) InputVRF
rho =
BoundedNatural -> Rational -> ActiveSlotCoeff -> Bool
checkLeaderNatValue
(Proxy c -> CertifiedVRF (VRF c) InputVRF -> BoundedNatural
forall c (proxy :: * -> *).
Crypto c =>
proxy c -> CertifiedVRF (VRF c) InputVRF -> BoundedNatural
vrfLeaderValue (Proxy c
forall k (t :: k). Proxy t
Proxy @c) CertifiedVRF (VRF c) InputVRF
rho)
Rational
r
(PraosParams -> ActiveSlotCoeff
praosLeaderF PraosParams
praosParams)
where
SL.PoolDistr Map (KeyHash 'StakePool c) (IndividualPoolStake c)
poolDistr = PoolDistr c
lvPoolDistr
r :: Rational
r =
Rational
-> (IndividualPoolStake c -> Rational)
-> Maybe (IndividualPoolStake c)
-> Rational
forall b a. b -> (a -> b) -> Maybe a -> b
maybe Rational
0 IndividualPoolStake c -> Rational
forall crypto. IndividualPoolStake crypto -> Rational
SL.individualPoolStake (Maybe (IndividualPoolStake c) -> Rational)
-> Maybe (IndividualPoolStake c) -> Rational
forall a b. (a -> b) -> a -> b
$
KeyHash 'StakePool c
-> Map (KeyHash 'StakePool c) (IndividualPoolStake c)
-> Maybe (IndividualPoolStake c)
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup KeyHash 'StakePool c
keyHash Map (KeyHash 'StakePool c) (IndividualPoolStake c)
poolDistr
validateVRFSignature ::
forall c.
( PraosCrypto c
) =>
Nonce ->
Views.LedgerView c ->
ActiveSlotCoeff ->
Views.HeaderView c ->
Except (PraosValidationErr c) ()
validateVRFSignature :: Nonce
-> LedgerView c
-> ActiveSlotCoeff
-> HeaderView c
-> Except (PraosValidationErr c) ()
validateVRFSignature Nonce
eta0 (LedgerView c -> PoolDistr c
forall crypto. LedgerView crypto -> PoolDistr crypto
Views.lvPoolDistr -> SL.PoolDistr Map (KeyHash 'StakePool c) (IndividualPoolStake c)
pd) ActiveSlotCoeff
f HeaderView c
b = do
case KeyHash 'StakePool c
-> Map (KeyHash 'StakePool c) (IndividualPoolStake c)
-> Maybe (IndividualPoolStake c)
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup KeyHash 'StakePool c
hk Map (KeyHash 'StakePool c) (IndividualPoolStake c)
pd of
Maybe (IndividualPoolStake c)
Nothing -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PraosValidationErr c -> Except (PraosValidationErr c) ())
-> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall a b. (a -> b) -> a -> b
$ KeyHash 'StakePool c -> PraosValidationErr c
forall c. KeyHash 'StakePool c -> PraosValidationErr c
VRFKeyUnknown KeyHash 'StakePool c
hk
Just (IndividualPoolStake Rational
sigma Hash c (VerKeyVRF c)
vrfHK) -> do
Hash c (VerKeyVRF c)
vrfHK Hash c (VerKeyVRF c) -> Hash c (VerKeyVRF c) -> Bool
forall a. Eq a => a -> a -> Bool
== VerKeyVRF c -> Hash c (VerKeyVRF c)
forall v h.
(VRFAlgorithm v, HashAlgorithm h) =>
VerKeyVRF v -> Hash h (VerKeyVRF v)
hashVerKeyVRF VerKeyVRF c
vrfK
Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! KeyHash 'StakePool c
-> Hash c (VerKeyVRF c)
-> Hash c (VerKeyVRF c)
-> PraosValidationErr c
forall c.
KeyHash 'StakePool c
-> Hash c (VerKeyVRF c)
-> Hash c (VerKeyVRF c)
-> PraosValidationErr c
VRFKeyWrongVRFKey KeyHash 'StakePool c
hk Hash c (VerKeyVRF c)
vrfHK (VerKeyVRF c -> Hash c (VerKeyVRF c)
forall v h.
(VRFAlgorithm v, HashAlgorithm h) =>
VerKeyVRF v -> Hash h (VerKeyVRF v)
hashVerKeyVRF VerKeyVRF c
vrfK)
ContextVRF (VRF c)
-> VerKeyVRF c -> InputVRF -> CertifiedVRF (VRF c) InputVRF -> Bool
forall v a.
(VRFAlgorithm v, Signable v a) =>
ContextVRF v -> VerKeyVRF v -> a -> CertifiedVRF v a -> Bool
VRF.verifyCertified
()
VerKeyVRF c
vrfK
(SlotNo -> Nonce -> InputVRF
mkInputVRF SlotNo
slot Nonce
eta0)
CertifiedVRF (VRF c) InputVRF
vrfCert
Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! SlotNo
-> Nonce -> CertifiedVRF (VRF c) InputVRF -> PraosValidationErr c
forall c.
SlotNo
-> Nonce -> CertifiedVRF (VRF c) InputVRF -> PraosValidationErr c
VRFKeyBadProof SlotNo
slot Nonce
eta0 CertifiedVRF (VRF c) InputVRF
vrfCert
BoundedNatural -> Rational -> ActiveSlotCoeff -> Bool
checkLeaderNatValue BoundedNatural
vrfLeaderVal Rational
sigma ActiveSlotCoeff
f
Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! Natural -> Rational -> ActiveSlotCoeff -> PraosValidationErr c
forall c.
Natural -> Rational -> ActiveSlotCoeff -> PraosValidationErr c
VRFLeaderValueTooBig (BoundedNatural -> Natural
bvValue BoundedNatural
vrfLeaderVal) Rational
sigma ActiveSlotCoeff
f
where
hk :: KeyHash 'StakePool c
hk = KeyHash 'BlockIssuer c -> KeyHash 'StakePool c
forall (a :: KeyRole -> * -> *) (r :: KeyRole) crypto
(r' :: KeyRole).
HasKeyRole a =>
a r crypto -> a r' crypto
coerceKeyRole (KeyHash 'BlockIssuer c -> KeyHash 'StakePool c)
-> (HeaderView c -> KeyHash 'BlockIssuer c)
-> HeaderView c
-> KeyHash 'StakePool c
forall b c a. (b -> c) -> (a -> b) -> a -> c
. VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall crypto (kd :: KeyRole).
Crypto crypto =>
VKey kd crypto -> KeyHash kd crypto
hashKey (VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c)
-> (HeaderView c -> VKey 'BlockIssuer c)
-> HeaderView c
-> KeyHash 'BlockIssuer c
forall b c a. (b -> c) -> (a -> b) -> a -> c
. HeaderView c -> VKey 'BlockIssuer c
forall crypto. HeaderView crypto -> VKey 'BlockIssuer crypto
Views.hvVK (HeaderView c -> KeyHash 'StakePool c)
-> HeaderView c -> KeyHash 'StakePool c
forall a b. (a -> b) -> a -> b
$ HeaderView c
b
vrfK :: VerKeyVRF c
vrfK = HeaderView c -> VerKeyVRF c
forall crypto. HeaderView crypto -> VerKeyVRF (VRF crypto)
Views.hvVrfVK HeaderView c
b
vrfCert :: CertifiedVRF (VRF c) InputVRF
vrfCert = HeaderView c -> CertifiedVRF (VRF c) InputVRF
forall crypto.
HeaderView crypto -> CertifiedVRF (VRF crypto) InputVRF
Views.hvVrfRes HeaderView c
b
vrfLeaderVal :: BoundedNatural
vrfLeaderVal = Proxy c -> CertifiedVRF (VRF c) InputVRF -> BoundedNatural
forall c (proxy :: * -> *).
Crypto c =>
proxy c -> CertifiedVRF (VRF c) InputVRF -> BoundedNatural
vrfLeaderValue (Proxy c
forall k (t :: k). Proxy t
Proxy @c) CertifiedVRF (VRF c) InputVRF
vrfCert
slot :: SlotNo
slot = HeaderView c -> SlotNo
forall crypto. HeaderView crypto -> SlotNo
Views.hvSlotNo HeaderView c
b
validateKESSignature ::
PraosCrypto c =>
ConsensusConfig (Praos c) ->
LedgerView (Praos c) ->
Map (KeyHash 'BlockIssuer c) Word64 ->
Views.HeaderView c ->
Except (PraosValidationErr c) ()
validateKESSignature :: ConsensusConfig (Praos c)
-> LedgerView (Praos c)
-> Map (KeyHash 'BlockIssuer c) Word64
-> HeaderView c
-> Except (PraosValidationErr c) ()
validateKESSignature
_cfg :: ConsensusConfig (Praos c)
_cfg@( PraosConfig
PraosParams {praosMaxKESEvo, praosSlotsPerKESPeriod}
_ei
)
Views.LedgerView {Views.lvPoolDistr}
Map (KeyHash 'BlockIssuer c) Word64
ocertCounters
HeaderView c
b = do
KESPeriod
c0 KESPeriod -> KESPeriod -> Bool
forall a. Ord a => a -> a -> Bool
<= KESPeriod
kp Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! KESPeriod -> KESPeriod -> PraosValidationErr c
forall c. KESPeriod -> KESPeriod -> PraosValidationErr c
KESBeforeStartOCERT KESPeriod
c0 KESPeriod
kp
Word
kp_ Word -> Word -> Bool
forall a. Ord a => a -> a -> Bool
< Word
c0_ Word -> Word -> Word
forall a. Num a => a -> a -> a
+ Word64 -> Word
forall a b. (Integral a, Num b) => a -> b
fromIntegral Word64
praosMaxKESEvo Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! KESPeriod -> KESPeriod -> Word64 -> PraosValidationErr c
forall c. KESPeriod -> KESPeriod -> Word64 -> PraosValidationErr c
KESAfterEndOCERT KESPeriod
kp KESPeriod
c0 Word64
praosMaxKESEvo
let t :: Word
t = if Word
kp_ Word -> Word -> Bool
forall a. Ord a => a -> a -> Bool
>= Word
c0_ then Word
kp_ Word -> Word -> Word
forall a. Num a => a -> a -> a
- Word
c0_ else Word
0
ContextDSIGN (DSIGN c)
-> VerKeyDSIGN (DSIGN c)
-> OCertSignable c
-> SignedDSIGN (DSIGN c) (OCertSignable c)
-> Either String ()
forall v a.
(DSIGNAlgorithm v, Signable v a, HasCallStack) =>
ContextDSIGN v
-> VerKeyDSIGN v -> a -> SignedDSIGN v a -> Either String ()
DSIGN.verifySignedDSIGN () VerKeyDSIGN (DSIGN c)
vkcold (OCert c -> OCertSignable c
forall crypto. OCert crypto -> OCertSignable crypto
OCert.ocertToSignable OCert c
oc) SignedDSIGN (DSIGN c) (OCertSignable c)
tau Either String ()
-> (String -> PraosValidationErr c)
-> Except (PraosValidationErr c) ()
forall e1 a e2. Either e1 a -> (e1 -> e2) -> Except e2 ()
?!:
Word64 -> KESPeriod -> String -> PraosValidationErr c
forall c. Word64 -> KESPeriod -> String -> PraosValidationErr c
InvalidSignatureOCERT Word64
n KESPeriod
c0
ContextKES (KES c)
-> VerKeyKES (KES c)
-> Word
-> HeaderBody c
-> SignedKES (KES c) (HeaderBody c)
-> Either String ()
forall v a.
(KESAlgorithm v, Signable v a) =>
ContextKES v
-> VerKeyKES v -> Word -> a -> SignedKES v a -> Either String ()
KES.verifySignedKES () VerKeyKES (KES c)
vk_hot Word
t (HeaderView c -> HeaderBody c
forall crypto. HeaderView crypto -> HeaderBody crypto
Views.hvSigned HeaderView c
b) (HeaderView c -> SignedKES (KES c) (HeaderBody c)
forall crypto.
HeaderView crypto -> SignedKES (KES crypto) (HeaderBody crypto)
Views.hvSignature HeaderView c
b) Either String ()
-> (String -> PraosValidationErr c)
-> Except (PraosValidationErr c) ()
forall e1 a e2. Either e1 a -> (e1 -> e2) -> Except e2 ()
?!:
Word -> Word -> Word -> String -> PraosValidationErr c
forall c. Word -> Word -> Word -> String -> PraosValidationErr c
InvalidKesSignatureOCERT Word
kp_ Word
c0_ Word
t
case Maybe Word64
currentIssueNo of
Maybe Word64
Nothing -> do
PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PraosValidationErr c -> Except (PraosValidationErr c) ())
-> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall a b. (a -> b) -> a -> b
$ KeyHash 'BlockIssuer c -> PraosValidationErr c
forall c. KeyHash 'BlockIssuer c -> PraosValidationErr c
NoCounterForKeyHashOCERT KeyHash 'BlockIssuer c
hk
Just Word64
m -> do
Word64
m Word64 -> Word64 -> Bool
forall a. Ord a => a -> a -> Bool
<= Word64
n Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! Word64 -> Word64 -> PraosValidationErr c
forall c. Word64 -> Word64 -> PraosValidationErr c
CounterTooSmallOCERT Word64
m Word64
n
Word64
n Word64 -> Word64 -> Bool
forall a. Ord a => a -> a -> Bool
<= Word64
m Word64 -> Word64 -> Word64
forall a. Num a => a -> a -> a
+ Word64
1 Bool -> PraosValidationErr c -> Except (PraosValidationErr c) ()
forall e. Bool -> e -> Except e ()
?! Word64 -> Word64 -> PraosValidationErr c
forall c. Word64 -> Word64 -> PraosValidationErr c
CounterOverIncrementedOCERT Word64
m Word64
n
where
oc :: OCert c
oc@(OCert VerKeyKES (KES c)
vk_hot Word64
n c0 :: KESPeriod
c0@(KESPeriod Word
c0_) SignedDSIGN (DSIGN c) (OCertSignable c)
tau) = HeaderView c -> OCert c
forall crypto. HeaderView crypto -> OCert crypto
Views.hvOCert HeaderView c
b
(VKey VerKeyDSIGN (DSIGN c)
vkcold) = HeaderView c -> VKey 'BlockIssuer c
forall crypto. HeaderView crypto -> VKey 'BlockIssuer crypto
Views.hvVK HeaderView c
b
SlotNo Word64
s = HeaderView c -> SlotNo
forall crypto. HeaderView crypto -> SlotNo
Views.hvSlotNo HeaderView c
b
hk :: KeyHash 'BlockIssuer c
hk = VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall crypto (kd :: KeyRole).
Crypto crypto =>
VKey kd crypto -> KeyHash kd crypto
hashKey (VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c)
-> VKey 'BlockIssuer c -> KeyHash 'BlockIssuer c
forall a b. (a -> b) -> a -> b
$ HeaderView c -> VKey 'BlockIssuer c
forall crypto. HeaderView crypto -> VKey 'BlockIssuer crypto
Views.hvVK HeaderView c
b
kp :: KESPeriod
kp@(KESPeriod Word
kp_) =
if Word64
praosSlotsPerKESPeriod Word64 -> Word64 -> Bool
forall a. Eq a => a -> a -> Bool
== Word64
0
then String -> KESPeriod
forall a. HasCallStack => String -> a
error String
"kesPeriod: slots per KES period was set to zero"
else Word -> KESPeriod
KESPeriod (Word -> KESPeriod) -> (Word64 -> Word) -> Word64 -> KESPeriod
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Word64 -> Word
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Word64 -> KESPeriod) -> Word64 -> KESPeriod
forall a b. (a -> b) -> a -> b
$ Word64
s Word64 -> Word64 -> Word64
forall a. Integral a => a -> a -> a
`div` Word64
praosSlotsPerKESPeriod
currentIssueNo :: Maybe Word64
currentIssueNo :: Maybe Word64
currentIssueNo
| KeyHash 'BlockIssuer c
-> Map (KeyHash 'BlockIssuer c) Word64 -> Bool
forall k a. Ord k => k -> Map k a -> Bool
Map.member KeyHash 'BlockIssuer c
hk Map (KeyHash 'BlockIssuer c) Word64
ocertCounters = KeyHash 'BlockIssuer c
-> Map (KeyHash 'BlockIssuer c) Word64 -> Maybe Word64
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup KeyHash 'BlockIssuer c
hk Map (KeyHash 'BlockIssuer c) Word64
ocertCounters
| KeyHash 'StakePool c -> Set (KeyHash 'StakePool c) -> Bool
forall a. Ord a => a -> Set a -> Bool
Set.member (KeyHash 'BlockIssuer c -> KeyHash 'StakePool c
forall (a :: KeyRole -> * -> *) (r :: KeyRole) crypto
(r' :: KeyRole).
HasKeyRole a =>
a r crypto -> a r' crypto
coerceKeyRole KeyHash 'BlockIssuer c
hk) (Map (KeyHash 'StakePool c) (IndividualPoolStake c)
-> Set (KeyHash 'StakePool c)
forall k a. Map k a -> Set k
Map.keysSet (Map (KeyHash 'StakePool c) (IndividualPoolStake c)
-> Set (KeyHash 'StakePool c))
-> Map (KeyHash 'StakePool c) (IndividualPoolStake c)
-> Set (KeyHash 'StakePool c)
forall a b. (a -> b) -> a -> b
$ PoolDistr c -> Map (KeyHash 'StakePool c) (IndividualPoolStake c)
forall crypto.
PoolDistr crypto
-> Map (KeyHash 'StakePool crypto) (IndividualPoolStake crypto)
SL.unPoolDistr PoolDistr c
lvPoolDistr) =
Word64 -> Maybe Word64
forall a. a -> Maybe a
Just Word64
0
| Bool
otherwise = Maybe Word64
forall a. Maybe a
Nothing
data PraosCannotForge c
=
PraosCannotForgeKeyNotUsableYet
!OCert.KESPeriod
!OCert.KESPeriod
deriving ((forall x. PraosCannotForge c -> Rep (PraosCannotForge c) x)
-> (forall x. Rep (PraosCannotForge c) x -> PraosCannotForge c)
-> Generic (PraosCannotForge c)
forall x. Rep (PraosCannotForge c) x -> PraosCannotForge c
forall x. PraosCannotForge c -> Rep (PraosCannotForge c) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
forall c x. Rep (PraosCannotForge c) x -> PraosCannotForge c
forall c x. PraosCannotForge c -> Rep (PraosCannotForge c) x
$cto :: forall c x. Rep (PraosCannotForge c) x -> PraosCannotForge c
$cfrom :: forall c x. PraosCannotForge c -> Rep (PraosCannotForge c) x
Generic)
deriving instance PraosCrypto c => Show (PraosCannotForge c)
praosCheckCanForge ::
ConsensusConfig (Praos c) ->
SlotNo ->
HotKey.KESInfo ->
Either (PraosCannotForge c) ()
praosCheckCanForge :: ConsensusConfig (Praos c)
-> SlotNo -> KESInfo -> Either (PraosCannotForge c) ()
praosCheckCanForge
PraosConfig {praosParams}
SlotNo
curSlot
KESInfo
kesInfo
| let startPeriod :: KESPeriod
startPeriod = KESInfo -> KESPeriod
HotKey.kesStartPeriod KESInfo
kesInfo,
KESPeriod
startPeriod KESPeriod -> KESPeriod -> Bool
forall a. Ord a => a -> a -> Bool
> KESPeriod
wallclockPeriod =
PraosCannotForge c -> Either (PraosCannotForge c) ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (PraosCannotForge c -> Either (PraosCannotForge c) ())
-> PraosCannotForge c -> Either (PraosCannotForge c) ()
forall a b. (a -> b) -> a -> b
$ KESPeriod -> KESPeriod -> PraosCannotForge c
forall c. KESPeriod -> KESPeriod -> PraosCannotForge c
PraosCannotForgeKeyNotUsableYet KESPeriod
wallclockPeriod KESPeriod
startPeriod
| Bool
otherwise =
() -> Either (PraosCannotForge c) ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
where
wallclockPeriod :: OCert.KESPeriod
wallclockPeriod :: KESPeriod
wallclockPeriod =
Word -> KESPeriod
OCert.KESPeriod (Word -> KESPeriod) -> Word -> KESPeriod
forall a b. (a -> b) -> a -> b
$
Word64 -> Word
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Word64 -> Word) -> Word64 -> Word
forall a b. (a -> b) -> a -> b
$
SlotNo -> Word64
unSlotNo SlotNo
curSlot Word64 -> Word64 -> Word64
forall a. Integral a => a -> a -> a
`div` PraosParams -> Word64
praosSlotsPerKESPeriod PraosParams
praosParams
instance PraosCrypto c => PraosProtocolSupportsNode (Praos c) where
type PraosProtocolSupportsNodeCrypto (Praos c) = c
getPraosNonces :: proxy (Praos c) -> ChainDepState (Praos c) -> PraosNonces
getPraosNonces proxy (Praos c)
_prx ChainDepState (Praos c)
cdst =
PraosNonces :: Nonce -> Nonce -> Nonce -> Nonce -> Nonce -> PraosNonces
PraosNonces {
candidateNonce :: Nonce
candidateNonce = Nonce
praosStateCandidateNonce
, epochNonce :: Nonce
epochNonce = Nonce
praosStateEpochNonce
, evolvingNonce :: Nonce
evolvingNonce = Nonce
praosStateEvolvingNonce
, labNonce :: Nonce
labNonce = Nonce
praosStateLabNonce
, previousLabNonce :: Nonce
previousLabNonce = Nonce
praosStateLastEpochBlockNonce
}
where
PraosState {
Nonce
praosStateCandidateNonce :: Nonce
praosStateCandidateNonce :: forall c. PraosState c -> Nonce
praosStateCandidateNonce
, Nonce
praosStateEpochNonce :: Nonce
praosStateEpochNonce :: forall c. PraosState c -> Nonce
praosStateEpochNonce
, Nonce
praosStateEvolvingNonce :: Nonce
praosStateEvolvingNonce :: forall c. PraosState c -> Nonce
praosStateEvolvingNonce
, Nonce
praosStateLabNonce :: Nonce
praosStateLabNonce :: forall c. PraosState c -> Nonce
praosStateLabNonce
, Nonce
praosStateLastEpochBlockNonce :: Nonce
praosStateLastEpochBlockNonce :: forall c. PraosState c -> Nonce
praosStateLastEpochBlockNonce
} = ChainDepState (Praos c)
PraosState c
cdst
getOpCertCounters :: proxy (Praos c)
-> ChainDepState (Praos c)
-> Map
(KeyHash 'BlockIssuer (PraosProtocolSupportsNodeCrypto (Praos c)))
Word64
getOpCertCounters proxy (Praos c)
_prx ChainDepState (Praos c)
cdst =
Map (KeyHash 'BlockIssuer c) Word64
Map
(KeyHash 'BlockIssuer (PraosProtocolSupportsNodeCrypto (Praos c)))
Word64
praosStateOCertCounters
where
PraosState {
Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters :: Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters :: forall c. PraosState c -> Map (KeyHash 'BlockIssuer c) Word64
praosStateOCertCounters
} = ChainDepState (Praos c)
PraosState c
cdst
(?!) :: Bool -> e -> Except e ()
Bool
a ?! :: Bool -> e -> Except e ()
?! e
b = Bool -> Except e () -> Except e ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
a (Except e () -> Except e ()) -> Except e () -> Except e ()
forall a b. (a -> b) -> a -> b
$ e -> Except e ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError e
b
infix 1 ?!
(?!:) :: Either e1 a -> (e1 -> e2) -> Except e2 ()
(Right a
_) ?!: :: Either e1 a -> (e1 -> e2) -> Except e2 ()
?!: e1 -> e2
_ = () -> Except e2 ()
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
(Left e1
e1) ?!: e1 -> e2
f = e2 -> Except e2 ()
forall e (m :: * -> *) a. MonadError e m => e -> m a
throwError (e2 -> Except e2 ()) -> e2 -> Except e2 ()
forall a b. (a -> b) -> a -> b
$ e1 -> e2
f e1
e1
infix 1 ?!: