preludeplus-0.1.0.4: Generalizes List functions and replaces partials with NonEmpty equivalents.

Copyright2018 Joshua Booth
LicenseBSD3 (see the file LICENSE)
MaintainerJoshua Booth <joshua.n.booth@gmail.com>
Safe HaskellSafe
LanguageHaskell2010

PreludePlus.Unicode

Contents

Description

Various unicode synonyms for basic functions.

Synopsis

Functional

(∘) :: (b -> g) -> (a -> b) -> a -> g infixr 9 Source #

(∘) = (.)

U+2218, RING OPERATOR

(↦) :: Functor f => f a -> (a -> b) -> f b infixl 4 Source #

(↦) = flip fmap

U+21A6, RIGHTWARDS ARROW FROM BAR

(↤) :: Functor f => (a -> b) -> f a -> f b infixl 4 Source #

(↤) = fmap

U+21A4, LEFTWARDS ARROW FROM BAR

(↤∘) :: Functor f => (a -> b) -> (c -> f a) -> c -> f b infixr 7 Source #

f ↤∘ g = fmap f ∘ g

(U+21A4, LEFTWARDS ARROW FROM BAR) + (U+2218, RING OPERATOR)

(≫=) :: Monad m => m a -> (a -> m b) -> m b infixl 1 Source #

(≫=) = (>>=)

(U+226B, MUCH GREATER-THAN) + (U+003D, EQUALS SIGN)

(≫) :: Monad m => m a -> m b -> m b infixl 1 Source #

(≫) = (>>)

U+226B, MUCH GREATER-THAN

(=≪) :: Monad m => (a -> m b) -> m a -> m b infixr 1 Source #

(=≪) = (=<<)

(U+003D, EQUALS SIGN) + (U+226A, MUCH LESS-THAN)

Boolean

(∨) :: Bool -> Bool -> Bool infixr 2 Source #

(∨) = (||)

U+2228, LOGICAL OR

(∧) :: Bool -> Bool -> Bool infixr 3 Source #

(∧) = (&&)

U+2227, LOGICAL AND

Comparison

(≡) :: Eq a => a -> a -> Bool infix 4 Source #

(≡) = (==)

U+2261, IDENTICAL TO

(≠) :: Eq a => a -> a -> Bool infix 4 Source #

(≠) = (/=)

U+2260, NOT EQUAL TO

(≤) :: Ord a => a -> a -> Bool infix 4 Source #

(≤) = (<=)

U+2264, LESS-THAN OR EQUAL TO

(≥) :: Ord a => a -> a -> Bool infix 4 Source #

(≥) = (>=)

U+2265, GREATER-THAN OR EQUAL TO

Arithmetic

(÷) :: Integral a => a -> a -> a infixl 7 Source #

(÷) = quot

U+00F7, DIVISION SIGN

(٪) :: Integral a => a -> a -> a infixl 7 Source #

(٪) = mod

U+066A, ARABIC PERCENT SIGN

(—) :: Num a => a -> a -> a Source #

(—) = (-)

U+2014, EM DASH

Allows for sections, as in (—3).

Collections

(⌥) :: Alternative f => f a -> f a -> f a Source #

(⌥) = (<|>)

U+2325, OPTION KEY

(∈) :: (Foldable a, Eq b) => b -> a b -> Bool infix 4 Source #

(∈) = elem

U+2208, ELEMENT OF

(∉) :: (Foldable a, Eq b) => b -> a b -> Bool infix 4 Source #

(∉) = notElem

U+2209, NOT AN ELEMENT OF

(⧺) :: Semigroup m => m -> m -> m infixr 5 Source #

(⧺) = (<>)

U+29FA, DOUBLE PLUS

(∪) :: Eq a => [a] -> [a] -> [a] infixl 6 Source #

(∪) = union

U+22A, UNION

(∩) :: Eq a => [a] -> [a] -> [a] infixr 6 Source #

(∩) = intersect

U+2229, INTERSECTION

(⩀) :: Eq a => [a] -> [a] -> Bool infixr 6 Source #

(⩀) a b = notnull $ intersect a b

U+2A40, INTERSECTION WITH DOT

(∖) :: Eq a => [a] -> [a] -> [a] infixr 5 Source #

(∖) = (\\)

U+2216, SET MINUS

ø :: Monoid a => a Source #

ø = mempty

U+00F8, LATIN SMALL LETTER O WITH STROKE