{-# LANGUAGE OverloadedStrings #-}
module Test.Byron.Spec.Ledger.Core.Generators.Properties (relevantKValuesAreGenerated) where
import qualified Byron.Spec.Ledger.Core.Generators as CoreGen
import qualified Byron.Spec.Ledger.GlobalParams as GP
import Control.Monad (when)
import Data.Word (Word64)
import Hedgehog (Property, cover, forAll, property, withTests)
relevantKValuesAreGenerated :: Property
relevantKValuesAreGenerated :: Property
relevantKValuesAreGenerated = TestLimit -> Property -> Property
withTests TestLimit
500 (Property -> Property) -> Property -> Property
forall a b. (a -> b) -> a -> b
$
HasCallStack => PropertyT IO () -> Property
PropertyT IO () -> Property
property (PropertyT IO () -> Property) -> PropertyT IO () -> Property
forall a b. (a -> b) -> a -> b
$ do
let chainLength :: Word64
chainLength = Word64
1000 :: Word64
k <- Gen BlockCount -> PropertyT IO BlockCount
forall (m :: * -> *) a.
(Monad m, Show a, HasCallStack) =>
Gen a -> PropertyT m a
forAll (Gen BlockCount -> PropertyT IO BlockCount)
-> Gen BlockCount -> PropertyT IO BlockCount
forall a b. (a -> b) -> a -> b
$ Word64 -> Word64 -> Gen BlockCount
CoreGen.k Word64
chainLength (Word64
chainLength Word64 -> Word64 -> Word64
forall a. Integral a => a -> a -> a
`div` Word64
10)
let slotsPerEpoch :: Word64
slotsPerEpoch = BlockCount -> Word64
forall n. Integral n => BlockCount -> n
GP.slotsPerEpoch BlockCount
k
when (slotsPerEpoch /= 0) $ do
let epochs :: Word64
epochs = Double -> Word64
forall b. Integral b => Double -> b
forall a b. (RealFrac a, Integral b) => a -> b
round (Double -> Word64) -> Double -> Word64
forall a b. (a -> b) -> a -> b
$ Word64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Word64
chainLength Double -> Double -> Double
forall a. Fractional a => a -> a -> a
/ (Word64 -> Double
forall a b. (Integral a, Num b) => a -> b
fromIntegral Word64
slotsPerEpoch :: Double)
cover
5
"1 epochs "
(epochs == 1)
cover
20
"epochs in [2, 25)"
(2 <= epochs && epochs < 25)
cover
5
"epochs in [25, 50)"
(25 <= epochs && epochs < 50)
cover
5
"50 epochs "
(epochs == 50)
cover
6
"100 epochs "
(epochs == 100)