{-# LANGUAGE Trustworthy #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE ExplicitNamespaces #-}
module Prelude (
Bool(False, True),
(&&), (||), not, otherwise,
Maybe(Nothing, Just),
maybe,
Either(Left, Right),
either,
Ordering(LT, EQ, GT),
Char, String,
fst, snd, curry, uncurry,
Eq((==), (/=)),
Ord(compare, (<), (<=), (>=), (>), max, min),
Enum(succ, pred, toEnum, fromEnum, enumFrom, enumFromThen,
enumFromTo, enumFromThenTo),
Bounded(minBound, maxBound),
Int, Integer, Float, Double,
Rational, Word,
Num((+), (-), (*), negate, abs, signum, fromInteger),
Real(toRational),
Integral(quot, rem, div, mod, quotRem, divMod, toInteger),
Fractional((/), recip, fromRational),
Floating(pi, exp, log, sqrt, (**), logBase, sin, cos, tan,
asin, acos, atan, sinh, cosh, tanh, asinh, acosh, atanh),
RealFrac(properFraction, truncate, round, ceiling, floor),
RealFloat(floatRadix, floatDigits, floatRange, decodeFloat,
encodeFloat, exponent, significand, scaleFloat, isNaN,
isInfinite, isDenormalized, isIEEE, isNegativeZero, atan2),
subtract, even, odd, gcd, lcm, (^), (^^),
fromIntegral, realToFrac,
Semigroup((<>)),
Monoid(mempty, mappend, mconcat),
Functor(fmap, (<$)), (<$>),
Applicative(pure, (<*>), (*>), (<*), liftA2),
Monad((>>=), (>>), return),
MonadFail(fail),
mapM_, sequence_, (=<<),
Foldable(elem,
foldMap,
foldr,
foldl,
foldl',
foldr1,
foldl1,
maximum,
minimum,
product,
sum),
Traversable(traverse, sequenceA, mapM, sequence),
id, const, (.), flip, ($), until,
asTypeOf, error, errorWithoutStackTrace, undefined,
seq, ($!),
List.map, (List.++), List.filter,
List.head, List.last, List.tail, List.init, (List.!!),
Foldable.null, Foldable.length,
List.reverse,
Foldable.and, Foldable.or, Foldable.any, Foldable.all,
Foldable.concat, Foldable.concatMap,
List.scanl, List.scanl1, List.scanr, List.scanr1,
List.iterate, List.repeat, List.replicate, List.cycle,
List.take, List.drop,
List.takeWhile, List.dropWhile,
List.span, List.break,
List.splitAt,
Foldable.notElem,
List.lookup,
List.zip, List.zip3,
List.zipWith, List.zipWith3,
List.unzip, List.unzip3,
List.lines, List.words, List.unlines, List.unwords,
ShowS,
Show(showsPrec, showList, show),
shows,
showChar, showString, showParen,
ReadS,
Read(readsPrec, readList),
reads, readParen, read, lex,
IO,
putChar,
putStr, putStrLn, print,
getChar,
getLine, getContents, interact,
FilePath,
readFile, writeFile, appendFile, readIO, readLn,
IOError, ioError, userError,
type (~)
) where
import GHC.Internal.Control.Monad
import GHC.Internal.System.IO
import GHC.Internal.System.IO.Error
import qualified GHC.Internal.Data.List as List
import GHC.Internal.Data.Either
import GHC.Internal.Data.Foldable ( Foldable(..) )
import qualified GHC.Internal.Data.Foldable as Foldable
import GHC.Internal.Data.Functor ( (<$>) )
import GHC.Internal.Data.Maybe
import GHC.Internal.Data.Traversable ( Traversable(..) )
import GHC.Internal.Data.Tuple
import GHC.Internal.Base hiding ( foldr, mapM, sequence )
import GHC.Internal.Text.Read
import GHC.Internal.Enum
import GHC.Internal.Num
import GHC.Internal.Real
import GHC.Internal.Float
import GHC.Internal.Show