module Test.QuickCheck
(
quickCheck
, Args(..), Result(..)
, stdArgs
, quickCheckWith
, quickCheckWithResult
, quickCheckResult
, verboseCheck
, verboseCheckWith
, verboseCheckWithResult
, verboseCheckResult
#ifndef NO_TEMPLATE_HASKELL
, quickCheckAll
, verboseCheckAll
, forAllProperties
, polyQuickCheck
, polyVerboseCheck
, monomorphic
#endif
, Gen
, choose
, oneof
, frequency
, elements
, growingElements
, sized
, resize
, suchThat
, suchThatMaybe
, listOf
, listOf1
, vectorOf
, infiniteListOf
, vector
, orderedList
, infiniteList
, generate
, sample
, sample'
, Arbitrary(..)
, CoArbitrary(..)
, arbitrarySizedIntegral
, arbitrarySizedFractional
, arbitrarySizedBoundedIntegral
, arbitraryBoundedIntegral
, arbitraryBoundedRandom
, arbitraryBoundedEnum
#ifndef NO_GENERICS
, genericShrink
, subterms
, recursivelyShrink
#endif
, shrinkNothing
, shrinkList
, shrinkIntegral
, shrinkRealFrac
, shrinkRealFracToInteger
, variant
, coarbitraryIntegral
, coarbitraryReal
, coarbitraryShow
, coarbitraryEnum
, (><)
, Blind(..)
, Fixed(..)
, OrderedList(..)
, NonEmptyList(..)
, Positive(..)
, NonZero(..)
, NonNegative(..)
, Large(..)
, Small(..)
, Smart(..)
, Shrink2(..)
#ifndef NO_MULTI_PARAM_TYPE_CLASSES
, Shrinking(..)
, ShrinkState(..)
#endif
, Property, Testable(..)
, forAll
, forAllShrink
, shrinking
, (==>)
, (===)
, ioProperty
, verbose
, once
, within
, noShrinking
, (.&.)
, (.&&.)
, conjoin
, (.||.)
, disjoin
, counterexample
, printTestCase
, whenFail
, whenFail'
, expectFailure
, label
, collect
, classify
, cover
, Discard(..)
, discard
, mapSize
)
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
#ifndef NO_TEMPLATE_HASKELL
import Test.QuickCheck.All
#endif