-- Hoogle documentation, generated by Haddock -- See Hoogle, http://www.haskell.org/hoogle/ -- | Unicode alternatives for common functions and operators -- -- This package defines new symbols for a number of functions and -- operators in the base package. -- -- All symbols are documented with their actual definition and -- information regarding their Unicode code point. They should be -- completely interchangeable with their definitions. -- -- For further Unicode goodness you can enable the UnicodeSyntax -- language extension [1]. This extension enables Unicode characters to -- be used to stand for certain ASCII character sequences, i.e. → instead -- of ->, ∀ instead of forall and many others. -- -- Original idea by Péter Diviánszky. -- -- [1] -- http://www.haskell.org/ghc/docs/latest/html/users_guide/syntax-extns.html#unicode-syntax @package base-unicode-symbols @version 0.2.1.5 module Data.Ord.Unicode -- | (≤) = (<=) -- -- U+2264, LESS-THAN OR EQUAL TO (≤) :: Ord α => α -> α -> Bool -- | (≥) = (>=) -- -- U+2265, GREATER-THAN OR EQUAL TO (≥) :: Ord α => α -> α -> Bool -- | (≮) = (>=) -- -- U+226E, NOT LESS-THAN (≮) :: Ord α => α -> α -> Bool -- | (≯) = (<=) -- -- U+226F, NOT GREATER-THAN (≯) :: Ord α => α -> α -> Bool module Data.Monoid.Unicode -- | (∅) = mempty -- -- U+2205, EMPTY SET (∅) :: Monoid α => α -- | (⊕) = mappend -- -- U+2295, CIRCLED PLUS (⊕) :: Monoid α => α -> α -> α module Data.List.Unicode -- | (⧺) = (++) -- -- U+29FA, DOUBLE PLUS (⧺) :: [α] -> [α] -> [α] -- | (∈) = elem -- -- U+2208, ELEMENT OF (∈) :: Eq α => α -> [α] -> Bool -- | (∋) = flip (∈) -- -- U+220B, CONTAINS AS MEMBER (∋) :: Eq α => [α] -> α -> Bool -- | (∉) = notElem -- -- U+2209, NOT AN ELEMENT OF (∉) :: Eq α => α -> [α] -> Bool -- | (∌) = flip (∉) -- -- U+220C, DOES NOT CONTAIN AS MEMBER (∌) :: Eq α => [α] -> α -> Bool -- | (∪) = union -- -- U+222A, UNION (∪) :: Eq α => [α] -> [α] -> [α] -- | (∖) = (\\) -- -- U+2216, SET MINUS (∖) :: Eq α => [α] -> [α] -> [α] -- | Symmetric difference -- -- a ∆ b = (a ∖ b) ∪ (b ∖ a) -- -- U+2206, INCREMENT (∆) :: Eq α => [α] -> [α] -> [α] -- | (∩) = intersect -- -- U+2229, INTERSECTION (∩) :: Eq α => [α] -> [α] -> [α] module Data.Function.Unicode -- | (∘) = (.) -- -- U+2218, RING OPERATOR (∘) :: (β -> γ) -> (α -> β) -> (α -> γ) module Data.Foldable.Unicode -- | (∈) = elem -- -- U+2208, ELEMENT OF (∈) :: (Foldable t, Eq α) => α -> t α -> Bool -- | (∋) = flip (∈) -- -- U+220B, CONTAINS AS MEMBER (∋) :: (Foldable t, Eq α) => t α -> α -> Bool -- | (∉) = notElem -- -- U+2209, NOT AN ELEMENT OF (∉) :: (Foldable t, Eq α) => α -> t α -> Bool -- | (∌) = flip (∉) -- -- U+220C, DOES NOT CONTAIN AS MEMBER (∌) :: (Foldable t, Eq α) => t α -> α -> Bool module Data.Eq.Unicode -- | (≡) = (==) -- -- U+2261, IDENTICAL TO (≡) :: Eq α => α -> α -> Bool -- | (≢) = (/=) -- -- U+2262, NOT IDENTICAL TO (≢) :: Eq α => α -> α -> Bool -- | (≠) = (/=) -- -- U+2260, NOT EQUAL TO (≠) :: Eq α => α -> α -> Bool module Data.Bool.Unicode -- | (∧) = (&&) -- -- U+2227, LOGICAL AND (∧) :: Bool -> Bool -> Bool -- | (∨) = (||) -- -- U+2228, LOGICAL OR (∨) :: Bool -> Bool -> Bool -- | (¬) = not -- -- U+00AC, NOT SIGN (¬) :: Bool -> Bool module Prelude.Unicode -- | (¬) = not -- -- U+00AC, NOT SIGN (¬) :: Bool -> Bool -- | (∧) = (&&) -- -- U+2227, LOGICAL AND (∧) :: Bool -> Bool -> Bool -- | (∨) = (||) -- -- U+2228, LOGICAL OR (∨) :: Bool -> Bool -> Bool -- | (≡) = (==) -- -- U+2261, IDENTICAL TO (≡) :: Eq α => α -> α -> Bool -- | (≢) = (/=) -- -- U+2262, NOT IDENTICAL TO (≢) :: Eq α => α -> α -> Bool -- | (≠) = (/=) -- -- U+2260, NOT EQUAL TO (≠) :: Eq α => α -> α -> Bool -- | (≤) = (<=) -- -- U+2264, LESS-THAN OR EQUAL TO (≤) :: Ord α => α -> α -> Bool -- | (≥) = (>=) -- -- U+2265, GREATER-THAN OR EQUAL TO (≥) :: Ord α => α -> α -> Bool -- | (≮) = (>=) -- -- U+226E, NOT LESS-THAN (≮) :: Ord α => α -> α -> Bool -- | (≯) = (<=) -- -- U+226F, NOT GREATER-THAN (≯) :: Ord α => α -> α -> Bool -- | π = pi -- -- U+03C0, GREEK SMALL LETTER PI π :: Floating α => α -- | (÷) = (/) -- -- U+00F7, DIVISION SIGN (÷) :: Fractional α => α -> α -> α -- | (⋅) = (*) -- -- U+22C5, DOT OPERATOR (⋅) :: Num α => α -> α -> α -- | (∘) = (.) -- -- U+2218, RING OPERATOR (∘) :: (β -> γ) -> (α -> β) -> (α -> γ) -- | (⧺) = (++) -- -- U+29FA, DOUBLE PLUS (⧺) :: [α] -> [α] -> [α] -- | (∈) = elem -- -- U+2208, ELEMENT OF (∈) :: Eq α => α -> [α] -> Bool -- | (∉) = notElem -- -- U+2209, NOT AN ELEMENT OF (∉) :: Eq α => α -> [α] -> Bool -- | (⊥) = undefined -- -- U+22A5, UP TACK (⊥) :: α module Control.Monad.Unicode -- | (≫=) = (>>=) -- -- (U+226B, MUCH GREATER-THAN) + (U+3D, EQUALS SIGN) (≫=) :: Monad m => m α -> (α -> m β) -> m β -- | (≫) = (>>) -- -- U+226B, MUCH GREATER-THAN (≫) :: Monad m => m α -> m β -> m β -- | (=≪) = (=<<) -- -- (U+3D, EQUALS SIGN) + (U+226A, MUCH LESS-THAN) (=≪) :: Monad m => (α -> m β) -> m α -> m β module Control.Applicative.Unicode -- | (⊛) = <*> -- -- U+229B, CIRCLED ASTERISK OPERATOR (⊛) :: Applicative f => f (α -> β) -> f α -> f β -- | (∅) = empty -- -- U+2205, EMPTY SET (∅) :: Alternative f => f α module Control.Category.Unicode -- | (∘) = (.) -- -- U+2218, RING OPERATOR (∘) :: Category ⇝ => (β ⇝ γ) -> (α ⇝ β) -> (α ⇝ γ) -- | (⋙) = (>>>) -- -- U+22D9, VERY MUCH GREATER-THAN (⋙) :: Category ⇝ => (α ⇝ β) -> (β ⇝ γ) -> (α ⇝ γ) -- | (⋘) = (<<<) -- -- U+22D8, VERY MUCH LESS-THAN (⋘) :: Category ⇝ => (β ⇝ γ) -> (α ⇝ β) -> (α ⇝ γ) module Control.Arrow.Unicode -- | (⋙) = (>>>) -- -- U+22D9, VERY MUCH GREATER-THAN (⋙) :: Category ⇝ => (α ⇝ β) -> (β ⇝ γ) -> (α ⇝ γ) -- | (⋘) = (<<<) -- -- U+22D8, VERY MUCH LESS-THAN (⋘) :: Category ⇝ => (β ⇝ γ) -> (α ⇝ β) -> (α ⇝ γ) -- | (⁂) = (***) -- -- U+2042, ASTERISM (⁂) :: Arrow ⇝ => (α ⇝ β) -> (α' ⇝ β') -> (α, α') ⇝ (β, β') -- | (⧻) = (+++) -- -- U+29FB, TRIPLE PLUS (⧻) :: ArrowChoice ⇝ => (α ⇝ β) -> (α' ⇝ β') -> (Either α α' ⇝ Either β β') -- | (⫴) = (|||) -- -- U+2AF4, TRIPLE VERTICAL BAR BINARY RELATION (⫴) :: ArrowChoice ⇝ => (α ⇝ δ) -> (β ⇝ δ) -> (Either α β ⇝ δ)