shrink package:massiv-test

Produces a (possibly) empty list of all the possible immediate shrinks of the given value. The default implementation returns the empty list, so will not try to shrink the value. If your data type has no special invariants, you can enable shrinking by defining shrink = genericShrink, but by customising the behaviour of shrink you can often get simpler counterexamples. Most implementations of shrink should try at least three things:
  1. Shrink a term to any of its immediate subterms. You can use subterms to do this.
  2. Recursively apply shrink to all immediate subterms. You can use recursivelyShrink to do this.
  3. Type-specific shrinkings such as replacing a constructor by a simpler constructor.
For example, suppose we have the following implementation of binary trees:
data Tree a = Nil | Branch a (Tree a) (Tree a)
We can then define shrink as follows:
shrink Nil = []
shrink (Branch x l r) =
-- shrink Branch to Nil
[Nil] ++
-- shrink to subterms
[l, r] ++
-- recursively shrink subterms
[Branch x' l' r' | (x', l', r') <- shrink (x, l, r)]
There are a couple of subtleties here:
  • QuickCheck tries the shrinking candidates in the order they appear in the list, so we put more aggressive shrinking steps (such as replacing the whole tree by Nil) before smaller ones (such as recursively shrinking the subtrees).
  • It is tempting to write the last line as [Branch x' l' r' | x' <- shrink x, l' <- shrink l, r' <- shrink r] but this is the wrong thing! It will force QuickCheck to shrink x, l and r in tandem, and shrinking will stop once one of the three is fully shrunk.
There is a fair bit of boilerplate in the code above. We can avoid it with the help of some generic functions. The function genericShrink tries shrinking a term to all of its subterms and, failing that, recursively shrinks the subterms. Using it, we can define shrink as:
shrink x = shrinkToNil x ++ genericShrink x
where
shrinkToNil Nil = []
shrinkToNil (Branch _ l r) = [Nil]
genericShrink is a combination of subterms, which shrinks a term to any of its subterms, and recursivelyShrink, which shrinks all subterms of a term. These may be useful if you need a bit more control over shrinking than genericShrink gives you. A final gotcha: we cannot define shrink as simply shrink x = Nil:genericShrink x as this shrinks Nil to Nil, and shrinking will go into an infinite loop. If all this leaves you bewildered, you might try shrink = genericShrink to begin with, after deriving Generic for your type. However, if your data type has any special invariants, you will need to check that genericShrink can't break those invariants.
Shrink an element of a bounded enumeration.

Example

data MyEnum = E0 | E1 | E2 | E3 | E4 | E5 | E6 | E7 | E8 | E9
deriving (Bounded, Enum, Eq, Ord, Show)
>>> shrinkBoundedEnum E9
[E0,E5,E7,E8]
>>> shrinkBoundedEnum E5
[E0,E3,E4]
>>> shrinkBoundedEnum E0
[]
Shrink a real number, preferring numbers with shorter decimal representations. See also shrinkRealFrac.
Shrink an integral number.
Shrink a list of values given a shrinking function for individual values.
Map a shrink function to another domain. This is handy if your data type has special invariants, but is almost isomorphic to some other type.
shrinkOrderedList :: (Ord a, Arbitrary a) => [a] -> [[a]]
shrinkOrderedList = shrinkMap sort id

shrinkSet :: (Ord a, Arbitrary a) => Set a -> [Set a]
shrinkSet = shrinkMap fromList toList
Non-overloaded version of shrinkMap.
Returns no shrinking alternatives.
Shrink a fraction, preferring numbers with smaller numerators or denominators. See also shrinkDecimal.
Shrinks the argument to a property if it fails. Shrinking is done automatically for most types. This function is only needed when you want to override the default behavior.
Shrink2 x: allows 2 shrinking steps at the same time when shrinking x
Shrinking _ x: allows for maintaining a state during shrinking.
Like forAll, but tries to shrink the argument for failing test cases.
Like forAllShrink, but without printing the generated value.
Like forAllShrink, but with an explicitly given show function.
Shrink a term to any of its immediate subterms, and also recursively shrink all subterms.