module Prelude.Minimal (
Bool(False, True),
(&&), (||), not, otherwise,
Maybe(Nothing, Just),
fromMaybe, isNothing, isJust,
Either(Left, Right),
isLeft, isRight,
fst, snd, curry, uncurry,
head, last, tail, init, null, length, (!!),
reverse,
Ordering(LT, EQ, GT),
Category(id, (.)),
Monoid(mempty, mappend, mconcat),
(<>),
Functor(fmap, (<$)),
void, (<$>), ($>),
Applicative(pure, (<*>), (*>), (<*)),
(<**>),
Monad((>>=), (>>)),
(=<<), (>=>), (<=<),join,
Alternative(empty, (<|>), some, many),
optional, asum,
MonadPlus (mzero, mplus),
guard, msum, mfilter,
Foldable(fold, foldMap, foldr, foldr', foldl, foldl'),
toList, concat, concatMap,
and, or, any, all, sum, product, maximum, maximumBy,
minimum, minimumBy, elem, notElem, find,
Traversable(traverse, sequenceA),
for,
Eq((==), (/=)),
Ord(compare, (<), (<=), (>=), (>), max, min),
Enum(succ, pred, toEnum, fromEnum, enumFrom, enumFromThen,
enumFromTo, enumFromThenTo),
Bounded(minBound, maxBound),
const, flip, ($), until,
asTypeOf, error, undefined,
seq, ($!),
Char, String,
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,
Int, Integer, Float, Double,
Rational,
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,
) where
import GHC.Base
import Data.Maybe
import Data.Either
import Data.Tuple
import Data.List
import Control.Category (Category(..))
import Data.Monoid
import Data.Functor
import Control.Applicative
import Control.Monad
import Data.Foldable
import Data.Traversable
import GHC.Enum
import GHC.Num
import GHC.Real
import GHC.Float
import GHC.Show
import Text.Read
import System.IO
import System.IO.Error
import Prelude (($!), seq)