quickcheck-combinators: Simple type-level combinators for augmenting QuickCheck instances.

[ bsd3, library, test ] [ Propose Tags ]

Simply wrap the type you want to generate (assuming it satisfies all the necessary constraints) to refine the terms generated:

{-# LANGUAGE DataKinds #-}

import Data.Set (Set)
import Test.QuickCheck
import Test.QuickCheck.Instances
import GHC.TypeLits

instance Arbitrary LinearEquation where
  arbitrary = do
    vars <- arbitrary :: Gen (AtLeast 3 Set String)
    -- ...

Modules

[Index]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.0.0, 0.0.1, 0.0.2, 0.0.3, 0.0.4, 0.0.5, 0.0.6
Change log ChangeLog.md
Dependencies base (>=4.8 && <5), QuickCheck, unfoldable-restricted (>=0.0.1) [details]
License BSD-3-Clause
Author Athan Clark <athan.clark@gmail.com>
Maintainer Athan Clark <athan.clark@gmail.com>
Category Testing
Source repo head: git clone git@github.com:athanclark/quickcheck-combinators.git
Uploaded by athanclark at 2017-04-14T05:29:24Z
Distributions
Reverse Dependencies 1 direct, 1 indirect [details]
Downloads 3474 total (23 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]