Skip to content

Commit

Permalink
Merge #3205
Browse files Browse the repository at this point in the history
3205: Fix shrinker for `ProtocolParameters`. r=jonathanknowles a=jonathanknowles

Currently, the shrinker for `ProtocolParameters` always returns the empty list:

```hs
> :set -XTypeApplications
> import Cardano.Wallet.Primitive.Types (ProtocolParameters)
> import Cardano.Wallet.DB.Arbitrary
> import Test.QuickCheck
> generate (arbitrary `@ProtocolParameters)`
ProtocolParameters {decentralizationLevel = ...}
> a = it
> shrink a
[]
```

By using `genericRoundRobinShrink` from `Test.QuickCheck.Extra`, we can get actual shrinking:

```hs
> generate (arbitrary `@ProtocolParameters)`
ProtocolParameters {decentralizationLevel = ...}
> a = it
> length $ shrink a
68
```

Co-authored-by: Jonathan Knowles <[email protected]>
  • Loading branch information
iohk-bors[bot] and jonathanknowles authored Mar 30, 2022
2 parents 2bc2fee + 172457a commit f4e136c
Showing 1 changed file with 16 additions and 12 deletions.
28 changes: 16 additions & 12 deletions lib/core/test/unit/Cardano/Wallet/DB/Arbitrary.hs
Original file line number Diff line number Diff line change
Expand Up @@ -11,7 +11,6 @@
{-# LANGUAGE NumericUnderscores #-}
{-# LANGUAGE OverloadedLabels #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeApplications #-}
Expand Down Expand Up @@ -174,6 +173,8 @@ import Data.Word.Odd
( Word31 )
import Fmt
( Buildable (..), Builder, blockListF', prefixF, suffixF, tupleF )
import Generics.SOP
( NP (..) )
import GHC.Generics
( Generic )
import Numeric.Natural
Expand Down Expand Up @@ -205,6 +206,8 @@ import Test.QuickCheck
)
import Test.QuickCheck.Arbitrary.Generic
( genericArbitrary )
import Test.QuickCheck.Extra
( genericRoundRobinShrink, (<:>), (<@>) )
import Test.Utils.Time
( genUniformTime )

Expand Down Expand Up @@ -665,17 +668,18 @@ arbitrarySharedAccount =
-------------------------------------------------------------------------------}

instance Arbitrary ProtocolParameters where
shrink ProtocolParameters {..} = ProtocolParameters
<$> shrink decentralizationLevel
<*> shrink txParameters
<*> shrink desiredNumberOfStakePools
<*> shrink minimumUTxOvalue
<*> shrink stakeKeyDeposit
<*> shrink eras
<*> shrink maximumCollateralInputCount
<*> shrink minimumCollateralPercentage
<*> shrink executionUnitPrices
<*> pure Nothing
shrink = genericRoundRobinShrink
<@> shrink
<:> shrink
<:> shrink
<:> shrink
<:> shrink
<:> shrink
<:> shrink
<:> shrink
<:> shrink
<:> const []
<:> Nil
arbitrary = ProtocolParameters
<$> arbitrary
<*> arbitrary
Expand Down

0 comments on commit f4e136c

Please sign in to comment.