Skip to content

Commit

Permalink
Merge pull request #2008 from input-output-hk/nc/tidy-tests
Browse files Browse the repository at this point in the history
Move tests out of testing library.
  • Loading branch information
nc6 committed Nov 24, 2020
2 parents 8bc95a2 + f8a4514 commit e9b441e
Show file tree
Hide file tree
Showing 4 changed files with 3 additions and 8 deletions.
Original file line number Diff line number Diff line change
Expand Up @@ -27,8 +27,6 @@ library
exposed-modules:
Test.Cardano.Ledger.EraBuffet
Test.Cardano.Ledger.ShelleyMA.TxBody
Test.Cardano.Ledger.ShelleyMA.Serialisation.Timelocks
Test.Cardano.Ledger.ShelleyMA.Serialisation.CDDL
Test.Cardano.Ledger.ShelleyMA.Serialisation.Coders
Test.Cardano.Ledger.ShelleyMA.Serialisation.Generators
-- other-extensions:
Expand Down Expand Up @@ -82,6 +80,8 @@ test-suite cardano-ledger-shelley-ma-test
Test.Cardano.Ledger.Mary.Examples.Cast
Test.Cardano.Ledger.Mary.Examples.MultiAssets
Test.Cardano.Ledger.Mary.Value
Test.Cardano.Ledger.ShelleyMA.Serialisation.CDDL
Test.Cardano.Ledger.ShelleyMA.Serialisation.Timelocks
default-language: Haskell2010
ghc-options:
-threaded
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -10,8 +10,7 @@
{-# LANGUAGE TypeFamilies #-}

module Test.Shelley.Spec.Ledger.Utils
( assertAll,
mkSeedFromWords,
( mkSeedFromWords,
mkCertifiedVRF,
epochFromSlotNo,
evolveKESUntil,
Expand Down Expand Up @@ -99,7 +98,6 @@ import Data.Maybe (fromMaybe)
import Data.Ratio (Ratio)
import Data.Sequence (Seq)
import Data.Word (Word64)
import Hedgehog (MonadTest, (===))
import Shelley.Spec.Ledger.API
( ApplyBlock,
CHAIN,
Expand Down Expand Up @@ -210,9 +208,6 @@ type MultiSigPairs era = [(MultiSig era, MultiSig era)]

-- ================================================

assertAll :: (MonadTest m, Show a, Eq a) => (a -> Bool) -> [a] -> m ()
assertAll p xs = [] === filter (not . p) xs

-- | Construct a seed from a bunch of Word64s
--
-- We multiply these words by some extra stuff to make sure they contain
Expand Down

0 comments on commit e9b441e

Please sign in to comment.