module Test.QuickCheck
(
quickCheck
, Args(..), Result(..)
, stdArgs
, quickCheckWith
, quickCheckWithResult
, quickCheckResult
, verboseCheck
, verboseCheckWith
, verboseCheckWithResult
, verboseCheckResult
, verbose
, Gen
, sized
, resize
, choose
, promote
, suchThat
, suchThatMaybe
, oneof
, frequency
, elements
, growingElements
, listOf
, listOf1
, vectorOf
, vector
, orderedList
, sample
, sample'
, Arbitrary(..)
, CoArbitrary(..)
, arbitrarySizedIntegral
, arbitrarySizedFractional
, arbitrarySizedBoundedIntegral
, arbitraryBoundedIntegral
, arbitraryBoundedRandom
, arbitraryBoundedEnum
, coarbitraryEnum
, shrinkNothing
, shrinkIntegral
, shrinkRealFrac
, variant
, (><)
, coarbitraryIntegral
, coarbitraryReal
, coarbitraryShow
, Blind(..)
, Fixed(..)
, OrderedList(..)
, NonEmptyList(..)
, Positive(..)
, NonZero(..)
, NonNegative(..)
, Smart(..)
, Shrink2(..)
#ifndef NO_MULTI_PARAM_TYPE_CLASSES
, Shrinking(..)
#endif
, ShrinkState(..)
, Property, Prop, Testable(..)
, mapSize
, shrinking
, (==>)
, discard
, forAll
, forAllShrink
, (.&.)
, (.&&.)
, conjoin
, (.||.)
, disjoin
, whenFail
, printTestCase
, whenFail'
, expectFailure
, within
, label
, collect
, classify
, cover
, once
, Str(..)
, ranges
)
where
import Test.QuickCheck.Gen
import Test.QuickCheck.Arbitrary
import Test.QuickCheck.Modifiers
import Test.QuickCheck.Property hiding ( Result(..) )
import Test.QuickCheck.Test
import Test.QuickCheck.Text
import Test.QuickCheck.Exception