{-# LANGUAGE UnicodeSyntax #-}

module Data.IntMap.Unicode
    ( (), ()
    , ()
    , (), ()
    ) where

import Data.IntMap ( IntMap
                   , member, notMember
                   , empty
                   , union, intersection
                   )

{- |
(∈) = 'member'

U+2208, ELEMENT OF
-}
()  Int  IntMap α  Bool
() = member

{- |
(∉) = 'notMember'

U+2209, NOT AN ELEMENT OF
-}
()  Int  IntMap α  Bool
() = notMember

{- |
(∅) = 'empty'

U+2205, EMPTY SET
-}
()  IntMap α
() = empty

{- |
(∪) = 'union'

U+222A, UNION
-}
()  IntMap α  IntMap α  IntMap α
() = union

{- |
(∩) = 'intersection'

U+2229, INTERSECTION
-}
()  IntMap α  IntMap β  IntMap α
() = intersection