universum-1.8.1.1: Custom prelude used in Serokell
Safe HaskellTrustworthy
LanguageHaskell2010

Universum

Description

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 Universum

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 Universum.SomeTheme.Reexport and our own functions and types are in Universum.SomeTheme.SomeName. For example, see modules Universum.Container.Class and Universum.Container.Reexport.

Below is a short description of what you can find under different modules:

Synopsis

Reexports from base and from modules in this repo

Lenses

type Lens s t a b = forall f. Functor f => (a -> f b) -> s -> f t Source #

Deprecated: Use corresponding function from lens or microlens package

type Lens' s a = Lens s s a a Source #

Deprecated: Use corresponding function from lens or microlens package

type Traversal s t a b = forall f. Applicative f => (a -> f b) -> s -> f t Source #

Deprecated: Use corresponding function from lens or microlens package

type Traversal' s a = Traversal s s a a Source #

Deprecated: Use corresponding function from lens or microlens package

over :: ASetter s t a b -> (a -> b) -> s -> t Source #

Deprecated: Use corresponding function from lens or microlens package

set :: ASetter s t a b -> b -> s -> t Source #

Deprecated: Use corresponding function from lens or microlens package

(%~) :: ASetter s t a b -> (a -> b) -> s -> t infixr 4 Source #

Deprecated: Use corresponding function from lens or microlens package

(.~) :: ASetter s t a b -> b -> s -> t infixr 4 Source #

Deprecated: Use corresponding function from lens or microlens package

(^.) :: s -> Getting a s a -> a infixl 8 Source #

Deprecated: Use corresponding function from lens or microlens package

(^..) :: s -> Getting (Endo [a]) s a -> [a] infixl 8 Source #

Deprecated: Use corresponding function from lens or microlens package

(^?) :: s -> Getting (First a) s a -> Maybe a infixl 8 Source #

Deprecated: Use corresponding function from lens or microlens package

_1 :: Field1 s t a b => Lens s t a b Source #

Deprecated: Use corresponding function from lens or microlens package

_2 :: Field2 s t a b => Lens s t a b Source #

Deprecated: Use corresponding function from lens or microlens package

_3 :: Field3 s t a b => Lens s t a b Source #

Deprecated: Use corresponding function from lens or microlens package

_4 :: Field4 s t a b => Lens s t a b Source #

Deprecated: Use corresponding function from lens or microlens package

_5 :: Field5 s t a b => Lens s t a b Source #

Deprecated: Use corresponding function from lens or microlens package

preuse :: MonadState s m => Getting (First a) s a -> m (Maybe a) Source #

Deprecated: Use corresponding function from lens or microlens package

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) Source #

Deprecated: Use corresponding function from lens or microlens package

use :: MonadState s m => Getting a s a -> m a Source #

Deprecated: Use corresponding function from lens or microlens package

view :: MonadReader s m => Getting a s a -> m a Source #

Deprecated: Use corresponding function from lens or microlens package