quickcheck-property-comb: Combinators for Quickcheck Property construction and Property diagnostics

[ library, public-domain, testing ] [ Propose Tags ]

This project aims to reduce the pain of composing invariants/properties, and the documenting of those invariants for determining the cause of failure. Additionally, it intends to provide effective diagnostics for invariants with changing post-conditions, leading to faster cause-of-failure diagnosis.


[Skip to Readme]

Modules

  • Test
    • QuickCheck
      • Property
        • Test.QuickCheck.Property.Comb

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0.0, 0.1.0.1, 0.1.0.2
Dependencies base (>=4.5 && <4.6), mtl (>=2.1 && <2.2), QuickCheck (>=2.5 && <2.6) [details]
License LicenseRef-PublicDomain
Author John Feltz
Maintainer jfeltz@gmail.com
Category Testing
Home page http://www.github.com/jfeltz/quickcheck-property-comb
Uploaded by jfeltz at 2013-10-14T23:49:01Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 2173 total (9 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs not available [build log]
All reported builds failed as of 2016-12-20 [all 5 reports]

Readme for quickcheck-property-comb-0.1.0.0

[back to package description]

quickcheck-property-comb

This is collection of combinators built on the Reader and Writer Monads to allow for fast and painless Quickcheck property/invariant construction.

Why?

Quickcheck is a tool used to test cases based on constructed Properties,or essentially functions taking a data structure and returning a boolean True or False.

However when running tests, the only way to document their failing case is through is through labeling them after binding, e.g.:

inv1, inv2, inv3 :: Foo -> Bool 
..
fooInvariants :: Foo -> Property 
fooInvariants f = 
    conjoin . map property $ 
      conjoin $ zipWith toLabeled
        ["foo should be even", "foo should contain 3 bar", "all bar should not equal foo"] 
        [inv1 f, inv2 f, inv3 f]

This gets unwieldy fast as the complexity of the data-structure increases, so quickcheck-property-comb provides the following:

  • A clean separation of composition of invariants and the creation and documenting of those invariants for determining cause of failure.
  • Effective diagnostics for invariants with changing post-conditions, leading to faster cause-of-failure diagnosis.

Example use

data (Ord l) => QuantityConsumers l =
  QuantityConsumers {
    atQuantity :: S.Set l,
    qcMet :: M.Map (S.Set l) Bool,
    qcDisjoints :: Disjoints l
  }

disjoint_sizes ::  Inv (Disjoints l)
disjoint_sizes = do
  doc . unlines $
    [
     "the intersection of all at quantity and disjoints are the only allowed",
     "singleton sets in disjoints"
    ]
  disjoints <- cause 
  -- Do some checking on disjoints 
  return False

disjoints_eq :: Inv (Disjoints l)
disjoints_eq = do
  doc "the solution state domain and sets formed by partition are equal"
  ..
  return False

disjoints :: Invariants (Disjoints l)
disjoints = do
  sat disjoints_eq
  sat disjoints_sizes

at_quantity_in_disjoint :: Inv (QuantityConsumers l)
at_quantity_in_disjoint = do
  doc "all at quantity are a singleton subset in disjoints"

  subsets       <- (map S.singleton) . S.toList . atQuantity <$> cause
  disjoint_sets <- fromDisjoints <$>  cause

  return . and . map ((flip S.member) disjoint_sets) $ subsets

inv_quantity_consumers :: Invariants (QuantityConsumers l)
inv_quantity_consumers = do
  satcomp qcDisjoints disjoints
  sat at_quantity_in_disjoint

-- Then to create the final property
prop_quantity_consumers :: QuantityConsumers l -> Property
prop_quantity_consumers q = runInvariants q inv_quantity_consumers