Skip to content

Commit

Permalink
Add test to hash check in governance vote create
Browse files Browse the repository at this point in the history
  • Loading branch information
palas committed Oct 15, 2024
1 parent 9484c87 commit 47239b7
Show file tree
Hide file tree
Showing 3 changed files with 80 additions and 0 deletions.
1 change: 1 addition & 0 deletions cardano-cli/cardano-cli.cabal
Original file line number Diff line number Diff line change
Expand Up @@ -340,6 +340,7 @@ test-suite cardano-cli-test
Test.Cli.Governance.Committee
Test.Cli.Governance.DRep
Test.Cli.Governance.Hash
Test.Cli.Governance.Vote
Test.Cli.Hash
Test.Cli.ITN
Test.Cli.Json
Expand Down
74 changes: 74 additions & 0 deletions cardano-cli/test/cardano-cli-test/Test/Cli/Governance/Vote.hs
Original file line number Diff line number Diff line change
@@ -0,0 +1,74 @@
{-# LANGUAGE FlexibleContexts #-}

module Test.Cli.Governance.Vote where

import Cardano.Api (MonadIO)

import Control.Monad (void)
import Control.Monad.Catch (MonadCatch)
import Control.Monad.Trans.Control (MonadBaseControl)

import Test.Cardano.CLI.Hash (exampleAnchorDataHash, exampleAnchorDataIpfsHash,
exampleAnchorDataPathTest, serveFilesWhile, tamperBase16Hash)
import Test.Cardano.CLI.Util (execCardanoCLIWithEnvVars, expectFailure, noteInputFile,
propertyOnce)

import Hedgehog (MonadTest, Property)
import qualified Hedgehog as H
import qualified Hedgehog.Extras as H

-- | Execute me with:
-- @cabal test cardano-cli-test --test-options '-p "/governance vote create wrong hash fails/"'@
hprop_governance_vote_create_wrong_hash_fails :: Property
hprop_governance_vote_create_wrong_hash_fails =
propertyOnce . expectFailure . H.moduleWorkspace "tmp" $ \tempDir -> do
-- We modify the hash slightly so that the hash check fails
alteredHash <- H.evalMaybe $ tamperBase16Hash exampleAnchorDataHash
-- We run the test with the altered
baseGovernanceVoteCreateHashCheck
alteredHash
tempDir

-- | Execute me with:
-- @cabal test cardano-cli-test --test-options '-p "/governance vote create right hash works/"'@
hprop_governance_vote_create_right_hash_works :: Property
hprop_governance_vote_create_right_hash_works =
propertyOnce . H.moduleWorkspace "tmp" $ \tempDir ->
baseGovernanceVoteCreateHashCheck exampleAnchorDataHash tempDir

baseGovernanceVoteCreateHashCheck
:: (MonadBaseControl IO m, MonadTest m, MonadIO m, MonadCatch m) => String -> FilePath -> m ()
baseGovernanceVoteCreateHashCheck hash tempDir = do
vkeyFile <- noteInputFile "test/cardano-cli-test/files/input/drep.vkey"
voteFile <- H.noteTempFile tempDir "vote"

let relativeUrl = ["ipfs", exampleAnchorDataIpfsHash]

-- Create temporary HTTP server with files required by the call to `cardano-cli`
-- In this case, the server emulates an IPFS gateway
serveFilesWhile
[(relativeUrl, exampleAnchorDataPathTest)]
( \port -> do
void $
execCardanoCLIWithEnvVars
[("IPFS_GATEWAY_URI", "http://localhost:" ++ show port ++ "/")]
[ "conway"
, "governance"
, "vote"
, "create"
, "--yes"
, "--governance-action-tx-id"
, "b1015258a99351c143a7a40b7b58f033ace10e3cc09c67780ed5b2b0992aa60a"
, "--governance-action-index"
, "5"
, "--drep-verification-key-file"
, vkeyFile
, "--out-file"
, voteFile
, "--anchor-url"
, "ipfs://" ++ exampleAnchorDataIpfsHash
, "--anchor-data-hash"
, hash
, "--check-anchor-data-hash"
]
)
5 changes: 5 additions & 0 deletions cardano-cli/test/cardano-cli-test/files/input/drep.vkey
Original file line number Diff line number Diff line change
@@ -0,0 +1,5 @@
{
"type": "DRepVerificationKey_ed25519",
"description": "Delegated Representative Verification Key",
"cborHex": "58209eb6ff2ee38b24c4892a6b291ed245afa0d2fac76222e76ee3e205e3c9681540"
}

0 comments on commit 47239b7

Please sign in to comment.