tasty-quickcheck-0.10.2: QuickCheck support for the Tasty test framework.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Test.Tasty.QuickCheck

Description

This module allows to use QuickCheck properties in tasty.

Synopsis

Documentation

testProperty :: Testable a => TestName -> a -> TestTree Source #

Create a Test for a QuickCheck Testable property

testProperties :: TestName -> [(String, Property)] -> TestTree Source #

Create a test from a list of QuickCheck properties. To be used with allProperties. E.g.

tests :: TestTree
tests = testProperties "Foo" $allProperties

newtype QuickCheckTests Source #

Number of test cases for QuickCheck to generate

Constructors

QuickCheckTests Int 

Instances

Instances details
Enum QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Num QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Integral QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Real QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Methods

toRational :: QuickCheckTests -> Rational

Eq QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Ord QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

IsOption QuickCheckTests Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckReplay Source #

Constructors

QuickCheckReplay (Maybe Int) 

Instances

Instances details
IsOption QuickCheckReplay Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckShowReplay Source #

If a test case fails unexpectedly, show the replay token

Constructors

QuickCheckShowReplay Bool 

Instances

Instances details
IsOption QuickCheckShowReplay Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckMaxSize Source #

Size of the biggest test cases

Constructors

QuickCheckMaxSize Int 

Instances

Instances details
Enum QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Num QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Integral QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Real QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Methods

toRational :: QuickCheckMaxSize -> Rational

Eq QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Ord QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

IsOption QuickCheckMaxSize Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckMaxRatio Source #

Maximum number of of discarded tests per successful test before giving up.

Constructors

QuickCheckMaxRatio Int 

Instances

Instances details
Enum QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Num QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Integral QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Real QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Methods

toRational :: QuickCheckMaxRatio -> Rational

Eq QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Ord QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

IsOption QuickCheckMaxRatio Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckVerbose Source #

Show the test cases that QuickCheck generates

Constructors

QuickCheckVerbose Bool 

Instances

Instances details
IsOption QuickCheckVerbose Source # 
Instance details

Defined in Test.Tasty.QuickCheck

newtype QuickCheckMaxShrinks Source #

Number of shrinks allowed before QuickCheck will fail a test.

Since: 0.10.2

Constructors

QuickCheckMaxShrinks Int 

Instances

Instances details
Enum QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Num QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Integral QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Real QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Methods

toRational :: QuickCheckMaxShrinks -> Rational

Eq QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Ord QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

IsOption QuickCheckMaxShrinks Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Re-export of Test.QuickCheck

data Property #

Instances

Instances details
Testable Property 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Property -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Property) -> Property #

class Arbitrary a where #

Minimal complete definition

arbitrary

Methods

arbitrary :: Gen a #

shrink :: a -> [a] #

Instances

Instances details
Arbitrary ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary QCGen 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen QCGen #

shrink :: QCGen -> [QCGen] #

Arbitrary All 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen All #

shrink :: All -> [All] #

Arbitrary Any 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Any #

shrink :: Any -> [Any] #

Arbitrary Version 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Version #

shrink :: Version -> [Version] #

Arbitrary CChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CChar #

shrink :: CChar -> [CChar] #

Arbitrary CClock 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CClock #

shrink :: CClock -> [CClock] #

Arbitrary CDouble 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CDouble #

shrink :: CDouble -> [CDouble] #

Arbitrary CFloat 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CFloat #

shrink :: CFloat -> [CFloat] #

Arbitrary CInt 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CInt #

shrink :: CInt -> [CInt] #

Arbitrary CIntMax 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CIntMax #

shrink :: CIntMax -> [CIntMax] #

Arbitrary CIntPtr 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CIntPtr #

shrink :: CIntPtr -> [CIntPtr] #

Arbitrary CLLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CLLong #

shrink :: CLLong -> [CLLong] #

Arbitrary CLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CLong #

shrink :: CLong -> [CLong] #

Arbitrary CPtrdiff 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CPtrdiff #

shrink :: CPtrdiff -> [CPtrdiff] #

Arbitrary CSChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CSChar #

shrink :: CSChar -> [CSChar] #

Arbitrary CSUSeconds 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CSUSeconds #

shrink :: CSUSeconds -> [CSUSeconds] #

Arbitrary CShort 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CShort #

shrink :: CShort -> [CShort] #

Arbitrary CSigAtomic 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CSigAtomic #

shrink :: CSigAtomic -> [CSigAtomic] #

Arbitrary CSize 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CSize #

shrink :: CSize -> [CSize] #

Arbitrary CTime 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CTime #

shrink :: CTime -> [CTime] #

Arbitrary CUChar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUChar #

shrink :: CUChar -> [CUChar] #

Arbitrary CUInt 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUInt #

shrink :: CUInt -> [CUInt] #

Arbitrary CUIntMax 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUIntMax #

shrink :: CUIntMax -> [CUIntMax] #

Arbitrary CUIntPtr 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUIntPtr #

shrink :: CUIntPtr -> [CUIntPtr] #

Arbitrary CULLong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CULLong #

shrink :: CULLong -> [CULLong] #

Arbitrary CULong 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CULong #

shrink :: CULong -> [CULong] #

Arbitrary CUSeconds 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUSeconds #

shrink :: CUSeconds -> [CUSeconds] #

Arbitrary CUShort 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CUShort #

shrink :: CUShort -> [CUShort] #

Arbitrary CWchar 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen CWchar #

shrink :: CWchar -> [CWchar] #

Arbitrary ExitCode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen ExitCode #

shrink :: ExitCode -> [ExitCode] #

Arbitrary Newline 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Newline #

shrink :: Newline -> [Newline] #

Arbitrary NewlineMode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen NewlineMode #

shrink :: NewlineMode -> [NewlineMode] #

Arbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int16 #

shrink :: Int16 -> [Int16] #

Arbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int32 #

shrink :: Int32 -> [Int32] #

Arbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int64 #

shrink :: Int64 -> [Int64] #

Arbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int8 #

shrink :: Int8 -> [Int8] #

Arbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word16 #

shrink :: Word16 -> [Word16] #

Arbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word32 #

shrink :: Word32 -> [Word32] #

Arbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word64 #

shrink :: Word64 -> [Word64] #

Arbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word8 #

shrink :: Word8 -> [Word8] #

Arbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen IntSet #

shrink :: IntSet -> [IntSet] #

Arbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Ordering #

shrink :: Ordering -> [Ordering] #

Arbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Integer #

shrink :: Integer -> [Integer] #

Arbitrary () 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen () #

shrink :: () -> [()] #

Arbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Bool #

shrink :: Bool -> [Bool] #

Arbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Char #

shrink :: Char -> [Char] #

Arbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Double #

shrink :: Double -> [Double] #

Arbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Float #

shrink :: Float -> [Float] #

Arbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int #

shrink :: Int -> [Int] #

Arbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word #

shrink :: Word -> [Word] #

Arbitrary a => Arbitrary (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Blind a) #

shrink :: Blind a -> [Blind a] #

Arbitrary a => Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Fixed a) #

shrink :: Fixed a -> [Fixed a] #

Arbitrary a => Arbitrary (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary a => Arbitrary (InfiniteListInternalData a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (InfiniteListInternalData a) #

shrink :: InfiniteListInternalData a -> [InfiniteListInternalData a] #

(Integral a, Bounded a) => Arbitrary (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Large a) #

shrink :: Large a -> [Large a] #

(Num a, Ord a, Arbitrary a) => Arbitrary (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Negative a) #

shrink :: Negative a -> [Negative a] #

Arbitrary a => Arbitrary (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) => Arbitrary (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) => Arbitrary (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Eq a, Arbitrary a) => Arbitrary (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (NonZero a) #

shrink :: NonZero a -> [NonZero a] #

(Ord a, Arbitrary a) => Arbitrary (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

(Num a, Ord a, Arbitrary a) => Arbitrary (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Positive a) #

shrink :: Positive a -> [Positive a] #

Arbitrary a => Arbitrary (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Shrink2 a) #

shrink :: Shrink2 a -> [Shrink2 a] #

Integral a => Arbitrary (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Small a) #

shrink :: Small a -> [Small a] #

Arbitrary a => Arbitrary (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Smart a) #

shrink :: Smart a -> [Smart a] #

(Arbitrary a, Ord a) => Arbitrary (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Arbitrary a => Arbitrary (ZipList a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (ZipList a) #

shrink :: ZipList a -> [ZipList a] #

Arbitrary a => Arbitrary (Complex a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Complex a) #

shrink :: Complex a -> [Complex a] #

Arbitrary a => Arbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Identity a) #

shrink :: Identity a -> [Identity a] #

Arbitrary a => Arbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (First a) #

shrink :: First a -> [First a] #

Arbitrary a => Arbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Last a) #

shrink :: Last a -> [Last a] #

Arbitrary a => Arbitrary (Dual a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Dual a) #

shrink :: Dual a -> [Dual a] #

(Arbitrary a, CoArbitrary a) => Arbitrary (Endo a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Endo a) #

shrink :: Endo a -> [Endo a] #

Arbitrary a => Arbitrary (Product a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Product a) #

shrink :: Product a -> [Product a] #

Arbitrary a => Arbitrary (Sum a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Sum a) #

shrink :: Sum a -> [Sum a] #

Integral a => Arbitrary (Ratio a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Ratio a) #

shrink :: Ratio a -> [Ratio a] #

Arbitrary a => Arbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (IntMap a) #

shrink :: IntMap a -> [IntMap a] #

Arbitrary a => Arbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Seq a) #

shrink :: Seq a -> [Seq a] #

(Ord a, Arbitrary a) => Arbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Set a) #

shrink :: Set a -> [Set a] #

Arbitrary a => Arbitrary (Tree a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Tree a) #

shrink :: Tree a -> [Tree a] #

Arbitrary a => Arbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Maybe a) #

shrink :: Maybe a -> [Maybe a] #

Arbitrary a => Arbitrary [a] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen [a] #

shrink :: [a] -> [[a]] #

(Function a, CoArbitrary a, Arbitrary b) => Arbitrary (a :-> b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitrary :: Gen (a :-> b) #

shrink :: (a :-> b) -> [a :-> b] #

(Function a, CoArbitrary a, Arbitrary b) => Arbitrary (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitrary :: Gen (Fun a b) #

shrink :: Fun a b -> [Fun a b] #

(Arbitrary a, ShrinkState s a) => Arbitrary (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Shrinking s a) #

shrink :: Shrinking s a -> [Shrinking s a] #

Arbitrary (m a) => Arbitrary (WrappedMonad m a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (WrappedMonad m a) #

shrink :: WrappedMonad m a -> [WrappedMonad m a] #

(Arbitrary a, Arbitrary b) => Arbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Either a b) #

shrink :: Either a b -> [Either a b] #

HasResolution a => Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Fixed a) #

shrink :: Fixed a -> [Fixed a] #

(Ord k, Arbitrary k, Arbitrary v) => Arbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Map k v) #

shrink :: Map k v -> [Map k v] #

(CoArbitrary a, Arbitrary b) => Arbitrary (a -> b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a -> b) #

shrink :: (a -> b) -> [a -> b] #

(Arbitrary a, Arbitrary b) => Arbitrary (a, b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b) #

shrink :: (a, b) -> [(a, b)] #

Arbitrary (a b c) => Arbitrary (WrappedArrow a b c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (WrappedArrow a b c) #

shrink :: WrappedArrow a b c -> [WrappedArrow a b c] #

Arbitrary a => Arbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Const a b) #

shrink :: Const a b -> [Const a b] #

Arbitrary (f a) => Arbitrary (Alt f a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Alt f a) #

shrink :: Alt f a -> [Alt f a] #

Arbitrary a => Arbitrary (Constant a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Constant a b) #

shrink :: Constant a b -> [Constant a b] #

(Arbitrary a, Arbitrary b, Arbitrary c) => Arbitrary (a, b, c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c) #

shrink :: (a, b, c) -> [(a, b, c)] #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) => Arbitrary (Product f g a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Product f g a) #

shrink :: Product f g a -> [Product f g a] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d) => Arbitrary (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d) #

shrink :: (a, b, c, d) -> [(a, b, c, d)] #

(Arbitrary1 f, Arbitrary1 g, Arbitrary a) => Arbitrary (Compose f g a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Compose f g a) #

shrink :: Compose f g a -> [Compose f g a] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e) => Arbitrary (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e) #

shrink :: (a, b, c, d, e) -> [(a, b, c, d, e)] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f) => Arbitrary (a, b, c, d, e, f) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e, f) #

shrink :: (a, b, c, d, e, f) -> [(a, b, c, d, e, f)] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g) => Arbitrary (a, b, c, d, e, f, g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e, f, g) #

shrink :: (a, b, c, d, e, f, g) -> [(a, b, c, d, e, f, g)] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h) => Arbitrary (a, b, c, d, e, f, g, h) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e, f, g, h) #

shrink :: (a, b, c, d, e, f, g, h) -> [(a, b, c, d, e, f, g, h)] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h, Arbitrary i) => Arbitrary (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e, f, g, h, i) #

shrink :: (a, b, c, d, e, f, g, h, i) -> [(a, b, c, d, e, f, g, h, i)] #

(Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d, Arbitrary e, Arbitrary f, Arbitrary g, Arbitrary h, Arbitrary i, Arbitrary j) => Arbitrary (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (a, b, c, d, e, f, g, h, i, j) #

shrink :: (a, b, c, d, e, f, g, h, i, j) -> [(a, b, c, d, e, f, g, h, i, j)] #

class Arbitrary1 (f :: Type -> Type) where #

Minimal complete definition

liftArbitrary

Methods

liftArbitrary :: Gen a -> Gen (f a) #

liftShrink :: (a -> [a]) -> f a -> [f a] #

Instances

Instances details
Arbitrary1 ZipList 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (ZipList a) #

liftShrink :: (a -> [a]) -> ZipList a -> [ZipList a] #

Arbitrary1 Identity 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Identity a) #

liftShrink :: (a -> [a]) -> Identity a -> [Identity a] #

Arbitrary1 IntMap 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (IntMap a) #

liftShrink :: (a -> [a]) -> IntMap a -> [IntMap a] #

Arbitrary1 Seq 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Seq a) #

liftShrink :: (a -> [a]) -> Seq a -> [Seq a] #

Arbitrary1 Tree 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Tree a) #

liftShrink :: (a -> [a]) -> Tree a -> [Tree a] #

Arbitrary1 Maybe 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Maybe a) #

liftShrink :: (a -> [a]) -> Maybe a -> [Maybe a] #

Arbitrary1 [] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen [a] #

liftShrink :: (a -> [a]) -> [a] -> [[a]] #

Arbitrary a => Arbitrary1 (Either a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Either a a0) #

liftShrink :: (a0 -> [a0]) -> Either a a0 -> [Either a a0] #

(Ord k, Arbitrary k) => Arbitrary1 (Map k) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Map k a) #

liftShrink :: (a -> [a]) -> Map k a -> [Map k a] #

Arbitrary a => Arbitrary1 ((,) a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (a, a0) #

liftShrink :: (a0 -> [a0]) -> (a, a0) -> [(a, a0)] #

Arbitrary a => Arbitrary1 (Const a :: Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Const a a0) #

liftShrink :: (a0 -> [a0]) -> Const a a0 -> [Const a a0] #

Arbitrary a => Arbitrary1 (Constant a :: Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Constant a a0) #

liftShrink :: (a0 -> [a0]) -> Constant a a0 -> [Constant a a0] #

(Arbitrary1 f, Arbitrary1 g) => Arbitrary1 (Product f g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Product f g a) #

liftShrink :: (a -> [a]) -> Product f g a -> [Product f g a] #

CoArbitrary a => Arbitrary1 ((->) a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (a -> a0) #

liftShrink :: (a0 -> [a0]) -> (a -> a0) -> [a -> a0] #

(Arbitrary1 f, Arbitrary1 g) => Arbitrary1 (Compose f g) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Compose f g a) #

liftShrink :: (a -> [a]) -> Compose f g a -> [Compose f g a] #

class Arbitrary2 (f :: Type -> Type -> Type) where #

Minimal complete definition

liftArbitrary2

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (f a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> f a b -> [f a b] #

Instances

Instances details
Arbitrary2 Either 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Either a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Either a b -> [Either a b] #

Arbitrary2 (,) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (a, b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> (a, b) -> [(a, b)] #

Arbitrary2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Const a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Const a b -> [Const a b] #

Arbitrary2 (Constant :: Type -> Type -> Type) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Constant a b) #

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Constant a b -> [Constant a b] #

class CoArbitrary a where #

Minimal complete definition

Nothing

Methods

coarbitrary :: a -> Gen b -> Gen b #

Instances

Instances details
CoArbitrary All 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: All -> Gen b -> Gen b #

CoArbitrary Any 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Any -> Gen b -> Gen b #

CoArbitrary Version 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Version -> Gen b -> Gen b #

CoArbitrary Newline 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Newline -> Gen b -> Gen b #

CoArbitrary NewlineMode 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: NewlineMode -> Gen b -> Gen b #

CoArbitrary Int16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int16 -> Gen b -> Gen b #

CoArbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int32 -> Gen b -> Gen b #

CoArbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int64 -> Gen b -> Gen b #

CoArbitrary Int8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int8 -> Gen b -> Gen b #

CoArbitrary Word16 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word16 -> Gen b -> Gen b #

CoArbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word32 -> Gen b -> Gen b #

CoArbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word64 -> Gen b -> Gen b #

CoArbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word8 -> Gen b -> Gen b #

CoArbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntSet -> Gen b -> Gen b #

CoArbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Ordering -> Gen b -> Gen b #

CoArbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Integer -> Gen b -> Gen b #

CoArbitrary () 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: () -> Gen b -> Gen b #

CoArbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Bool -> Gen b -> Gen b #

CoArbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Char -> Gen b -> Gen b #

CoArbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Double -> Gen b -> Gen b #

CoArbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Float -> Gen b -> Gen b #

CoArbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int -> Gen b -> Gen b #

CoArbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (ZipList a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: ZipList a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Complex a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Complex a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Identity a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Identity a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (First a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: First a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Last a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Last a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Dual a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Dual a -> Gen b -> Gen b #

(Arbitrary a, CoArbitrary a) => CoArbitrary (Endo a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Endo a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Product a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Product a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Sum a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Sum a -> Gen b -> Gen b #

(Integral a, CoArbitrary a) => CoArbitrary (Ratio a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Ratio a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntMap a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Seq a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Set a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Tree a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Tree a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Maybe a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary [a] 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: [a] -> Gen b -> Gen b #

(CoArbitrary a, CoArbitrary b) => CoArbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Either a b -> Gen b0 -> Gen b0 #

HasResolution a => CoArbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Fixed a -> Gen b -> Gen b #

(CoArbitrary k, CoArbitrary v) => CoArbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Map k v -> Gen b -> Gen b #

(Arbitrary a, CoArbitrary b) => CoArbitrary (a -> b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: (a -> b) -> Gen b0 -> Gen b0 #

(CoArbitrary a, CoArbitrary b) => CoArbitrary (a, b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: (a, b) -> Gen b0 -> Gen b0 #

CoArbitrary a => CoArbitrary (Const a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Const a b -> Gen b0 -> Gen b0 #

CoArbitrary (f a) => CoArbitrary (Alt f a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Alt f a -> Gen b -> Gen b #

CoArbitrary a => CoArbitrary (Constant a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Constant a b -> Gen b0 -> Gen b0 #

(CoArbitrary a, CoArbitrary b, CoArbitrary c) => CoArbitrary (a, b, c) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: (a, b, c) -> Gen b0 -> Gen b0 #

(CoArbitrary a, CoArbitrary b, CoArbitrary c, CoArbitrary d) => CoArbitrary (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: (a, b, c, d) -> Gen b0 -> Gen b0 #

(CoArbitrary a, CoArbitrary b, CoArbitrary c, CoArbitrary d, CoArbitrary e) => CoArbitrary (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: (a, b, c, d, e) -> Gen b0 -> Gen b0 #

data Fun a b #

Constructors

Fun (a :-> b, b, Shrunk) (a -> b) 

Instances

Instances details
Functor (Fun a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap :: (a0 -> b) -> Fun a a0 -> Fun a b

(<$) :: a0 -> Fun a b -> Fun a a0

(Function a, CoArbitrary a, Arbitrary b) => Arbitrary (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

arbitrary :: Gen (Fun a b) #

shrink :: Fun a b -> [Fun a b] #

(Show a, Show b) => Show (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrec :: Int -> Fun a b -> ShowS

show :: Fun a b -> String

showList :: [Fun a b] -> ShowS

class Function a where #

Minimal complete definition

Nothing

Methods

function :: (a -> b) -> a :-> b #

Instances

Instances details
Function A 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (A -> b) -> A :-> b #

Function B 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (B -> b) -> B :-> b #

Function C 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (C -> b) -> C :-> b #

Function OrdA 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (OrdA -> b) -> OrdA :-> b #

Function OrdB 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (OrdB -> b) -> OrdB :-> b #

Function OrdC 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (OrdC -> b) -> OrdC :-> b #

Function All 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (All -> b) -> All :-> b #

Function Any 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Any -> b) -> Any :-> b #

Function Newline 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Newline -> b) -> Newline :-> b #

Function NewlineMode 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (NewlineMode -> b) -> NewlineMode :-> b #

Function Int16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int16 -> b) -> Int16 :-> b #

Function Int32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int32 -> b) -> Int32 :-> b #

Function Int64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int64 -> b) -> Int64 :-> b #

Function Int8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int8 -> b) -> Int8 :-> b #

Function Word16 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word16 -> b) -> Word16 :-> b #

Function Word32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word32 -> b) -> Word32 :-> b #

Function Word64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word64 -> b) -> Word64 :-> b #

Function Word8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word8 -> b) -> Word8 :-> b #

Function IntSet 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntSet -> b) -> IntSet :-> b #

Function Ordering 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Ordering -> b) -> Ordering :-> b #

Function Integer 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Integer -> b) -> Integer :-> b #

Function () 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (() -> b) -> () :-> b #

Function Bool 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Bool -> b) -> Bool :-> b #

Function Char 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Char -> b) -> Char :-> b #

Function Double 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Double -> b) -> Double :-> b #

Function Float 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Float -> b) -> Float :-> b #

Function Int 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int -> b) -> Int :-> b #

Function Word 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word -> b) -> Word :-> b #

(RealFloat a, Function a) => Function (Complex a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Complex a -> b) -> Complex a :-> b #

Function a => Function (Identity a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Identity a -> b) -> Identity a :-> b #

Function a => Function (First a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (First a -> b) -> First a :-> b #

Function a => Function (Last a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Last a -> b) -> Last a :-> b #

Function a => Function (Dual a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Dual a -> b) -> Dual a :-> b #

Function a => Function (Product a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Product a -> b) -> Product a :-> b #

Function a => Function (Sum a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Sum a -> b) -> Sum a :-> b #

(Integral a, Function a) => Function (Ratio a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Ratio a -> b) -> Ratio a :-> b #

Function a => Function (IntMap a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntMap a -> b) -> IntMap a :-> b #

Function a => Function (Seq a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Seq a -> b) -> Seq a :-> b #

(Ord a, Function a) => Function (Set a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Set a -> b) -> Set a :-> b #

Function a => Function (Tree a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Tree a -> b) -> Tree a :-> b #

Function a => Function (Maybe a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Maybe a -> b) -> Maybe a :-> b #

Function a => Function [a] 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ([a] -> b) -> [a] :-> b #

(Function a, Function b) => Function (Either a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Either a b -> b0) -> Either a b :-> b0 #

HasResolution a => Function (Fixed a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Fixed a -> b) -> Fixed a :-> b #

(Ord a, Function a, Function b) => Function (Map a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Map a b -> b0) -> Map a b :-> b0 #

(Function a, Function b) => Function (a, b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b) -> b0) -> (a, b) :-> b0 #

Function a => Function (Const a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Const a b -> b0) -> Const a b :-> b0 #

Function (f a) => Function (Alt f a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Alt f a -> b) -> Alt f a :-> b #

(Function a, Function b, Function c) => Function (a, b, c) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b, c) -> b0) -> (a, b, c) :-> b0 #

(Function a, Function b, Function c, Function d) => Function (a, b, c, d) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b, c, d) -> b0) -> (a, b, c, d) :-> b0 #

(Function a, Function b, Function c, Function d, Function e) => Function (a, b, c, d, e) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b, c, d, e) -> b0) -> (a, b, c, d, e) :-> b0 #

(Function a, Function b, Function c, Function d, Function e, Function f) => Function (a, b, c, d, e, f) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b, c, d, e, f) -> b0) -> (a, b, c, d, e, f) :-> b0 #

(Function a, Function b, Function c, Function d, Function e, Function f, Function g) => Function (a, b, c, d, e, f, g) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: ((a, b, c, d, e, f, g) -> b0) -> (a, b, c, d, e, f, g) :-> b0 #

data Gen a #

Instances

Instances details
MonadFix Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

mfix :: (a -> Gen a) -> Gen a

Applicative Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

pure :: a -> Gen a

(<*>) :: Gen (a -> b) -> Gen a -> Gen b

liftA2 :: (a -> b -> c) -> Gen a -> Gen b -> Gen c

(*>) :: Gen a -> Gen b -> Gen b

(<*) :: Gen a -> Gen b -> Gen a

Functor Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

fmap :: (a -> b) -> Gen a -> Gen b

(<$) :: a -> Gen b -> Gen a

Monad Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

(>>=) :: Gen a -> (a -> Gen b) -> Gen b

(>>) :: Gen a -> Gen b -> Gen b

return :: a -> Gen a

Testable prop => Testable (Gen prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Gen prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Gen prop) -> Property #

newtype ASCIIString #

Constructors

ASCIIString 

Fields

Instances

Instances details
Arbitrary ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Read ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS ASCIIString

readList :: ReadS [ASCIIString]

readPrec :: ReadPrec ASCIIString

readListPrec :: ReadPrec [ASCIIString]

Show ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> ASCIIString -> ShowS

show :: ASCIIString -> String

showList :: [ASCIIString] -> ShowS

Eq ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: ASCIIString -> ASCIIString -> Bool

(/=) :: ASCIIString -> ASCIIString -> Bool

Ord ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

newtype Blind a #

Constructors

Blind 

Fields

Instances

Instances details
Functor Blind 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Blind a -> Blind b

(<$) :: a -> Blind b -> Blind a

Arbitrary a => Arbitrary (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Blind a) #

shrink :: Blind a -> [Blind a] #

Enum a => Enum (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Blind a -> Blind a

pred :: Blind a -> Blind a

toEnum :: Int -> Blind a

fromEnum :: Blind a -> Int

enumFrom :: Blind a -> [Blind a]

enumFromThen :: Blind a -> Blind a -> [Blind a]

enumFromTo :: Blind a -> Blind a -> [Blind a]

enumFromThenTo :: Blind a -> Blind a -> Blind a -> [Blind a]

Num a => Num (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Blind a -> Blind a -> Blind a

(-) :: Blind a -> Blind a -> Blind a

(*) :: Blind a -> Blind a -> Blind a

negate :: Blind a -> Blind a

abs :: Blind a -> Blind a

signum :: Blind a -> Blind a

fromInteger :: Integer -> Blind a

Integral a => Integral (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Blind a -> Blind a -> Blind a

rem :: Blind a -> Blind a -> Blind a

div :: Blind a -> Blind a -> Blind a

mod :: Blind a -> Blind a -> Blind a

quotRem :: Blind a -> Blind a -> (Blind a, Blind a)

divMod :: Blind a -> Blind a -> (Blind a, Blind a)

toInteger :: Blind a -> Integer

Real a => Real (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Blind a -> Rational

Show (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Blind a -> ShowS

show :: Blind a -> String

showList :: [Blind a] -> ShowS

Eq a => Eq (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Blind a -> Blind a -> Bool

(/=) :: Blind a -> Blind a -> Bool

Ord a => Ord (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Blind a -> Blind a -> Ordering

(<) :: Blind a -> Blind a -> Bool

(<=) :: Blind a -> Blind a -> Bool

(>) :: Blind a -> Blind a -> Bool

(>=) :: Blind a -> Blind a -> Bool

max :: Blind a -> Blind a -> Blind a

min :: Blind a -> Blind a -> Blind a

newtype Fixed a #

Constructors

Fixed 

Fields

Instances

Instances details
Functor Fixed 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Fixed a -> Fixed b

(<$) :: a -> Fixed b -> Fixed a

Arbitrary a => Arbitrary (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Fixed a) #

shrink :: Fixed a -> [Fixed a] #

Enum a => Enum (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Fixed a -> Fixed a

pred :: Fixed a -> Fixed a

toEnum :: Int -> Fixed a

fromEnum :: Fixed a -> Int

enumFrom :: Fixed a -> [Fixed a]

enumFromThen :: Fixed a -> Fixed a -> [Fixed a]

enumFromTo :: Fixed a -> Fixed a -> [Fixed a]

enumFromThenTo :: Fixed a -> Fixed a -> Fixed a -> [Fixed a]

Num a => Num (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Fixed a -> Fixed a -> Fixed a

(-) :: Fixed a -> Fixed a -> Fixed a

(*) :: Fixed a -> Fixed a -> Fixed a

negate :: Fixed a -> Fixed a

abs :: Fixed a -> Fixed a

signum :: Fixed a -> Fixed a

fromInteger :: Integer -> Fixed a

Read a => Read (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Fixed a)

readList :: ReadS [Fixed a]

readPrec :: ReadPrec (Fixed a)

readListPrec :: ReadPrec [Fixed a]

Integral a => Integral (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Fixed a -> Fixed a -> Fixed a

rem :: Fixed a -> Fixed a -> Fixed a

div :: Fixed a -> Fixed a -> Fixed a

mod :: Fixed a -> Fixed a -> Fixed a

quotRem :: Fixed a -> Fixed a -> (Fixed a, Fixed a)

divMod :: Fixed a -> Fixed a -> (Fixed a, Fixed a)

toInteger :: Fixed a -> Integer

Real a => Real (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Fixed a -> Rational

Show a => Show (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Fixed a -> ShowS

show :: Fixed a -> String

showList :: [Fixed a] -> ShowS

Eq a => Eq (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Fixed a -> Fixed a -> Bool

(/=) :: Fixed a -> Fixed a -> Bool

Ord a => Ord (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Fixed a -> Fixed a -> Ordering

(<) :: Fixed a -> Fixed a -> Bool

(<=) :: Fixed a -> Fixed a -> Bool

(>) :: Fixed a -> Fixed a -> Bool

(>=) :: Fixed a -> Fixed a -> Bool

max :: Fixed a -> Fixed a -> Fixed a

min :: Fixed a -> Fixed a -> Fixed a

data InfiniteList a #

Constructors

InfiniteList 

Fields

Instances

Instances details
Arbitrary a => Arbitrary (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Show a => Show (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> InfiniteList a -> ShowS

show :: InfiniteList a -> String

showList :: [InfiniteList a] -> ShowS

newtype Large a #

Constructors

Large 

Fields

Instances

Instances details
Functor Large 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Large a -> Large b

(<$) :: a -> Large b -> Large a

(Integral a, Bounded a) => Arbitrary (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Large a) #

shrink :: Large a -> [Large a] #

Enum a => Enum (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Large a -> Large a

pred :: Large a -> Large a

toEnum :: Int -> Large a

fromEnum :: Large a -> Int

enumFrom :: Large a -> [Large a]

enumFromThen :: Large a -> Large a -> [Large a]

enumFromTo :: Large a -> Large a -> [Large a]

enumFromThenTo :: Large a -> Large a -> Large a -> [Large a]

Ix a => Ix (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

range :: (Large a, Large a) -> [Large a]

index :: (Large a, Large a) -> Large a -> Int

unsafeIndex :: (Large a, Large a) -> Large a -> Int

inRange :: (Large a, Large a) -> Large a -> Bool

rangeSize :: (Large a, Large a) -> Int

unsafeRangeSize :: (Large a, Large a) -> Int

Num a => Num (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Large a -> Large a -> Large a

(-) :: Large a -> Large a -> Large a

(*) :: Large a -> Large a -> Large a

negate :: Large a -> Large a

abs :: Large a -> Large a

signum :: Large a -> Large a

fromInteger :: Integer -> Large a

Read a => Read (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Large a)

readList :: ReadS [Large a]

readPrec :: ReadPrec (Large a)

readListPrec :: ReadPrec [Large a]

Integral a => Integral (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Large a -> Large a -> Large a

rem :: Large a -> Large a -> Large a

div :: Large a -> Large a -> Large a

mod :: Large a -> Large a -> Large a

quotRem :: Large a -> Large a -> (Large a, Large a)

divMod :: Large a -> Large a -> (Large a, Large a)

toInteger :: Large a -> Integer

Real a => Real (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Large a -> Rational

Show a => Show (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Large a -> ShowS

show :: Large a -> String

showList :: [Large a] -> ShowS

Eq a => Eq (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Large a -> Large a -> Bool

(/=) :: Large a -> Large a -> Bool

Ord a => Ord (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Large a -> Large a -> Ordering

(<) :: Large a -> Large a -> Bool

(<=) :: Large a -> Large a -> Bool

(>) :: Large a -> Large a -> Bool

(>=) :: Large a -> Large a -> Bool

max :: Large a -> Large a -> Large a

min :: Large a -> Large a -> Large a

newtype Negative a #

Constructors

Negative 

Fields

Instances

Instances details
Functor Negative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Negative a -> Negative b

(<$) :: a -> Negative b -> Negative a

(Num a, Ord a, Arbitrary a) => Arbitrary (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Negative a) #

shrink :: Negative a -> [Negative a] #

Enum a => Enum (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Negative a)

readList :: ReadS [Negative a]

readPrec :: ReadPrec (Negative a)

readListPrec :: ReadPrec [Negative a]

Show a => Show (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Negative a -> ShowS

show :: Negative a -> String

showList :: [Negative a] -> ShowS

Eq a => Eq (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Negative a -> Negative a -> Bool

(/=) :: Negative a -> Negative a -> Bool

Ord a => Ord (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Negative a -> Negative a -> Ordering

(<) :: Negative a -> Negative a -> Bool

(<=) :: Negative a -> Negative a -> Bool

(>) :: Negative a -> Negative a -> Bool

(>=) :: Negative a -> Negative a -> Bool

max :: Negative a -> Negative a -> Negative a

min :: Negative a -> Negative a -> Negative a

newtype NonEmptyList a #

Constructors

NonEmpty 

Fields

Instances

Instances details
Functor NonEmptyList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonEmptyList a -> NonEmptyList b

(<$) :: a -> NonEmptyList b -> NonEmptyList a

Arbitrary a => Arbitrary (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonEmptyList a)

readList :: ReadS [NonEmptyList a]

readPrec :: ReadPrec (NonEmptyList a)

readListPrec :: ReadPrec [NonEmptyList a]

Show a => Show (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonEmptyList a -> ShowS

show :: NonEmptyList a -> String

showList :: [NonEmptyList a] -> ShowS

Eq a => Eq (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonEmptyList a -> NonEmptyList a -> Bool

(/=) :: NonEmptyList a -> NonEmptyList a -> Bool

Ord a => Ord (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonEmptyList a -> NonEmptyList a -> Ordering

(<) :: NonEmptyList a -> NonEmptyList a -> Bool

(<=) :: NonEmptyList a -> NonEmptyList a -> Bool

(>) :: NonEmptyList a -> NonEmptyList a -> Bool

(>=) :: NonEmptyList a -> NonEmptyList a -> Bool

max :: NonEmptyList a -> NonEmptyList a -> NonEmptyList a

min :: NonEmptyList a -> NonEmptyList a -> NonEmptyList a

newtype NonNegative a #

Constructors

NonNegative 

Fields

Instances

Instances details
Functor NonNegative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonNegative a -> NonNegative b

(<$) :: a -> NonNegative b -> NonNegative a

(Num a, Ord a, Arbitrary a) => Arbitrary (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonNegative a)

readList :: ReadS [NonNegative a]

readPrec :: ReadPrec (NonNegative a)

readListPrec :: ReadPrec [NonNegative a]

Show a => Show (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonNegative a -> ShowS

show :: NonNegative a -> String

showList :: [NonNegative a] -> ShowS

Eq a => Eq (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonNegative a -> NonNegative a -> Bool

(/=) :: NonNegative a -> NonNegative a -> Bool

Ord a => Ord (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonNegative a -> NonNegative a -> Ordering

(<) :: NonNegative a -> NonNegative a -> Bool

(<=) :: NonNegative a -> NonNegative a -> Bool

(>) :: NonNegative a -> NonNegative a -> Bool

(>=) :: NonNegative a -> NonNegative a -> Bool

max :: NonNegative a -> NonNegative a -> NonNegative a

min :: NonNegative a -> NonNegative a -> NonNegative a

newtype NonPositive a #

Constructors

NonPositive 

Fields

Instances

Instances details
Functor NonPositive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonPositive a -> NonPositive b

(<$) :: a -> NonPositive b -> NonPositive a

(Num a, Ord a, Arbitrary a) => Arbitrary (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Enum a => Enum (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonPositive a)

readList :: ReadS [NonPositive a]

readPrec :: ReadPrec (NonPositive a)

readListPrec :: ReadPrec [NonPositive a]

Show a => Show (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonPositive a -> ShowS

show :: NonPositive a -> String

showList :: [NonPositive a] -> ShowS

Eq a => Eq (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonPositive a -> NonPositive a -> Bool

(/=) :: NonPositive a -> NonPositive a -> Bool

Ord a => Ord (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonPositive a -> NonPositive a -> Ordering

(<) :: NonPositive a -> NonPositive a -> Bool

(<=) :: NonPositive a -> NonPositive a -> Bool

(>) :: NonPositive a -> NonPositive a -> Bool

(>=) :: NonPositive a -> NonPositive a -> Bool

max :: NonPositive a -> NonPositive a -> NonPositive a

min :: NonPositive a -> NonPositive a -> NonPositive a

newtype NonZero a #

Constructors

NonZero 

Fields

Instances

Instances details
Functor NonZero 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonZero a -> NonZero b

(<$) :: a -> NonZero b -> NonZero a

(Num a, Eq a, Arbitrary a) => Arbitrary (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (NonZero a) #

shrink :: NonZero a -> [NonZero a] #

Enum a => Enum (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: NonZero a -> NonZero a

pred :: NonZero a -> NonZero a

toEnum :: Int -> NonZero a

fromEnum :: NonZero a -> Int

enumFrom :: NonZero a -> [NonZero a]

enumFromThen :: NonZero a -> NonZero a -> [NonZero a]

enumFromTo :: NonZero a -> NonZero a -> [NonZero a]

enumFromThenTo :: NonZero a -> NonZero a -> NonZero a -> [NonZero a]

Read a => Read (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonZero a)

readList :: ReadS [NonZero a]

readPrec :: ReadPrec (NonZero a)

readListPrec :: ReadPrec [NonZero a]

Show a => Show (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonZero a -> ShowS

show :: NonZero a -> String

showList :: [NonZero a] -> ShowS

Eq a => Eq (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonZero a -> NonZero a -> Bool

(/=) :: NonZero a -> NonZero a -> Bool

Ord a => Ord (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonZero a -> NonZero a -> Ordering

(<) :: NonZero a -> NonZero a -> Bool

(<=) :: NonZero a -> NonZero a -> Bool

(>) :: NonZero a -> NonZero a -> Bool

(>=) :: NonZero a -> NonZero a -> Bool

max :: NonZero a -> NonZero a -> NonZero a

min :: NonZero a -> NonZero a -> NonZero a

newtype OrderedList a #

Constructors

Ordered 

Fields

Instances

Instances details
Functor OrderedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> OrderedList a -> OrderedList b

(<$) :: a -> OrderedList b -> OrderedList a

(Ord a, Arbitrary a) => Arbitrary (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (OrderedList a)

readList :: ReadS [OrderedList a]

readPrec :: ReadPrec (OrderedList a)

readListPrec :: ReadPrec [OrderedList a]

Show a => Show (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> OrderedList a -> ShowS

show :: OrderedList a -> String

showList :: [OrderedList a] -> ShowS

Eq a => Eq (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: OrderedList a -> OrderedList a -> Bool

(/=) :: OrderedList a -> OrderedList a -> Bool

Ord a => Ord (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: OrderedList a -> OrderedList a -> Ordering

(<) :: OrderedList a -> OrderedList a -> Bool

(<=) :: OrderedList a -> OrderedList a -> Bool

(>) :: OrderedList a -> OrderedList a -> Bool

(>=) :: OrderedList a -> OrderedList a -> Bool

max :: OrderedList a -> OrderedList a -> OrderedList a

min :: OrderedList a -> OrderedList a -> OrderedList a

newtype Positive a #

Constructors

Positive 

Fields

Instances

Instances details
Functor Positive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Positive a -> Positive b

(<$) :: a -> Positive b -> Positive a

(Num a, Ord a, Arbitrary a) => Arbitrary (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Positive a) #

shrink :: Positive a -> [Positive a] #

Enum a => Enum (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Positive a)

readList :: ReadS [Positive a]

readPrec :: ReadPrec (Positive a)

readListPrec :: ReadPrec [Positive a]

Show a => Show (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Positive a -> ShowS

show :: Positive a -> String

showList :: [Positive a] -> ShowS

Eq a => Eq (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Positive a -> Positive a -> Bool

(/=) :: Positive a -> Positive a -> Bool

Ord a => Ord (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Positive a -> Positive a -> Ordering

(<) :: Positive a -> Positive a -> Bool

(<=) :: Positive a -> Positive a -> Bool

(>) :: Positive a -> Positive a -> Bool

(>=) :: Positive a -> Positive a -> Bool

max :: Positive a -> Positive a -> Positive a

min :: Positive a -> Positive a -> Positive a

newtype Shrink2 a #

Constructors

Shrink2 

Fields

Instances

Instances details
Functor Shrink2 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrink2 a -> Shrink2 b

(<$) :: a -> Shrink2 b -> Shrink2 a

Arbitrary a => Arbitrary (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Shrink2 a) #

shrink :: Shrink2 a -> [Shrink2 a] #

Enum a => Enum (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Shrink2 a -> Shrink2 a

pred :: Shrink2 a -> Shrink2 a

toEnum :: Int -> Shrink2 a

fromEnum :: Shrink2 a -> Int

enumFrom :: Shrink2 a -> [Shrink2 a]

enumFromThen :: Shrink2 a -> Shrink2 a -> [Shrink2 a]

enumFromTo :: Shrink2 a -> Shrink2 a -> [Shrink2 a]

enumFromThenTo :: Shrink2 a -> Shrink2 a -> Shrink2 a -> [Shrink2 a]

Num a => Num (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Shrink2 a -> Shrink2 a -> Shrink2 a

(-) :: Shrink2 a -> Shrink2 a -> Shrink2 a

(*) :: Shrink2 a -> Shrink2 a -> Shrink2 a

negate :: Shrink2 a -> Shrink2 a

abs :: Shrink2 a -> Shrink2 a

signum :: Shrink2 a -> Shrink2 a

fromInteger :: Integer -> Shrink2 a

Read a => Read (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Shrink2 a)

readList :: ReadS [Shrink2 a]

readPrec :: ReadPrec (Shrink2 a)

readListPrec :: ReadPrec [Shrink2 a]

Integral a => Integral (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Shrink2 a -> Shrink2 a -> Shrink2 a

rem :: Shrink2 a -> Shrink2 a -> Shrink2 a

div :: Shrink2 a -> Shrink2 a -> Shrink2 a

mod :: Shrink2 a -> Shrink2 a -> Shrink2 a

quotRem :: Shrink2 a -> Shrink2 a -> (Shrink2 a, Shrink2 a)

divMod :: Shrink2 a -> Shrink2 a -> (Shrink2 a, Shrink2 a)

toInteger :: Shrink2 a -> Integer

Real a => Real (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Shrink2 a -> Rational

Show a => Show (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrink2 a -> ShowS

show :: Shrink2 a -> String

showList :: [Shrink2 a] -> ShowS

Eq a => Eq (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Shrink2 a -> Shrink2 a -> Bool

(/=) :: Shrink2 a -> Shrink2 a -> Bool

Ord a => Ord (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Shrink2 a -> Shrink2 a -> Ordering

(<) :: Shrink2 a -> Shrink2 a -> Bool

(<=) :: Shrink2 a -> Shrink2 a -> Bool

(>) :: Shrink2 a -> Shrink2 a -> Bool

(>=) :: Shrink2 a -> Shrink2 a -> Bool

max :: Shrink2 a -> Shrink2 a -> Shrink2 a

min :: Shrink2 a -> Shrink2 a -> Shrink2 a

class ShrinkState s a where #

Methods

shrinkInit :: a -> s #

shrinkState :: a -> s -> [(a, s)] #

data Shrinking s a #

Constructors

Shrinking s a 

Instances

Instances details
Functor (Shrinking s) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrinking s a -> Shrinking s b

(<$) :: a -> Shrinking s b -> Shrinking s a

(Arbitrary a, ShrinkState s a) => Arbitrary (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Shrinking s a) #

shrink :: Shrinking s a -> [Shrinking s a] #

Show a => Show (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrinking s a -> ShowS

show :: Shrinking s a -> String

showList :: [Shrinking s a] -> ShowS

newtype Small a #

Constructors

Small 

Fields

Instances

Instances details
Functor Small 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Small a -> Small b

(<$) :: a -> Small b -> Small a

Integral a => Arbitrary (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Small a) #

shrink :: Small a -> [Small a] #

Enum a => Enum (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Small a -> Small a

pred :: Small a -> Small a

toEnum :: Int -> Small a

fromEnum :: Small a -> Int

enumFrom :: Small a -> [Small a]

enumFromThen :: Small a -> Small a -> [Small a]

enumFromTo :: Small a -> Small a -> [Small a]

enumFromThenTo :: Small a -> Small a -> Small a -> [Small a]

Ix a => Ix (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

range :: (Small a, Small a) -> [Small a]

index :: (Small a, Small a) -> Small a -> Int

unsafeIndex :: (Small a, Small a) -> Small a -> Int

inRange :: (Small a, Small a) -> Small a -> Bool

rangeSize :: (Small a, Small a) -> Int

unsafeRangeSize :: (Small a, Small a) -> Int

Num a => Num (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Small a -> Small a -> Small a

(-) :: Small a -> Small a -> Small a

(*) :: Small a -> Small a -> Small a

negate :: Small a -> Small a

abs :: Small a -> Small a

signum :: Small a -> Small a

fromInteger :: Integer -> Small a

Read a => Read (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Small a)

readList :: ReadS [Small a]

readPrec :: ReadPrec (Small a)

readListPrec :: ReadPrec [Small a]

Integral a => Integral (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Small a -> Small a -> Small a

rem :: Small a -> Small a -> Small a

div :: Small a -> Small a -> Small a

mod :: Small a -> Small a -> Small a

quotRem :: Small a -> Small a -> (Small a, Small a)

divMod :: Small a -> Small a -> (Small a, Small a)

toInteger :: Small a -> Integer

Real a => Real (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Small a -> Rational

Show a => Show (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Small a -> ShowS

show :: Small a -> String

showList :: [Small a] -> ShowS

Eq a => Eq (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Small a -> Small a -> Bool

(/=) :: Small a -> Small a -> Bool

Ord a => Ord (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Small a -> Small a -> Ordering

(<) :: Small a -> Small a -> Bool

(<=) :: Small a -> Small a -> Bool

(>) :: Small a -> Small a -> Bool

(>=) :: Small a -> Small a -> Bool

max :: Small a -> Small a -> Small a

min :: Small a -> Small a -> Small a

data Smart a #

Constructors

Smart Int a 

Instances

Instances details
Functor Smart 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Smart a -> Smart b

(<$) :: a -> Smart b -> Smart a

Arbitrary a => Arbitrary (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

arbitrary :: Gen (Smart a) #

shrink :: Smart a -> [Smart a] #

Show a => Show (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Smart a -> ShowS

show :: Smart a -> String

showList :: [Smart a] -> ShowS

newtype SortedList a #

Constructors

Sorted 

Fields

Instances

Instances details
Functor SortedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> SortedList a -> SortedList b

(<$) :: a -> SortedList b -> SortedList a

(Arbitrary a, Ord a) => Arbitrary (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Read a => Read (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (SortedList a)

readList :: ReadS [SortedList a]

readPrec :: ReadPrec (SortedList a)

readListPrec :: ReadPrec [SortedList a]

Show a => Show (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> SortedList a -> ShowS

show :: SortedList a -> String

showList :: [SortedList a] -> ShowS

Eq a => Eq (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: SortedList a -> SortedList a -> Bool

(/=) :: SortedList a -> SortedList a -> Bool

Ord a => Ord (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: SortedList a -> SortedList a -> Ordering

(<) :: SortedList a -> SortedList a -> Bool

(<=) :: SortedList a -> SortedList a -> Bool

(>) :: SortedList a -> SortedList a -> Bool

(>=) :: SortedList a -> SortedList a -> Bool

max :: SortedList a -> SortedList a -> SortedList a

min :: SortedList a -> SortedList a -> SortedList a

newtype UnicodeString #

Constructors

UnicodeString 

Fields

Instances

Instances details
Arbitrary UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Read UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS UnicodeString

readList :: ReadS [UnicodeString]

readPrec :: ReadPrec UnicodeString

readListPrec :: ReadPrec [UnicodeString]

Show UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> UnicodeString -> ShowS

show :: UnicodeString -> String

showList :: [UnicodeString] -> ShowS

Eq UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Ord UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

data Discard #

Constructors

Discard 

Instances

Instances details
Testable Discard 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Discard -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Discard) -> Property #

class Testable prop where #

Minimal complete definition

property

Methods

property :: prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> prop) -> Property #

Instances

Instances details
Testable Discard 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Discard -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Discard) -> Property #

Testable Prop 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Prop) -> Property #

Testable Property 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Property -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Property) -> Property #

Testable Result 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Result -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Result) -> Property #

Testable () 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: () -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> ()) -> Property #

Testable Bool 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Bool -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Bool) -> Property #

Testable prop => Testable (Gen prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Gen prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Gen prop) -> Property #

Testable prop => Testable (Maybe prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Maybe prop -> Property #

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Maybe prop) -> Property #

(Arbitrary a, Show a, Testable prop) => Testable (a -> prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: (a -> prop) -> Property #

propertyForAllShrinkShow :: Gen a0 -> (a0 -> [a0]) -> (a0 -> [String]) -> (a0 -> a -> prop) -> Property #

data Confidence #

Constructors

Confidence 

Fields

Instances

Instances details
Show Confidence 
Instance details

Defined in Test.QuickCheck.State

Methods

showsPrec :: Int -> Confidence -> ShowS

show :: Confidence -> String

showList :: [Confidence] -> ShowS

usedSize :: Result -> Int #

usedSeed :: Result -> QCGen #

theException :: Result -> Maybe AnException #

tables :: Result -> Map String (Map String Int) #

reason :: Result -> String #

output :: Result -> String #

numTests :: Result -> Int #

numShrinks :: Result -> Int #

numShrinkTries :: Result -> Int #

numShrinkFinal :: Result -> Int #

numDiscarded :: Result -> Int #

labels :: Result -> Map [String] Int #

failingTestCase :: Result -> [String] #

failingLabels :: Result -> [String] #

failingClasses :: Result -> Set String #

classes :: Result -> Map String Int #

pattern NoExpectedFailure :: Int -> Int -> !(Map [String] Int) -> !(Map String Int) -> !(Map String (Map String Int)) -> String -> Result #

pattern GaveUp :: Int -> Int -> !(Map [String] Int) -> !(Map String Int) -> !(Map String (Map String Int)) -> String -> Result #

pattern Success :: Int -> Int -> !(Map [String] Int) -> !(Map String Int) -> !(Map String (Map String Int)) -> String -> Result #

pattern Failure :: Int -> Int -> Int -> Int -> Int -> QCGen -> Int -> String -> Maybe AnException -> String -> [String] -> [String] -> Set String -> Result #

pattern Fn :: (a -> b) -> Fun a b #

pattern Fn2 :: (a -> b -> c) -> Fun (a, b) c #

pattern Fn3 :: (a -> b -> c -> d) -> Fun (a, b, c) d #

label :: Testable prop => String -> prop -> Property #

monomorphic :: Name -> ExpQ #

polyQuickCheck :: Name -> ExpQ #

polyVerboseCheck :: Name -> ExpQ #

(><) :: (Gen a -> Gen a) -> (Gen a -> Gen a) -> Gen a -> Gen a #

applyArbitrary2 :: (Arbitrary a, Arbitrary b) => (a -> b -> r) -> Gen r #

applyArbitrary3 :: (Arbitrary a, Arbitrary b, Arbitrary c) => (a -> b -> c -> r) -> Gen r #

applyArbitrary4 :: (Arbitrary a, Arbitrary b, Arbitrary c, Arbitrary d) => (a -> b -> c -> d -> r) -> Gen r #

arbitrary1 :: (Arbitrary1 f, Arbitrary a) => Gen (f a) #

arbitrary2 :: (Arbitrary2 f, Arbitrary a, Arbitrary b) => Gen (f a b) #

arbitraryBoundedEnum :: (Bounded a, Enum a) => Gen a #

arbitraryBoundedIntegral :: (Bounded a, Integral a) => Gen a #

arbitraryBoundedRandom :: (Bounded a, Random a) => Gen a #

arbitrarySizedBoundedIntegral :: (Bounded a, Integral a) => Gen a #

arbitrarySizedFractional :: Fractional a => Gen a #

arbitrarySizedIntegral :: Integral a => Gen a #

arbitrarySizedNatural :: Integral a => Gen a #

coarbitraryEnum :: Enum a => a -> Gen b -> Gen b #

coarbitraryIntegral :: Integral a => a -> Gen b -> Gen b #

coarbitraryReal :: Real a => a -> Gen b -> Gen b #

coarbitraryShow :: Show a => a -> Gen b -> Gen b #

genericCoarbitrary :: (Generic a, GCoArbitrary (Rep a)) => a -> Gen b -> Gen b #

genericShrink :: (Generic a, RecursivelyShrink (Rep a), GSubterms (Rep a) a) => a -> [a] #

orderedList :: (Ord a, Arbitrary a) => Gen [a] #

recursivelyShrink :: (Generic a, RecursivelyShrink (Rep a)) => a -> [a] #

shrink1 :: (Arbitrary1 f, Arbitrary a) => f a -> [f a] #

shrink2 :: (Arbitrary2 f, Arbitrary a, Arbitrary b) => f a b -> [f a b] #

shrinkBoundedEnum :: (Bounded a, Enum a, Eq a) => a -> [a] #

shrinkDecimal :: RealFrac a => a -> [a] #

shrinkIntegral :: Integral a => a -> [a] #

shrinkList :: (a -> [a]) -> [a] -> [[a]] #

shrinkMap :: Arbitrary a => (a -> b) -> (b -> a) -> b -> [b] #

shrinkMapBy :: (a -> b) -> (b -> a) -> (a -> [a]) -> b -> [b] #

shrinkNothing :: a -> [a] #

shrinkRealFrac :: RealFrac a => a -> [a] #

subterms :: (Generic a, GSubterms (Rep a) a) => a -> [a] #

vector :: Arbitrary a => Int -> Gen [a] #

discard :: a #

labelledExamples :: Testable prop => prop -> IO () #

labelledExamplesResult :: Testable prop => prop -> IO Result #

labelledExamplesWith :: Testable prop => Args -> prop -> IO () #

labelledExamplesWithResult :: Testable prop => Args -> prop -> IO Result #

applyFun :: Fun a b -> a -> b #

applyFun2 :: Fun (a, b) c -> a -> b -> c #

applyFun3 :: Fun (a, b, c) d -> a -> b -> c -> d #

functionBoundedEnum :: (Eq a, Bounded a, Enum a) => (a -> b) -> a :-> b #

functionIntegral :: Integral a => (a -> b) -> a :-> b #

functionMap :: Function b => (a -> b) -> (b -> a) -> (a -> c) -> a :-> c #

functionRealFrac :: RealFrac a => (a -> b) -> a :-> b #

functionShow :: (Show a, Read a) => (a -> c) -> a :-> c #

functionVoid :: (forall b. void -> b) -> void :-> c #

choose :: Random a => (a, a) -> Gen a #

chooseAny :: Random a => Gen a #

chooseBoundedIntegral :: (Bounded a, Integral a) => (a, a) -> Gen a #

chooseEnum :: Enum a => (a, a) -> Gen a #

chooseInt :: (Int, Int) -> Gen Int #

chooseInteger :: (Integer, Integer) -> Gen Integer #

elements :: [a] -> Gen a #

frequency :: [(Int, Gen a)] -> Gen a #

generate :: Gen a -> IO a #

getSize :: Gen Int #

growingElements :: [a] -> Gen a #

infiniteListOf :: Gen a -> Gen [a] #

listOf :: Gen a -> Gen [a] #

listOf1 :: Gen a -> Gen [a] #

oneof :: [Gen a] -> Gen a #

resize :: Int -> Gen a -> Gen a #

sample :: Show a => Gen a -> IO () #

sample' :: Gen a -> IO [a] #

scale :: (Int -> Int) -> Gen a -> Gen a #

shuffle :: [a] -> Gen [a] #

sized :: (Int -> Gen a) -> Gen a #

sublistOf :: [a] -> Gen [a] #

suchThat :: Gen a -> (a -> Bool) -> Gen a #

suchThatMap :: Gen a -> (a -> Maybe b) -> Gen b #

suchThatMaybe :: Gen a -> (a -> Bool) -> Gen (Maybe a) #

variant :: Integral n => n -> Gen a -> Gen a #

vectorOf :: Int -> Gen a -> Gen [a] #

(.&&.) :: (Testable prop1, Testable prop2) => prop1 -> prop2 -> Property #

(.&.) :: (Testable prop1, Testable prop2) => prop1 -> prop2 -> Property #

(.||.) :: (Testable prop1, Testable prop2) => prop1 -> prop2 -> Property #

(=/=) :: (Eq a, Show a) => a -> a -> Property #

(===) :: (Eq a, Show a) => a -> a -> Property #

(==>) :: Testable prop => Bool -> prop -> Property #

again :: Testable prop => prop -> Property #

checkCoverage :: Testable prop => prop -> Property #

classify :: Testable prop => Bool -> String -> prop -> Property #

collect :: (Show a, Testable prop) => a -> prop -> Property #

conjoin :: Testable prop => [prop] -> Property #

counterexample :: Testable prop => String -> prop -> Property #

cover :: Testable prop => Double -> Bool -> String -> prop -> Property #

coverTable :: Testable prop => String -> [(String, Double)] -> prop -> Property #

discardAfter :: Testable prop => Int -> prop -> Property #

disjoin :: Testable prop => [prop] -> Property #

expectFailure :: Testable prop => prop -> Property #

forAll :: (Show a, Testable prop) => Gen a -> (a -> prop) -> Property #

forAllBlind :: Testable prop => Gen a -> (a -> prop) -> Property #

forAllShow :: Testable prop => Gen a -> (a -> String) -> (a -> prop) -> Property #

forAllShrink :: (Show a, Testable prop) => Gen a -> (a -> [a]) -> (a -> prop) -> Property #

forAllShrinkBlind :: Testable prop => Gen a -> (a -> [a]) -> (a -> prop) -> Property #

forAllShrinkShow :: Testable prop => Gen a -> (a -> [a]) -> (a -> String) -> (a -> prop) -> Property #

idempotentIOProperty :: Testable prop => IO prop -> Property #

ioProperty :: Testable prop => IO prop -> Property #

mapSize :: Testable prop => (Int -> Int) -> prop -> Property #

noShrinking :: Testable prop => prop -> Property #

once :: Testable prop => prop -> Property #

printTestCase :: Testable prop => String -> prop -> Property #

shrinking :: Testable prop => (a -> [a]) -> a -> (a -> prop) -> Property #

tabulate :: Testable prop => String -> [String] -> prop -> Property #

total :: NFData a => a -> Property #

verboseShrinking :: Testable prop => prop -> Property #

whenFail :: Testable prop => IO () -> prop -> Property #

whenFail' :: Testable prop => IO () -> prop -> Property #

withMaxSuccess :: Testable prop => Int -> prop -> Property #

within :: Testable prop => Int -> prop -> Property #

isSuccess :: Result -> Bool #

Internal

If you are building a test suite, you don't need these functions.

They may be used by other tasty add-on packages (such as tasty-hspec).

newtype QC Source #

Constructors

QC Property 

Instances

Instances details
IsTest QC Source # 
Instance details

Defined in Test.Tasty.QuickCheck

Methods

run :: OptionSet -> QC -> (Progress -> IO ()) -> IO Result

testOptions :: Tagged QC [OptionDescription]

optionSetToArgs :: OptionSet -> IO (Int, Args) Source #

Convert tasty options into QuickCheck options.

This is a low-level function that was originally added for tasty-hspec but may be used by others.

Since: 0.9.1