universum-1.2.0: Custom prelude used in Serokell

Safe HaskellUnsafe
LanguageHaskell2010

Universum.Base

Contents

Description

Reexports from GHC.* modules of base package.

Synopsis

Base types

module Data.Bits

module Data.Char

module Data.Int

module Data.Word

data Natural :: * #

Type representing arbitrary-precision non-negative integers.

Operations whose result would be negative throw (Underflow :: ArithException).

Since: 4.8.0.0

Instances

Enum Natural

Since: 4.8.0.0

Eq Natural 

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Integral Natural

Since: 4.8.0.0

Data Natural

Since: 4.8.0.0

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural #

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Natural) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) #

gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

Num Natural

Since: 4.8.0.0

Ord Natural 
Read Natural

Since: 4.8.0.0

Real Natural

Since: 4.8.0.0

Show Natural

Since: 4.8.0.0

Ix Natural

Since: 4.8.0.0

Lift Natural 

Methods

lift :: Natural -> Q Exp #

Bits Natural

Since: 4.8.0.0

NFData Natural

Since: 1.4.0.0

Methods

rnf :: Natural -> () #

Hashable Natural 

Methods

hashWithSalt :: Int -> Natural -> Int #

hash :: Natural -> Int #

Base type classes

module Data.Eq

module Data.Ord

System IO

module System.IO

Base GHC types

module Data.Proxy

module Data.Void

module GHC.Base

module GHC.Enum

module GHC.Exts

module GHC.Float

module GHC.Num

module GHC.Real

module GHC.Show

module GHC.Types

module GHC.Stack

Data.Kind

type Type = * #

The kind of types with values. For example Int :: Type.

($!) :: (a -> b) -> a -> b infixr 0 Source #

Stricter version of $ operator. Default Prelude defines this at the toplevel module, so we do as well.

>>> const 3 $ Prelude.undefined
3
>>> const 3 $! Prelude.undefined
*** Exception: Prelude.undefined
CallStack (from HasCallStack):
  error, called at libraries/base/GHC/Err.hs:79:14 in base:GHC.Err
...