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.Science

Description

Unicode defines nine Emoji related to science. This module has a data type together with functions to convert this to and from a text fragment.

Synopsis

Defining science emoji.

data ScienceEmoji Source #

There are nine emoji that depict science.

Constructors

Alembic 
TestTube

A test tube is used to conduct chemical experiments. Normally this is depicted as 🧪.

PetriDish

A petri dish is used to culture microbes. Normally this is depicted as 🧫.

DnaDoubleHelix

A double helix of DNA is the genetic blueprint of life. Normally this is depicted as 🧬.

Microscope

A microscope is used to magnify small objects. Normally this is depicted as 🔬.

Telescope

A telescope is used to gaze at stars and planets in the night sky. Normally this is depicted as 🔭.

SatelliteAntenna

A dish satellite is used to send and receive to or from communication satellites. This is normally depicited as 📡.

Instances

Instances details
Arbitrary ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Data ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Methods

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

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

toConstr :: ScienceEmoji -> Constr #

dataTypeOf :: ScienceEmoji -> DataType #

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

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

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

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

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

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

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

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

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

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

Bounded ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Enum ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Generic ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Associated Types

type Rep ScienceEmoji :: Type -> Type #

Read ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Show ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

NFData ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Methods

rnf :: ScienceEmoji -> () #

Eq ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Ord ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

Hashable ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

UnicodeText ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

type Rep ScienceEmoji Source # 
Instance details

Defined in Data.Char.Emoji.Science

type Rep ScienceEmoji = D1 ('MetaData "ScienceEmoji" "Data.Char.Emoji.Science" "unicode-tricks-0.14.1.0-EInLeozqGjBL3vIQTNPsAm" 'False) ((C1 ('MetaCons "Alembic" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TestTube" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PetriDish" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DnaDoubleHelix" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Microscope" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Telescope" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SatelliteAntenna" 'PrefixI 'False) (U1 :: Type -> Type))))