shrink

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.
When shrinkSmallMutableArray# is available, the returned array is the same as the array given, as it is shrunk in place. Otherwise a copy is made.
Apply a shrinking function to a generator. This will give the generator additional shrinking options, while keeping the existing shrinks intact.
Resize an array without growing it. It may be shrunk in place.
Construct an acyclic graph from a given adjacency map using scc. If the graph is acyclic, it is returned as is. If the graph is cyclic, then a representative for every strongly connected component in its condensation graph is chosen and these representatives are used to build an acyclic graph.
shrink . vertex      == vertex
shrink . vertices    == vertices
shrink . fromAcyclic == id
Shrink the window's rectangle when applying a decoration.
Shrink a surface by an integer ratio. The two CInt arguments are the horizontal and vertical shrinking ratios: 2 halves a dimension, 5 makes it a fifth of its original size etc. The resulting Surface is anti-aliased and, if the input wasn't 8-bit or 32-bit, converted to a 32-bit RGBA format.
Shrink the given area on all fours sides by the amount.
Shrink counter-example This will run the generator repeatedly until it finds a counter-example to the given property, and will then shrink it. Returns Nothing if no counter-example could be found.
Shrinker for representation of functions.

Warning

This is an internal module: it is not subject to any versioning policy, breaking changes can happen at any time. It is made available only for debugging. Otherwise, use Test.Fun. If something here seems useful, please open an issue to export it from an external module.
Shrink mutable byte array to new specified size (in bytes), in the specified state thread. The new size argument must be less than or equal to the current size as reported by getSizeofMutableByteArray#. Assuming the non-profiling RTS, this primitive compiles to an O(1) operation in C--, modifying the array in-place. Backends bypassing C-- representation (such as JavaScript) might behave differently. Warning: this can fail with an unchecked exception.
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.