Skip to content

Commit

Permalink
Merge pull request #5115 from input-output-hk/jordan/build-fixes
Browse files Browse the repository at this point in the history
Master build failure fixes
  • Loading branch information
github-merge-queue[bot] committed Apr 17, 2023
2 parents cf61eb3 + cf67557 commit 4f750d6
Show file tree
Hide file tree
Showing 4 changed files with 13 additions and 15 deletions.
7 changes: 3 additions & 4 deletions cardano-api/gen/Test/Gen/Cardano/Api/Typed.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,4 @@
{-# LANGUAGE GADTs #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
Expand Down Expand Up @@ -120,8 +119,8 @@ import Cardano.Api hiding (txIns)
import qualified Cardano.Api as Api
import Cardano.Api.Byron (KeyWitness (ByronKeyWitness),
WitnessNetworkIdOrByronAddress (..))
import Cardano.Api.Shelley (Hash (..), KESPeriod (KESPeriod),
GovernancePoll (..), GovernancePollAnswer (..), GovernancePollWitness (..),
import Cardano.Api.Shelley (GovernancePoll (..), GovernancePollAnswer (..),
GovernancePollWitness (..), Hash (..), KESPeriod (KESPeriod),
OperationalCertificateIssueCounter (OperationalCertificateIssueCounter),
PlutusScript (PlutusScriptSerialised), ProtocolParameters (ProtocolParameters),
ReferenceScript (..), ReferenceTxInsScriptsInlineDatumsSupportedInEra (..),
Expand Down Expand Up @@ -157,8 +156,8 @@ import qualified Hedgehog.Range as Range
import qualified Cardano.Crypto.Hash.Class as CRYPTO
import Cardano.Ledger.Alonzo.Language (Language (..))
import qualified Cardano.Ledger.Alonzo.Scripts as Alonzo
import Cardano.Ledger.Keys (VKey (..))
import Cardano.Ledger.SafeHash (unsafeMakeSafeHash)
import Cardano.Ledger.Keys (VKey(..))

import Test.Cardano.Chain.UTxO.Gen (genVKWitness)
import Test.Cardano.Crypto.Gen (genProtocolMagicId)
Expand Down
15 changes: 8 additions & 7 deletions cardano-api/test/Test/Cardano/Api/Typed/CBOR.hs
Original file line number Diff line number Diff line change
Expand Up @@ -10,12 +10,13 @@ import Cardano.Api

import Cardano.Api.Shelley (AsType (..))
import Data.Proxy (Proxy (..))
import Hedgehog (Property, forAll, tripping)
import Hedgehog (Property, forAll, property, tripping)
import qualified Hedgehog as H
import qualified Hedgehog.Gen as Gen
import Test.Cardano.Api.Typed.Orphans ()
import Test.Gen.Cardano.Api.Typed
import qualified Test.Hedgehog.Roundtrip.CBOR as H
import Test.Hedgehog.Roundtrip.CBOR
import Test.Tasty (TestTree, testGroup)
import Test.Tasty.Hedgehog (testPropertyNamed)

Expand Down Expand Up @@ -176,16 +177,16 @@ prop_roundtrip_TxWitness_Cddl = H.property $ do
tripping x (serialiseWitnessLedgerCddl sbe) (deserialiseWitnessLedgerCddl sbe)

prop_roundtrip_GovernancePoll_CBOR :: Property
prop_roundtrip_GovernancePoll_CBOR =
roundtrip_CBOR AsGovernancePoll genGovernancePoll
prop_roundtrip_GovernancePoll_CBOR = property $ do
trippingCbor AsGovernancePoll =<< forAll genGovernancePoll

prop_roundtrip_GovernancePollAnswer_CBOR :: Property
prop_roundtrip_GovernancePollAnswer_CBOR =
roundtrip_CBOR AsGovernancePollAnswer genGovernancePollAnswer
prop_roundtrip_GovernancePollAnswer_CBOR = property $ do
trippingCbor AsGovernancePollAnswer =<< forAll genGovernancePollAnswer

prop_roundtrip_GovernancePollWitness_CBOR :: Property
prop_roundtrip_GovernancePollWitness_CBOR =
roundtrip_CBOR AsGovernancePollWitness genGovernancePollWitness
prop_roundtrip_GovernancePollWitness_CBOR = property $ do
trippingCbor AsGovernancePollWitness =<< forAll genGovernancePollWitness

-- -----------------------------------------------------------------------------

Expand Down
2 changes: 0 additions & 2 deletions cardano-cli/src/Cardano/CLI/Shelley/Run/Governance.hs
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,6 @@ import Data.Aeson (eitherDecode)
import qualified Data.ByteString.Char8 as BSC
import qualified Data.ByteString.Lazy as LB
import Data.Function ((&))
import qualified Data.List as List
import Data.String (fromString)
import Data.Text (Text)
import qualified Data.Text as Text
Expand All @@ -38,7 +37,6 @@ import Cardano.CLI.Shelley.Run.Read (MetadataError, readFileTxMetadata
import Cardano.CLI.Types

import Cardano.Binary (DecoderError)
import Cardano.Ledger.Alonzo.Scripts (CostModels (..))
import Cardano.Ledger.Crypto (StandardCrypto)
import Cardano.Ledger.Keys (SignKeyDSIGN, SignKeyVRF)
import qualified Cardano.Ledger.Shelley.TxBody as Shelley
Expand Down
4 changes: 2 additions & 2 deletions cardano-node/src/Cardano/Node/Configuration/POM.hs
Original file line number Diff line number Diff line change
Expand Up @@ -21,11 +21,11 @@ module Cardano.Node.Configuration.POM
)
where

import Control.Monad (forM_, when)
import Control.Monad (when)
import Data.Aeson
import qualified Data.Aeson.Types as Aeson
import Data.Bifunctor (Bifunctor (..))
import Data.Maybe (fromMaybe)
import Data.Maybe
import Data.Monoid (Last (..))
import Data.Text (Text)
import qualified Data.Text as Text
Expand Down

0 comments on commit 4f750d6

Please sign in to comment.