ap package:massiv-test

In many situations, the liftM operations can be replaced by uses of ap, which promotes function application.
return f `ap` x1 `ap` ... `ap` xn
is equivalent to
liftMn f x1 x2 ... xn
Alias to applyFun.
Apply a binary function to random arguments.
Apply a ternary function to random arguments.
Apply a function of arity 4 to random arguments.
Extracts the value of a function. Fn is the pattern equivalent of this function.
prop :: Fun String Integer -> Bool
prop f = applyFun f "banana" == applyFun f "monkey"
|| applyFun f "banana" == applyFun f "elephant"
Extracts the value of a binary function. Fn2 is the pattern equivalent of this function.
prop_zipWith :: Fun (Int, Bool) Char -> [Int] -> [Bool] -> Bool
prop_zipWith f xs ys = zipWith (applyFun2 f) xs ys == [ applyFun2 f x y | (x, y) <- zip xs ys]
Extracts the value of a ternary function. Fn3 is the pattern equivalent of this function.
fmap is used to apply a function of type (a -> b) to a value of type f a, where f is a functor, to produce a value of type f b. Note that for any type constructor with more than one parameter (e.g., Either), only the last type parameter can be modified with fmap (e.g., b in `Either a b`). Some type constructors with two parameters or more have a Bifunctor instance that allows both the last and the penultimate parameters to be mapped over.

Examples

Convert from a Maybe Int to a Maybe String using show:
>>> fmap show Nothing
Nothing

>>> fmap show (Just 3)
Just "3"
Convert from an Either Int Int to an Either Int String using show:
>>> fmap show (Left 17)
Left 17

>>> fmap show (Right 17)
Right "17"
Double each element of a list:
>>> fmap (*2) [1,2,3]
[2,4,6]
Apply even to the second element of a pair:
>>> fmap even (2,2)
(2,True)
It may seem surprising that the function is only applied to the last element of the tuple compared to the list example above which applies it to every element in the list. To understand, remember that tuples are type constructors with multiple type parameters: a tuple of 3 elements (a,b,c) can also be written (,,) a b c and its Functor instance is defined for Functor ((,,) a b) (i.e., only the third parameter is free to be mapped over with fmap). It explains why fmap can be used with tuples containing values of different types as in the following example:
>>> fmap even ("hello", 1.0, 4)
("hello",1.0,True)
The basic building block for Function instances. Provides a Function instance by mapping to and from a type that already has a Function instance.
The mapAndUnzipM function maps its first argument over a list, returning the result as a pair of lists. This function is mainly used with complicated data structures or a state monad.
Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see mapM_.

Examples

mapM is literally a traverse with a type signature restricted to Monad. Its implementation may be more efficient due to additional power of Monad.
Map each element of a structure to a monadic action, evaluate these actions from left to right, and ignore the results. For a version that doesn't ignore the results see mapM. mapM_ is just like traverse_, but specialised to monadic actions.
Adjust the test case size for a property, by transforming it with the given function.
Modify the subject under test. Note that this resembles a contravariant functor on the first type parameter of SpecM. This is because the subject is passed inwards, as an argument to the spec item.
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.
Splits a type constructor application. Note that if the type constructor is polymorphic, this will not return the kinds that were used.
Generates a value for which the given function returns a Just, and then applies the function.