{-# LANGUAGE GADTs #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE RankNTypes #-}
module Cardano.CLI.Compatible.StakePool.Run
( runCompatibleStakePoolCmds
)
where
import Cardano.Api.Ledger qualified as L
import Cardano.Api.Shelley
import Cardano.CLI.Compatible.Exception
import Cardano.CLI.Compatible.StakePool.Command
import Cardano.CLI.EraBased.StakePool.Internal.Metadata
import Cardano.CLI.Type.Common
import Cardano.CLI.Type.Error.StakePoolCmdError
import Cardano.CLI.Type.Key (readVerificationKeyOrFile)
import Control.Monad
runCompatibleStakePoolCmds
:: ()
=> CompatibleStakePoolCmds era
-> CIO e ()
runCompatibleStakePoolCmds :: forall era e. CompatibleStakePoolCmds era -> CIO e ()
runCompatibleStakePoolCmds = \case
CompatibleStakePoolRegistrationCertificateCmd CompatibleStakePoolRegistrationCertificateCmdArgs era
args -> CompatibleStakePoolRegistrationCertificateCmdArgs era -> CIO e ()
forall era e.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> CIO e ()
runStakePoolRegistrationCertificateCmd CompatibleStakePoolRegistrationCertificateCmdArgs era
args
runStakePoolRegistrationCertificateCmd
:: ()
=> CompatibleStakePoolRegistrationCertificateCmdArgs era
-> CIO e ()
runStakePoolRegistrationCertificateCmd :: forall era e.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> CIO e ()
runStakePoolRegistrationCertificateCmd
CompatibleStakePoolRegistrationCertificateCmdArgs
{ ShelleyBasedEra era
sbe :: ShelleyBasedEra era
sbe :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> ShelleyBasedEra era
sbe
, VerificationKeyOrFile StakePoolKey
poolVerificationKeyOrFile :: VerificationKeyOrFile StakePoolKey
poolVerificationKeyOrFile :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> VerificationKeyOrFile StakePoolKey
poolVerificationKeyOrFile
, VerificationKeyOrFile VrfKey
vrfVerificationKeyOrFile :: VerificationKeyOrFile VrfKey
vrfVerificationKeyOrFile :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> VerificationKeyOrFile VrfKey
vrfVerificationKeyOrFile
, Coin
poolPledge :: Coin
poolPledge :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> Coin
poolPledge
, Coin
poolCost :: Coin
poolCost :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> Coin
poolCost
, Rational
poolMargin :: Rational
poolMargin :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> Rational
poolMargin
, VerificationKeyOrFile StakeKey
rewardStakeVerificationKeyOrFile :: VerificationKeyOrFile StakeKey
rewardStakeVerificationKeyOrFile :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> VerificationKeyOrFile StakeKey
rewardStakeVerificationKeyOrFile
, [VerificationKeyOrFile StakeKey]
ownerStakeVerificationKeyOrFiles :: [VerificationKeyOrFile StakeKey]
ownerStakeVerificationKeyOrFiles :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> [VerificationKeyOrFile StakeKey]
ownerStakeVerificationKeyOrFiles
, [StakePoolRelay]
relays :: [StakePoolRelay]
relays :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> [StakePoolRelay]
relays
, Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
mMetadata :: Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
mMetadata :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
mMetadata
, NetworkId
network :: NetworkId
network :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era -> NetworkId
network
, File () 'Out
outFile :: File () 'Out
outFile :: forall era.
CompatibleStakePoolRegistrationCertificateCmdArgs era
-> File () 'Out
outFile
} =
ShelleyBasedEra era
-> (ShelleyBasedEraConstraints era => RIO e ()) -> RIO e ()
forall era a.
ShelleyBasedEra era -> (ShelleyBasedEraConstraints era => a) -> a
shelleyBasedEraConstraints ShelleyBasedEra era
sbe ((ShelleyBasedEraConstraints era => RIO e ()) -> RIO e ())
-> (ShelleyBasedEraConstraints era => RIO e ()) -> RIO e ()
forall a b. (a -> b) -> a -> b
$ do
VerificationKey StakePoolKey
stakePoolVerKey <-
ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey)
-> RIO e (VerificationKey StakePoolKey)
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli (ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey)
-> RIO e (VerificationKey StakePoolKey))
-> ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey)
-> RIO e (VerificationKey StakePoolKey)
forall a b. (a -> b) -> a -> b
$
(FileError InputDecodeError -> StakePoolCmdError)
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakePoolKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey)
forall (m :: * -> *) x y a.
Functor m =>
(x -> y) -> ExceptT x m a -> ExceptT y m a
firstExceptT FileError InputDecodeError -> StakePoolCmdError
StakePoolCmdReadKeyFileError (ExceptT
(FileError InputDecodeError) IO (VerificationKey StakePoolKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey))
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakePoolKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakePoolKey)
forall a b. (a -> b) -> a -> b
$
AsType StakePoolKey
-> VerificationKeyOrFile StakePoolKey
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakePoolKey)
forall (t :: (* -> *) -> * -> *) (m :: * -> *) keyrole.
(MonadIOTransError (FileError InputDecodeError) t m,
HasTextEnvelope (VerificationKey keyrole),
SerialiseAsBech32 (VerificationKey keyrole)) =>
AsType keyrole
-> VerificationKeyOrFile keyrole -> t m (VerificationKey keyrole)
readVerificationKeyOrFile AsType StakePoolKey
AsStakePoolKey VerificationKeyOrFile StakePoolKey
poolVerificationKeyOrFile
let stakePoolId' :: Hash StakePoolKey
stakePoolId' = VerificationKey StakePoolKey -> Hash StakePoolKey
forall keyrole.
Key keyrole =>
VerificationKey keyrole -> Hash keyrole
verificationKeyHash VerificationKey StakePoolKey
stakePoolVerKey
VerificationKey VrfKey
vrfVerKey <-
ExceptT StakePoolCmdError IO (VerificationKey VrfKey)
-> RIO e (VerificationKey VrfKey)
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli (ExceptT StakePoolCmdError IO (VerificationKey VrfKey)
-> RIO e (VerificationKey VrfKey))
-> ExceptT StakePoolCmdError IO (VerificationKey VrfKey)
-> RIO e (VerificationKey VrfKey)
forall a b. (a -> b) -> a -> b
$
(FileError InputDecodeError -> StakePoolCmdError)
-> ExceptT (FileError InputDecodeError) IO (VerificationKey VrfKey)
-> ExceptT StakePoolCmdError IO (VerificationKey VrfKey)
forall (m :: * -> *) x y a.
Functor m =>
(x -> y) -> ExceptT x m a -> ExceptT y m a
firstExceptT FileError InputDecodeError -> StakePoolCmdError
StakePoolCmdReadKeyFileError (ExceptT (FileError InputDecodeError) IO (VerificationKey VrfKey)
-> ExceptT StakePoolCmdError IO (VerificationKey VrfKey))
-> ExceptT (FileError InputDecodeError) IO (VerificationKey VrfKey)
-> ExceptT StakePoolCmdError IO (VerificationKey VrfKey)
forall a b. (a -> b) -> a -> b
$
AsType VrfKey
-> VerificationKeyOrFile VrfKey
-> ExceptT (FileError InputDecodeError) IO (VerificationKey VrfKey)
forall (t :: (* -> *) -> * -> *) (m :: * -> *) keyrole.
(MonadIOTransError (FileError InputDecodeError) t m,
HasTextEnvelope (VerificationKey keyrole),
SerialiseAsBech32 (VerificationKey keyrole)) =>
AsType keyrole
-> VerificationKeyOrFile keyrole -> t m (VerificationKey keyrole)
readVerificationKeyOrFile AsType VrfKey
AsVrfKey VerificationKeyOrFile VrfKey
vrfVerificationKeyOrFile
let vrfKeyHash' :: Hash VrfKey
vrfKeyHash' = VerificationKey VrfKey -> Hash VrfKey
forall keyrole.
Key keyrole =>
VerificationKey keyrole -> Hash keyrole
verificationKeyHash VerificationKey VrfKey
vrfVerKey
VerificationKey StakeKey
rwdStakeVerKey <-
ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
-> RIO e (VerificationKey StakeKey)
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli (ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
-> RIO e (VerificationKey StakeKey))
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
-> RIO e (VerificationKey StakeKey)
forall a b. (a -> b) -> a -> b
$
(FileError InputDecodeError -> StakePoolCmdError)
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
forall (m :: * -> *) x y a.
Functor m =>
(x -> y) -> ExceptT x m a -> ExceptT y m a
firstExceptT FileError InputDecodeError -> StakePoolCmdError
StakePoolCmdReadKeyFileError (ExceptT (FileError InputDecodeError) IO (VerificationKey StakeKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey))
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
forall a b. (a -> b) -> a -> b
$
AsType StakeKey
-> VerificationKeyOrFile StakeKey
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey)
forall (t :: (* -> *) -> * -> *) (m :: * -> *) keyrole.
(MonadIOTransError (FileError InputDecodeError) t m,
HasTextEnvelope (VerificationKey keyrole),
SerialiseAsBech32 (VerificationKey keyrole)) =>
AsType keyrole
-> VerificationKeyOrFile keyrole -> t m (VerificationKey keyrole)
readVerificationKeyOrFile AsType StakeKey
AsStakeKey VerificationKeyOrFile StakeKey
rewardStakeVerificationKeyOrFile
let stakeCred :: StakeCredential
stakeCred = Hash StakeKey -> StakeCredential
StakeCredentialByKey (VerificationKey StakeKey -> Hash StakeKey
forall keyrole.
Key keyrole =>
VerificationKey keyrole -> Hash keyrole
verificationKeyHash VerificationKey StakeKey
rwdStakeVerKey)
rewardAccountAddr :: StakeAddress
rewardAccountAddr = NetworkId -> StakeCredential -> StakeAddress
makeStakeAddress NetworkId
network StakeCredential
stakeCred
[VerificationKey StakeKey]
sPoolOwnerVkeys <-
[VerificationKeyOrFile StakeKey]
-> (VerificationKeyOrFile StakeKey
-> RIO e (VerificationKey StakeKey))
-> RIO e [VerificationKey StakeKey]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
t a -> (a -> m b) -> m (t b)
forM [VerificationKeyOrFile StakeKey]
ownerStakeVerificationKeyOrFiles ((VerificationKeyOrFile StakeKey
-> RIO e (VerificationKey StakeKey))
-> RIO e [VerificationKey StakeKey])
-> (VerificationKeyOrFile StakeKey
-> RIO e (VerificationKey StakeKey))
-> RIO e [VerificationKey StakeKey]
forall a b. (a -> b) -> a -> b
$
ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
-> RIO e (VerificationKey StakeKey)
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli
(ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
-> RIO e (VerificationKey StakeKey))
-> (VerificationKeyOrFile StakeKey
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey))
-> VerificationKeyOrFile StakeKey
-> RIO e (VerificationKey StakeKey)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (FileError InputDecodeError -> StakePoolCmdError)
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
forall (m :: * -> *) x y a.
Functor m =>
(x -> y) -> ExceptT x m a -> ExceptT y m a
firstExceptT FileError InputDecodeError -> StakePoolCmdError
StakePoolCmdReadKeyFileError
(ExceptT (FileError InputDecodeError) IO (VerificationKey StakeKey)
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey))
-> (VerificationKeyOrFile StakeKey
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey))
-> VerificationKeyOrFile StakeKey
-> ExceptT StakePoolCmdError IO (VerificationKey StakeKey)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. AsType StakeKey
-> VerificationKeyOrFile StakeKey
-> ExceptT
(FileError InputDecodeError) IO (VerificationKey StakeKey)
forall (t :: (* -> *) -> * -> *) (m :: * -> *) keyrole.
(MonadIOTransError (FileError InputDecodeError) t m,
HasTextEnvelope (VerificationKey keyrole),
SerialiseAsBech32 (VerificationKey keyrole)) =>
AsType keyrole
-> VerificationKeyOrFile keyrole -> t m (VerificationKey keyrole)
readVerificationKeyOrFile AsType StakeKey
AsStakeKey
let stakePoolOwners' :: [Hash StakeKey]
stakePoolOwners' = (VerificationKey StakeKey -> Hash StakeKey)
-> [VerificationKey StakeKey] -> [Hash StakeKey]
forall a b. (a -> b) -> [a] -> [b]
map VerificationKey StakeKey -> Hash StakeKey
forall keyrole.
Key keyrole =>
VerificationKey keyrole -> Hash keyrole
verificationKeyHash [VerificationKey StakeKey]
sPoolOwnerVkeys
let stakePoolParams :: StakePoolParameters
stakePoolParams =
StakePoolParameters
{ stakePoolId :: Hash StakePoolKey
stakePoolId = Hash StakePoolKey
stakePoolId'
, stakePoolVRF :: Hash VrfKey
stakePoolVRF = Hash VrfKey
vrfKeyHash'
, stakePoolCost :: Coin
stakePoolCost = Coin
poolCost
, stakePoolMargin :: Rational
stakePoolMargin = Rational
poolMargin
, stakePoolRewardAccount :: StakeAddress
stakePoolRewardAccount = StakeAddress
rewardAccountAddr
, stakePoolPledge :: Coin
stakePoolPledge = Coin
poolPledge
, stakePoolOwners :: [Hash StakeKey]
stakePoolOwners = [Hash StakeKey]
stakePoolOwners'
, stakePoolRelays :: [StakePoolRelay]
stakePoolRelays = [StakePoolRelay]
relays
, stakePoolMetadata :: Maybe StakePoolMetadataReference
stakePoolMetadata = PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> StakePoolMetadataReference
forall anchorType anchor.
PotentiallyCheckedAnchor anchorType anchor -> anchor
pcaAnchor (PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> StakePoolMetadataReference)
-> Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
-> Maybe StakePoolMetadataReference
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
mMetadata
}
let ledgerStakePoolParams :: PoolParams
ledgerStakePoolParams = StakePoolParameters -> PoolParams
toShelleyPoolParams StakePoolParameters
stakePoolParams
req :: StakePoolRegistrationRequirements era
req =
ShelleyBasedEra era
-> PoolParams -> StakePoolRegistrationRequirements era
forall era.
ShelleyBasedEra era
-> PoolParams -> StakePoolRegistrationRequirements era
createStakePoolRegistrationRequirements ShelleyBasedEra era
sbe (PoolParams -> StakePoolRegistrationRequirements era)
-> PoolParams -> StakePoolRegistrationRequirements era
forall a b. (a -> b) -> a -> b
$
ShelleyBasedEra era
-> (ShelleyBasedEraConstraints era => PoolParams) -> PoolParams
forall era a.
ShelleyBasedEra era -> (ShelleyBasedEraConstraints era => a) -> a
shelleyBasedEraConstraints ShelleyBasedEra era
sbe PoolParams
ShelleyBasedEraConstraints era => PoolParams
ledgerStakePoolParams
registrationCert :: Certificate era
registrationCert = StakePoolRegistrationRequirements era -> Certificate era
forall era.
StakePoolRegistrationRequirements era -> Certificate era
makeStakePoolRegistrationCertificate StakePoolRegistrationRequirements era
req
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> RIO e ())
-> Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
-> RIO e ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (ExceptT StakePoolCmdError IO () -> RIO e ()
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli (ExceptT StakePoolCmdError IO () -> RIO e ())
-> (PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> ExceptT StakePoolCmdError IO ())
-> PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> RIO e ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference
-> ExceptT StakePoolCmdError IO ()
carryHashChecks) Maybe
(PotentiallyCheckedAnchor
StakePoolMetadataReference StakePoolMetadataReference)
mMetadata
ExceptT StakePoolCmdError IO () -> RIO e ()
forall e (m :: * -> *) a.
(HasCallStack, MonadIO m, Show e, Typeable e, Error e) =>
ExceptT e IO a -> m a
fromExceptTCli
(ExceptT StakePoolCmdError IO () -> RIO e ())
-> (ByteString -> ExceptT StakePoolCmdError IO ())
-> ByteString
-> RIO e ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (FileError () -> StakePoolCmdError)
-> ExceptT (FileError ()) IO () -> ExceptT StakePoolCmdError IO ()
forall (m :: * -> *) x y a.
Functor m =>
(x -> y) -> ExceptT x m a -> ExceptT y m a
firstExceptT FileError () -> StakePoolCmdError
StakePoolCmdWriteFileError
(ExceptT (FileError ()) IO () -> ExceptT StakePoolCmdError IO ())
-> (ByteString -> ExceptT (FileError ()) IO ())
-> ByteString
-> ExceptT StakePoolCmdError IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. IO (Either (FileError ()) ()) -> ExceptT (FileError ()) IO ()
forall (m :: * -> *) x a. m (Either x a) -> ExceptT x m a
newExceptT
(IO (Either (FileError ()) ()) -> ExceptT (FileError ()) IO ())
-> (ByteString -> IO (Either (FileError ()) ()))
-> ByteString
-> ExceptT (FileError ()) IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. File () 'Out -> ByteString -> IO (Either (FileError ()) ())
forall (m :: * -> *) content e.
MonadIO m =>
File content 'Out -> ByteString -> m (Either (FileError e) ())
writeLazyByteStringFile File () 'Out
outFile
(ByteString -> RIO e ()) -> ByteString -> RIO e ()
forall a b. (a -> b) -> a -> b
$ Maybe TextEnvelopeDescr -> Certificate era -> ByteString
forall a.
HasTextEnvelope a =>
Maybe TextEnvelopeDescr -> a -> ByteString
textEnvelopeToJSON (TextEnvelopeDescr -> Maybe TextEnvelopeDescr
forall a. a -> Maybe a
Just TextEnvelopeDescr
registrationCertDesc) Certificate era
registrationCert
where
registrationCertDesc :: TextEnvelopeDescr
registrationCertDesc :: TextEnvelopeDescr
registrationCertDesc = TextEnvelopeDescr
"Stake Pool Registration Certificate"
createStakePoolRegistrationRequirements
:: ()
=> ShelleyBasedEra era
-> L.PoolParams
-> StakePoolRegistrationRequirements era
createStakePoolRegistrationRequirements :: forall era.
ShelleyBasedEra era
-> PoolParams -> StakePoolRegistrationRequirements era
createStakePoolRegistrationRequirements ShelleyBasedEra era
sbe PoolParams
pparams =
(ShelleyToBabbageEraConstraints era =>
ShelleyToBabbageEra era -> StakePoolRegistrationRequirements era)
-> (ConwayEraOnwardsConstraints era =>
ConwayEraOnwards era -> StakePoolRegistrationRequirements era)
-> ShelleyBasedEra era
-> StakePoolRegistrationRequirements era
forall era a.
(ShelleyToBabbageEraConstraints era =>
ShelleyToBabbageEra era -> a)
-> (ConwayEraOnwardsConstraints era => ConwayEraOnwards era -> a)
-> ShelleyBasedEra era
-> a
caseShelleyToBabbageOrConwayEraOnwards
(ShelleyToBabbageEra era
-> PoolParams -> StakePoolRegistrationRequirements era
forall era.
ShelleyToBabbageEra era
-> PoolParams -> StakePoolRegistrationRequirements era
`StakePoolRegistrationRequirementsPreConway` PoolParams
pparams)
(ConwayEraOnwards era
-> PoolParams -> StakePoolRegistrationRequirements era
forall era.
ConwayEraOnwards era
-> PoolParams -> StakePoolRegistrationRequirements era
`StakePoolRegistrationRequirementsConwayOnwards` PoolParams
pparams)
ShelleyBasedEra era
sbe