#ifndef NO_SAFE_HASKELL
#endif
#if defined(__GLASGOW_HASKELL__) && __GLASGOW_HASKELL__ >= 708
#endif
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
, getSize
, resize
, scale
, suchThat
, suchThatMap
, suchThatMaybe
, listOf
, listOf1
, vectorOf
, infiniteListOf
, shuffle
, sublistOf
, vector
, orderedList
, infiniteList
, generate
, sample
, sample'
, Arbitrary(..)
, CoArbitrary(..)
, Arbitrary1(..)
, arbitrary1
, shrink1
, Arbitrary2(..)
, arbitrary2
, shrink2
, arbitrarySizedIntegral
, arbitrarySizedNatural
, arbitrarySizedFractional
, arbitrarySizedBoundedIntegral
, arbitraryBoundedIntegral
, arbitraryBoundedRandom
, arbitraryBoundedEnum
, arbitraryUnicodeChar
, arbitraryASCIIChar
, arbitraryPrintableChar
#ifndef NO_GENERICS
, genericCoarbitrary
, genericShrink
, subterms
, recursivelyShrink
#endif
, shrinkNothing
, shrinkList
, shrinkMap
, shrinkMapBy
, shrinkIntegral
, shrinkRealFrac
, 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
, ASCIIString(..)
, UnicodeString(..)
, PrintableString(..)
, Fun
, applyFun
, applyFun2
, applyFun3
#if defined(__GLASGOW_HASKELL__) && __GLASGOW_HASKELL__ >= 708
, pattern Fn
, pattern Fn2
, pattern Fn3
#endif
, Function (..)
, functionMap
, Property, Testable(..)
, forAll
, forAllShrink
, shrinking
, (==>)
, (===)
#ifndef NO_DEEPSEQ
, total
#endif
, ioProperty
, verbose
, once
, again
, withMaxSuccess
, 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.Exception
import Test.QuickCheck.Function
#ifndef NO_TEMPLATE_HASKELL
import Test.QuickCheck.All
#endif