A RetroSearch Logo

Home - News ( United States | United Kingdom | Italy | Germany ) - Football scores

Search Query:

Showing content from http://hackage.haskell.org/packages/archive/base/4.5.0.0/doc/html/src/Prelude.html below:

Prelude.hs




















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,

#if defined(__NHC__)
    []((:), []),        
                        
    module Data.Tuple,  
    ()(..),             
    (->),               
#endif
#ifdef __HUGS__
    (:),                
#endif

    
    Eq((==), (/=)),
    Ord(compare, (<), (<=), (>=), (>), max, min),
    Enum(succ, pred, toEnum, fromEnum, enumFrom, enumFromThen,
         enumFromTo, enumFromThenTo),
    Bounded(minBound, maxBound),

    

    
    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,

    
    Monad((>>=), (>>), return, fail),
    Functor(fmap),
    mapM, mapM_, sequence, sequence_, (=<<),

    
    id, const, (.), flip, ($), until,
    asTypeOf, error, undefined,
    seq, ($!),

    
    map, (++), filter,
    head, last, tail, init, null, length, (!!),
    reverse,
    
    foldl, foldl1, foldr, foldr1,
    
    and, or, any, all,
    sum, product,
    concat, concatMap,
    maximum, minimum,
    
    
    scanl, scanl1, scanr, scanr1,
    
    iterate, repeat, replicate, cycle,
    
    take, drop, splitAt, takeWhile, dropWhile, span, break,
    
    elem, notElem, lookup,
    
    zip, zip3, zipWith, zipWith3, unzip, unzip3,
    
    lines, words, unlines, 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, catch

  ) where

#ifndef __HUGS__
import Control.Monad
import System.IO
import System.IO.Error
import Data.List
import Data.Either
import Data.Maybe
import Data.Tuple
#endif

#ifdef __GLASGOW_HASKELL__
import GHC.Base
import Text.Read
import GHC.Enum
import GHC.Num
import GHC.Real
import GHC.Float
import GHC.Show
import GHC.Err   ( undefined )
#endif

#ifdef __HUGS__
import Hugs.Prelude
#endif

#ifndef __HUGS__
infixr 0 $!
#endif





($!)    :: (a -> b) -> a -> b
#ifdef __GLASGOW_HASKELL__
f $! x  = let !vx = x in f vx  
#elif !defined(__HUGS__)
f $! x  = x `seq` f x
#endif

#ifdef __HADDOCK__



seq :: a -> b -> b
seq _ y = y
#endif

RetroSearch is an open source project built by @garambo | Open a GitHub Issue

Search and Browse the WWW like it's 1997 | Search results from DuckDuckGo

HTML: 3.2 | Encoding: UTF-8 | Version: 0.7.4