Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
Main module that reexports all functionality allowed to use
without importing any other modules. Just add next lines to your
module to replace default Prelude
with better one.
{-# LANGUAGE NoImplicitPrelude #-} import Relude
This documentation section contains description of internal module structure to help navigate between modules, search for interesting functionalities and understand where you need to put your new changes.
Functions and types are distributed across multiple modules and grouped by
meaning or theme. Name of the module should give you hints regarding what
this module contains. Some themes contain a great amount of both reexported
functions and functions of our own. To make it easier to understand these huge
chunks of functions, all reexported stuff is moved into separate module with
name Relude.SomeTheme.Reexport
and our own functions and types are in
Relude.SomeTheme.SomeName
. For example, see modules
Relude.Container.Class and Relude.Container.Reexport.
Below is a short description of what you can find under different modules:
- Relude.Applicative: reexports from Control.Applicative and some general-purpose applicative combinators.
- Relude.Base: different general types and type classes from
base
package (Int
,Num
,Generic
, etc.) not exported by other modules. - Relude.Bool:
Bool
data type with different predicates and combinators. - Relude.Debug:
trace
-like debugging functions with compile-time warnings (so you don't forget to remove them) - Relude.DeepSeq: reexports from Control.DeepSeq module and functions to evaluate expressions to weak-head normal form or normal form.
- Relude.Exception: reexports Control.Exception.Safe from
safe-exceptions
package,bug
as bettererror
,Exc
pattern synonym for convenient pattern-matching on exceptions. - Relude.Foldable: reexports functions for
Foldable
andTraversable
. - Relude.Function: almost everything from Data.Function module.
- Relude.Functor: reexports from Data.Functor, Data.Bifunctor,
other useful
Functor
combinators. - Relude.Lifted: lifted to
MonadIO
functions to work with console, files,IORef
s,MVar
s, etc. - Relude.List: big chunk of Data.List,
NonEmpty
type and functions for this type (head
,tail
,last
,init
). - Relude.Monad: monad transormers, combinators for
Maybe
andEither
. - Relude.Monoid: reexports from Data.Monoid and Data.Semigroup.
- Relude.Nub: better versions of
nub
function for list. - Relude.Print: polymorphic
putStrLn
function and functions to printText
. - Relude.String: reexports from
text
andbytestring
packages with conversion functions between different textual types. - Relude.Unsafe: unsafe functions (produce
error
). Not exported by Relude module by default.
Synopsis
- module Relude.Applicative
- module Relude.Base
- module Relude.Bool
- module Relude.Container
- module Relude.Debug
- module Relude.DeepSeq
- module Relude.Exception
- module Relude.Foldable
- module Relude.Function
- module Relude.Functor
- module Relude.Lifted
- module Relude.List
- module Relude.Monad
- module Relude.Monoid
- module Relude.Nub
- module Relude.Print
- module Relude.String
Reexports from base and from modules in this repo
module Relude.Applicative
module Relude.Base
module Relude.Bool
module Relude.Container
module Relude.Debug
module Relude.DeepSeq
module Relude.Exception
module Relude.Foldable
module Relude.Function
module Relude.Functor
module Relude.Lifted
module Relude.List
module Relude.Monad
module Relude.Monoid
module Relude.Nub
module Relude.Print
module Relude.String