{-# LANGUAGE UnicodeSyntax #-}

module Data.Map.Unicode
    {-# DEPRECATED "Use the package containers-unicode-symbols instead" #-}
    ( (), ()
    , ()
    , (), ()
    ) where

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

{- |
(∈) = 'member'

U+2208, ELEMENT OF
-}
()  Ord k  k  Map k α  Bool
() = member

{- |
(∉) = 'notMember'

U+2209, NOT AN ELEMENT OF
-}
()  Ord k  k  Map k α  Bool
() = notMember

{- |
(∅) = 'empty'

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

{- |
(∪) = 'union'

U+222A, UNION
-}
()  Ord k  Map k α  Map k α  Map k α
() = union

{- |
(∩) = 'intersection'

U+2229, INTERSECTION
-}
()  Ord k  Map k α  Map k β  Map k α
() = intersection