{-# LANGUAGE NoImplicitPrelude, UnicodeSyntax #-}
module Data.Foldable.Unicode where
import Data.Bool ( Bool )
import Data.Eq ( Eq )
import Data.Function ( flip )
import Data.Foldable ( Foldable, elem, notElem )
infix 4 ∈
infix 4 ∋
infix 4 ∉
infix 4 ∌
(∈) ∷ (Foldable t, Eq α) ⇒ α → t α → Bool
∈ :: forall (t :: * -> *) α. (Foldable t, Eq α) => α -> t α -> Bool
(∈) = α -> t α -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
elem
{-# INLINE (∈) #-}
(∋) ∷ (Foldable t, Eq α) ⇒ t α → α → Bool
∋ :: forall (t :: * -> *) α. (Foldable t, Eq α) => t α -> α -> Bool
(∋) = (α -> t α -> Bool) -> t α -> α -> Bool
forall a b c. (a -> b -> c) -> b -> a -> c
flip α -> t α -> Bool
forall (t :: * -> *) α. (Foldable t, Eq α) => α -> t α -> Bool
(∈)
{-# INLINE (∋) #-}
(∉) ∷ (Foldable t, Eq α) ⇒ α → t α → Bool
∉ :: forall (t :: * -> *) α. (Foldable t, Eq α) => α -> t α -> Bool
(∉) = α -> t α -> Bool
forall (t :: * -> *) α. (Foldable t, Eq α) => α -> t α -> Bool
notElem
{-# INLINE (∉) #-}
(∌) ∷ (Foldable t, Eq α) ⇒ t α → α → Bool
∌ :: forall (t :: * -> *) α. (Foldable t, Eq α) => t α -> α -> Bool
(∌) = (α -> t α -> Bool) -> t α -> α -> Bool
forall a b c. (a -> b -> c) -> b -> a -> c
flip α -> t α -> Bool
forall (t :: * -> *) α. (Foldable t, Eq α) => α -> t α -> Bool
(∉)
{-# INLINE (∌) #-}