universum-1.7.1: Custom prelude used in Serokell

Safe HaskellUnsafe
LanguageHaskell2010

Universum.Unsafe

Description

Unsafe functions to work with lists and Maybe. Sometimes unavoidable but better don't use them. This module is intended to be imported qualified and it's not even included in default prelude exports.

import qualified Universum.Unsafe as Unsafe

foo :: [a] -> a
foo = Unsafe.head
Synopsis

Documentation

head :: [a] -> a #

Extract the first element of a list, which must be non-empty.

tail :: [a] -> [a] #

Extract the elements after the head of a list, which must be non-empty.

init :: [a] -> [a] #

Return all the elements of a list except the last one. The list must be non-empty.

last :: [a] -> a #

Extract the last element of a list, which must be finite and non-empty.

at :: Int -> [a] -> a Source #

Similar to !! but with flipped arguments.

(!!) :: [a] -> Int -> a infixl 9 #

List index (subscript) operator, starting from 0. It is an instance of the more general genericIndex, which takes an index of any integral type.

fromJust :: Maybe a -> a #

The fromJust function extracts the element out of a Just and throws an error if its argument is Nothing.

Examples

Expand

Basic usage:

>>> fromJust (Just 1)
1
>>> 2 * (fromJust (Just 10))
20
>>> 2 * (fromJust Nothing)
*** Exception: Maybe.fromJust: Nothing

foldr1 :: Foldable t => (a -> a -> a) -> t a -> a #

A variant of foldr that has no base case, and thus may only be applied to non-empty structures.

foldr1 f = foldr1 f . toList

foldl1 :: Foldable t => (a -> a -> a) -> t a -> a #

A variant of foldl that has no base case, and thus may only be applied to non-empty structures.

foldl1 f = foldl1 f . toList

minimum :: (Foldable t, Ord a) => t a -> a #

The least element of a non-empty structure.

maximum :: (Foldable t, Ord a) => t a -> a #

The largest element of a non-empty structure.

minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The least element of a non-empty structure with respect to the given comparison function.

maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

The largest element of a non-empty structure with respect to the given comparison function.