Skip to content

Commit

Permalink
Follow ledger naming
Browse files Browse the repository at this point in the history
  • Loading branch information
newhoggy committed Jul 19, 2023
1 parent 7f2718f commit 4c196b6
Show file tree
Hide file tree
Showing 3 changed files with 102 additions and 86 deletions.
165 changes: 90 additions & 75 deletions cardano-api/internal/Cardano/Api/Governance/Actions/VotingProcedure.hs
Original file line number Diff line number Diff line change
Expand Up @@ -3,6 +3,7 @@
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE QuantifiedConstraints #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE StandaloneDeriving #-}
Expand All @@ -28,7 +29,7 @@ import qualified Cardano.Binary as CBOR
import qualified Cardano.Ledger.BaseTypes as Ledger
import qualified Cardano.Ledger.Binary.Plain as Plain
import qualified Cardano.Ledger.Conway as Conway
import qualified Cardano.Ledger.Conway.Governance as Gov
import qualified Cardano.Ledger.Conway.Governance as Ledger
import Cardano.Ledger.Core (EraCrypto)
import qualified Cardano.Ledger.Core as Shelley
import qualified Cardano.Ledger.Credential as Ledger
Expand All @@ -48,7 +49,7 @@ data TxVotes era where

TxVotes
:: TxVotesSupportedInEra era
-> [Vote era]
-> [VotingProcedure era]
-> TxVotes era

deriving instance Show (TxVotes era)
Expand Down Expand Up @@ -76,63 +77,72 @@ votesSupportedInEra ShelleyBasedEraBabbage = Nothing
votesSupportedInEra ShelleyBasedEraConway = Just VotesSupportedInConwayEra


newtype GovernanceActionIdentifier ledgerera
= GovernanceActionIdentifier (Gov.GovernanceActionId (EraCrypto ledgerera))
newtype GovernanceActionId ledgerera = GovernanceActionId
{ unGovernanceActionId :: Ledger.GovernanceActionId (EraCrypto ledgerera)
}
deriving (Show, Eq)

makeGoveranceActionIdentifier
:: ShelleyBasedEra era -> TxIn -> GovernanceActionIdentifier (ShelleyLedgerEra era)
makeGoveranceActionIdentifier sbe txin =
makeGoveranceActionId
:: ShelleyBasedEra era
-> TxIn
-> GovernanceActionId (ShelleyLedgerEra era)
makeGoveranceActionId sbe txin =
let Ledger.TxIn txid (Ledger.TxIx txix) = toShelleyTxIn txin
in obtainEraCryptoConstraints sbe
$ GovernanceActionIdentifier $
Gov.GovernanceActionId
{ Gov.gaidTxId = txid
, Gov.gaidGovActionIx = Gov.GovernanceActionIx txix
}
$ GovernanceActionId
$ Ledger.GovernanceActionId
{ Ledger.gaidTxId = txid
, Ledger.gaidGovActionIx = Ledger.GovernanceActionIx txix
}


-- TODO: Conway era - These should be the different keys corresponding to the CC and DRs.
-- TODO: Conway era -
-- These should be the different keys corresponding to the Constitutional Committee and DReps.
-- We can then derive the StakeCredentials from them.
data VoterType era
= CC (VotingCredential era) -- ^ Constitutional committee
| DR (VotingCredential era)-- ^ Delegated representative
| SP (Hash StakePoolKey) -- ^ Stake pool operator
data Voter era
= VoterCommittee (VotingCredential era) -- ^ Constitutional committee
| VoterDRep (VotingCredential era) -- ^ Delegated representative
| VoterSpo (Hash StakePoolKey) -- ^ Stake pool operator
deriving (Show, Eq)

data VoteChoice
data Vote
= No
| Yes
| Abst -- ^ Abstain
| Abstain
deriving (Show, Eq)

toVoterRole
:: EraCrypto (ShelleyLedgerEra era) ~ StandardCrypto
=> ShelleyBasedEra era
-> VoterType era
-> Gov.Voter (Shelley.EraCrypto (ShelleyLedgerEra era))
toVoterRole _ (CC (VotingCredential cred)) = Gov.CommitteeVoter $ coerceKeyRole cred -- TODO: Conway era - Alexey realllllyyy doesn't like this. We need to fix it.
toVoterRole _ (DR (VotingCredential cred)) = Gov.DRepVoter cred
toVoterRole _ (SP (StakePoolKeyHash kh)) = Gov.StakePoolVoter kh

toVote :: VoteChoice -> Gov.Vote
toVote No = Gov.VoteNo
toVote Yes = Gov.VoteYes
toVote Abst = Gov.Abstain
-> Voter era
-> Ledger.Voter (Shelley.EraCrypto (ShelleyLedgerEra era))
toVoterRole _ = \case
VoterCommittee (VotingCredential cred) ->
Ledger.CommitteeVoter $ coerceKeyRole cred -- TODO: Conway era - Alexey realllllyyy doesn't like this. We need to fix it.
VoterDRep (VotingCredential cred) ->
Ledger.DRepVoter cred
VoterSpo (StakePoolKeyHash kh) ->
Ledger.StakePoolVoter kh

toVote :: Vote -> Ledger.Vote
toVote = \case
No -> Ledger.VoteNo
Yes -> Ledger.VoteYes
Abstain -> Ledger.Abstain

toVotingCredential
:: ShelleyBasedEra era
-> StakeCredential
-> Either Plain.DecoderError (VotingCredential era)
toVotingCredential sbe (StakeCredentialByKey (StakeKeyHash kh)) = do
let cbor = Plain.serialize $ Ledger.KeyHashObj kh
eraDecodeVotingCredential sbe cbor
let cbor = Plain.serialize $ Ledger.KeyHashObj kh
eraDecodeVotingCredential sbe cbor

toVotingCredential _sbe (StakeCredentialByScript (ScriptHash _sh)) =
error "toVotingCredential: script stake credentials not implemented yet"
-- TODO: Conway era
-- let cbor = Plain.serialize $ Ledger.ScriptHashObj sh
-- eraDecodeVotingCredential sbe cbor
error "toVotingCredential: script stake credentials not implemented yet"
-- TODO: Conway era
-- let cbor = Plain.serialize $ Ledger.ScriptHashObj sh
-- eraDecodeVotingCredential sbe cbor

-- TODO: Conway era
-- This is a hack. data StakeCredential in cardano-api is not parameterized by era, it defaults to StandardCrypto.
Expand All @@ -141,61 +151,66 @@ eraDecodeVotingCredential
:: ShelleyBasedEra era
-> ByteString
-> Either Plain.DecoderError (VotingCredential era)
eraDecodeVotingCredential sbe bs = obtainCryptoConstraints sbe $
case Plain.decodeFull bs of
Left e -> Left e
Right x -> Right $ VotingCredential x
eraDecodeVotingCredential sbe bs =
obtainCryptoConstraints sbe $
case Plain.decodeFull bs of
Left e -> Left e
Right x -> Right $ VotingCredential x


newtype VotingCredential era
= VotingCredential (Ledger.Credential 'Voting (EraCrypto (ShelleyLedgerEra era)))
newtype VotingCredential era = VotingCredential
{ unVotingCredential :: Ledger.Credential 'Voting (EraCrypto (ShelleyLedgerEra era))
}

deriving instance Show (VotingCredential crypto)
deriving instance Eq (VotingCredential crypto)

createVotingProcedure
:: ShelleyBasedEra era
-> VoteChoice
-> VoterType era
-> GovernanceActionIdentifier (ShelleyLedgerEra era)
-> Vote era
createVotingProcedure sbe vChoice vt (GovernanceActionIdentifier govActId) =
-> Vote
-> Voter era
-> GovernanceActionId (ShelleyLedgerEra era)
-> VotingProcedure era
createVotingProcedure sbe vChoice vt (GovernanceActionId govActId) =
obtainEraCryptoConstraints sbe
$ Vote $ Gov.VotingProcedure
{ Gov.vProcGovActionId = govActId
, Gov.vProcVoter = toVoterRole sbe vt
, Gov.vProcVote = toVote vChoice
, Gov.vProcAnchor = SNothing -- TODO: Conway
$ VotingProcedure $ Ledger.VotingProcedure
{ Ledger.vProcGovActionId = govActId
, Ledger.vProcVoter = toVoterRole sbe vt
, Ledger.vProcVote = toVote vChoice
, Ledger.vProcAnchor = SNothing -- TODO: Conway
}


newtype Vote era = Vote { unVote :: Gov.VotingProcedure (ShelleyLedgerEra era) }
newtype VotingProcedure era = VotingProcedure
{ unVotingProcedure :: Ledger.VotingProcedure (ShelleyLedgerEra era)
}
deriving (Show, Eq)

-- TODO: Conway - convert newtype Vote to a GADT with a ShelleyBasedEra era value
instance (Shelley.Era (ShelleyLedgerEra era)
, IsShelleyBasedEra era
) => ToCBOR (Vote era) where
toCBOR (Vote vp) = Shelley.toEraCBOR @Conway.Conway vp

instance ( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => FromCBOR (Vote era) where
fromCBOR = Vote <$> Shelley.fromEraCBOR @Conway.Conway

instance ( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => SerialiseAsCBOR (Vote era) where

-- TODO: Conway - convert newtype VotingProcedure to a GADT with a ShelleyBasedEra era value
instance
(Shelley.Era (ShelleyLedgerEra era)
, IsShelleyBasedEra era
) => ToCBOR (VotingProcedure era) where
toCBOR (VotingProcedure vp) = Shelley.toEraCBOR @Conway.Conway vp

instance
( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => FromCBOR (VotingProcedure era) where
fromCBOR = VotingProcedure <$> Shelley.fromEraCBOR @Conway.Conway

instance
( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => SerialiseAsCBOR (VotingProcedure era) where
serialiseToCBOR = CBOR.serialize'
deserialiseFromCBOR _proxy = CBOR.decodeFull'


instance ( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => HasTextEnvelope (Vote era) where
instance
( IsShelleyBasedEra era
, Shelley.Era (ShelleyLedgerEra era)
) => HasTextEnvelope (VotingProcedure era) where
textEnvelopeType _ = "Governance vote"

instance HasTypeProxy era => HasTypeProxy (Vote era) where
data AsType (Vote era) = AsVote
proxyToAsType _ = AsVote
instance HasTypeProxy era => HasTypeProxy (VotingProcedure era) where
data AsType (VotingProcedure era) = AsVote
proxyToAsType _ = AsVote
9 changes: 5 additions & 4 deletions cardano-api/internal/Cardano/Api/TxBody.hs
Original file line number Diff line number Diff line change
Expand Up @@ -2759,8 +2759,8 @@ fromLedgerTxVotes sbe body =
where
getVotes :: TxVotesSupportedInEra era
-> Ledger.TxBody (ShelleyLedgerEra era)
-> [Vote era]
getVotes VotesSupportedInConwayEra body_ = fmap Vote . toList $ body_ ^. L.votingProceduresTxBodyL
-> [VotingProcedure era]
getVotes VotesSupportedInConwayEra body_ = fmap VotingProcedure . toList $ body_ ^. L.votingProceduresTxBodyL

fromLedgerTxIns
:: forall era.
Expand Down Expand Up @@ -3612,8 +3612,9 @@ convGovActions TxGovernanceActionsNone = Seq.empty
convGovActions (TxGovernanceActions _ govActions) = Seq.fromList $ fmap unProposal govActions

convVotes :: ShelleyBasedEra era -> TxVotes era -> Seq.StrictSeq (Gov.VotingProcedure (ShelleyLedgerEra era))
convVotes _ TxVotesNone = Seq.empty
convVotes _ (TxVotes _ votes) = Seq.fromList $ map unVote votes
convVotes _ = \case
TxVotesNone -> Seq.empty
TxVotes _ votes -> Seq.fromList $ map unVotingProcedure votes

guardShelleyTxInsOverflow :: [TxIn] -> Either TxBodyError ()
guardShelleyTxInsOverflow txIns = do
Expand Down
14 changes: 7 additions & 7 deletions cardano-api/src/Cardano/Api/Shelley.hs
Original file line number Diff line number Diff line change
Expand Up @@ -238,20 +238,20 @@ module Cardano.Api.Shelley

-- ** Governance
GovernanceAction(..),
GovernanceActionIdentifier(..),
GovernanceActionId(..),
Proposal(..),
TxGovernanceActions(..),
TxVotes(..),
VotingProcedure(..),
GovernancePoll(..),
GovernancePollAnswer(..),
GovernancePollError(..),
Vote(..),
GovernancePoll (..),
GovernancePollAnswer (..),
GovernancePollError (..),
VoteChoice(..),
VotingCredential(..),
VoterType(..),
Voter(..),
createProposalProcedure,
createVotingProcedure,
makeGoveranceActionIdentifier,
makeGoveranceActionId,
renderGovernancePollError,
toVotingCredential,
fromProposalProcedure,
Expand Down

0 comments on commit 4c196b6

Please sign in to comment.