unicode-tricks-0.14.1.0: Functions to work with unicode blocks more convenient.
Maintainerhapytexeu+gh@gmail.com
Stabilityexperimental
PortabilityPOSIX
Safe HaskellSafe
LanguageHaskell2010

Data.Char.Emoji.NoEvilMonkey

Description

Unicode has three codepoints that refer to characters of monkeys where the first one does not see, the second does not hear, and the third one does not speak.

Synopsis

Documentation

data NoEvilMonkey Source #

A data constructors that lists the three different no-evil monkeys.

Constructors

SeeNoEvilMonkey

The see-no-evil monkey, denoted with 🙈.

HearNoEvilMonkey

The hear-no-evil monkey, denoted with 🙉.

SpeakNoEvilMonkey

The speak-no-evil monkey, denoted with 🙊.

Instances

Instances details
Arbitrary NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Data NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoEvilMonkey -> c NoEvilMonkey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoEvilMonkey #

toConstr :: NoEvilMonkey -> Constr #

dataTypeOf :: NoEvilMonkey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoEvilMonkey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoEvilMonkey) #

gmapT :: (forall b. Data b => b -> b) -> NoEvilMonkey -> NoEvilMonkey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoEvilMonkey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoEvilMonkey -> r #

gmapQ :: (forall d. Data d => d -> u) -> NoEvilMonkey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoEvilMonkey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoEvilMonkey -> m NoEvilMonkey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEvilMonkey -> m NoEvilMonkey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEvilMonkey -> m NoEvilMonkey #

Bounded NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Enum NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Generic NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Associated Types

type Rep NoEvilMonkey :: Type -> Type #

Read NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Show NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

NFData NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Methods

rnf :: NoEvilMonkey -> () #

Eq NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Ord NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

Hashable NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

UnicodeCharacter NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

UnicodeText NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

type Rep NoEvilMonkey Source # 
Instance details

Defined in Data.Char.Emoji.NoEvilMonkey

type Rep NoEvilMonkey = D1 ('MetaData "NoEvilMonkey" "Data.Char.Emoji.NoEvilMonkey" "unicode-tricks-0.14.1.0-EInLeozqGjBL3vIQTNPsAm" 'False) (C1 ('MetaCons "SeeNoEvilMonkey" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "HearNoEvilMonkey" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SpeakNoEvilMonkey" 'PrefixI 'False) (U1 :: Type -> Type)))