quickcheck-combinators

[ bsd3, library, test ] [ Propose Tags ]

Modules

[Index] [Quick Jump]

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.11 && <5), QuickCheck, unfoldable-restricted (>=0.0.1) [details]
License BSD-3-Clause
Copyright 2018 (c) Local Cooking Inc.
Author Athan Clark
Maintainer athan.clark@localcooking.com
Home page https://github.com/athanclark/quickcheck-combinators#readme
Bug tracker https://github.com/athanclark/quickcheck-combinators/issues
Source repo head: git clone https://github.com/athanclark/quickcheck-combinators
Uploaded by athanclark at 2018-11-03T05:27:13Z
Distributions
Reverse Dependencies 1 direct, 1 indirect [details]
Downloads 3482 total (17 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2018-11-03 [all 1 reports]

Readme for quickcheck-combinators-0.0.5

[back to package description]

quickcheck-combinators

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)
    -- ...