module Test.QuickCheck.Instances.CustomPrelude (
module Export,
) where
import Control.Applicative as Export (Applicative (pure, (<*>)), (<$>))
import Data.Traversable as Export (Traversable (..))
import Prelude as Export
(Bounded (..), Either (..), Enum (..), Eq (..), Functor (..),
Maybe (..), Monad ((>>=)), Ord (..), Ordering (..), const, flip, fst,
id, otherwise, replicate, return, uncurry, ($), (.))
import Prelude as Export (length, map, (++))
import Prelude as Export
(Double, Fractional (..), Int, Integral (..), Num (..), Real (..),
fromIntegral)
import Prelude as Export (error, undefined)