MIT licensed by Li-yao Xia
Maintained by [email protected]
This version can be pinned in stack with:generic-random-1.2.0.0@sha256:f0619f591e579c9c064a2e28dbb26aa5bb847e500fbb7fa68f43d6f472e2e33d,1458

Module documentation for 1.2.0.0

Depends on 2 packages(full list with versions):

Generic random generators Hackage Build Status

Derive simple random generators for QuickCheck using generics.

Automating the Arbitrary boilerplate also ensures that if a type changes to have more constructors, then the generator fixes itself to generate that new case (with uniform distribution) or causes a compilation error (with an explicit distribution).

A simple (optional) strategy to ensure termination for recursive types: make Test.QuickCheck.Gen’s size parameter decrease at every recursive call; when it reaches zero, sample directly from a trivially terminating generator given explicitly (genericArbitraryRec and withBaseCase) or implicitly (genericArbitrary').

Example

{-# LANGUAGE DeriveGeneric #-}

import GHC.Generics (Generic)
import Test.QuickCheck
import Generic.Random

data Tree a = Leaf | Node (Tree a) a (Tree a)
  deriving (Show, Generic)

instance Arbitrary a => Arbitrary (Tree a) where
  arbitrary = genericArbitraryRec uniform `withBaseCase` return Leaf

-- Equivalent to
-- > arbitrary =
-- >   sized $ \n ->
-- >     if n == 0 then
-- >       return Leaf
-- >     else
-- >       oneof
-- >         [ return Leaf
-- >         , resize (n `div` 3) $
-- >             Node <$> arbitrary <*> arbitrary <*> arbitrary
-- >         ]

main = sample (arbitrary :: Gen (Tree ()))

Changes

https://github.com/Lysxia/generic-random/blob/master/changelog.md

1.2.0.0

  • Fix a bug where generators did not decrease the size parameter with single-field constructors

  • The sized generators now use a custom generator for lists. Use genericArbitraryRecG () to disable that.

  • Lists of custom generators are now constructed using (:+) instead of GenList

  • Rename Field to FieldGen

  • Add Gen1, Gen1_ (custom generators for unary type constructors)

  • Add listOf', listOf1', vectorOf'

  • Remove deprecated module Generic.Random.Generic

1.1.0.2

  • Improved performance

1.1.0.1

  • Fix build for GHC<8

1.1.0.0

  • Add option to specify custom generators for certain fields, overriding Arbitrary instances
    • Add genericArbitraryG, genericArbitraryUG, genericArbitrarySingleG, genericArbitraryRecG
  • Add GArbitrary and GUniformWeight synonyms
  • Deprecate Generic.Random.Generic
  • Remove weights from the external API

1.0.0.0

  • Make the main module Generic.Random
  • Rework generic base case generation
    • You can explicitly provide a trivial generator (e.g., returning a nullary constructor) using withBaseCase
    • Generically derive BaseCaseSearch and let BaseCase find small values, no depth parameter must be specified anymore
  • Add genericArbitrarySingle, genericArbitraryRec, genericArbitraryU'
  • Deprecate weights
  • Fixed bug with genericArbitrary' not dividing the size parameter

0.5.0.0

  • Turn off dependency on boltzmann-samplers by default
  • Add genericArbitraryU, genericArbitraryU0 and genericArbitraryU1
  • Compatible with GHC 7.8.4 and GHC 7.10.3

0.4.1.0

  • Move Boltzmann sampler modules to another package: boltzmann-samplers

0.4.0.0

  • Check well-formedness of constructor distributions at compile time.
  • No longer support GHC 7.10.3 (the above feature relies on Generic information which does not exist before GHC 8)

0.3.0.0

  • Support GHC 7.10.3
  • Replace TypeApplications with ad-hoc data types in genericArbitraryFrequency'/genericArbitrary'