module Control.Super.Monad.PreludeWithoutMonad
(
P.Bool(..)
, (P.&&), (P.||), P.not, P.otherwise
, P.Maybe(..)
, P.maybe
, P.Either(..)
, P.either
, P.Ordering(..)
, P.Char, P.String
, P.fst, P.snd, P.curry, P.uncurry
, P.Eq(..), P.Ord(..), P.Enum(..), P.Bounded(..)
, P.Int, P.Integer, P.Float, P.Double, P.Rational, P.Word
, P.Num(..), P.Real(..), P.Integral(..)
, P.Fractional(..), P.Floating(..)
, P.RealFrac(..), P.RealFloat(..)
, P.subtract, P.even, P.odd, P.gcd, P.lcm
, (P.^), (P.^^)
, P.fromIntegral, P.realToFrac
, P.Monoid(..)
, P.Functor(..), (P.<$>)
, P.Foldable(..)
, P.Traversable(traverse, sequenceA)
, P.id, P.const, P.flip, P.until, P.asTypeOf, P.error, P.undefined, P.seq
, (P..), (P.$), (P.$!)
, P.map, P.filter, P.head, P.last, P.tail, P.init, P.reverse
, (P.++), (P.!!)
, P.and, P.or, P.any, P.all
, P.concat, P.concatMap
, P.scanl, P.scanl1, P.scanr, P.scanr1
, P.iterate, P.repeat, P.replicate, P.cycle
, P.take, P.drop, P.splitAt, P.takeWhile, P.dropWhile, P.span, P.break
, P.notElem, P.lookup
, P.zip, P.zip3, P.zipWith, P.zipWith3, P.unzip, P.unzip3
, P.lines, P.words, P.unlines, P.unwords
, P.ShowS, P.Show(..)
, P.shows, P.showChar, P.showString, P.showParen
, P.ReadS, P.Read(..)
, P.reads, P.readParen, P.read, P.lex
, P.IO
, P.putChar, P.putStr, P.putStrLn, P.print
, P.getChar, P.getLine, P.getContents, P.interact
, P.FilePath
, P.readFile, P.writeFile, P.appendFile, P.readIO, P.readLn
, P.IOError
, P.ioError, P.userError
) where
import qualified Prelude as P