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

Data.Char.Private.Klingon

Description

Some fonts implement the Klingon script characters with the private usage area. Wikipedia describes the different fonts and Evertype provides a font to typeset Klingon script.

Synopsis

Representing Klingon characters

data Klingon Source #

A datatype to represent the Klingon characters, and their mapping to a Klingon font.

Constructors

A

The a character in Klingon script.

B

The b character in Klingon script.

Ch

The ch character in Klingon script.

D

The D character in Klingon script.

E

The e character in Klingon script.

Gh

The gh character in Klingon script.

H

The H character in Klingon script.

I

The I character in Klingon script.

J

The j character in Klingon script.

L

The l character in Klingon script.

M

The m character in Klingon script.

N

The n character in Klingon script.

Ng

The ng character in Klingon script.

O

The o character in Klingon script.

P

The p character in Klingon script.

Q

The q character in Klingon script.

QUpper

The Q character in Klingon script.

R

The r character in Klingon script.

S

The S character in Klingon script.

T

The t character in Klingon script.

Tlh

The tlh character in Klingon script.

U

The u character in Klingon script.

V

The v character in Klingon script.

W

The w character in Klingon script.

Y

The y character in Klingon script.

GlottalStop

The ʼ character in Klingon script, denoting the glottal stop.

Zero

The 0 character in Klingon script.

One

The 1 character in Klingon script.

Two

The 2 character in Klingon script.

Three

The 3 character in Klingon script.

Four

The 4 character in Klingon script.

Five

The 5 character in Klingon script.

Six

The 6 character in Klingon script.

Seven

The 7 character in Klingon script.

Eight

The 8 character in Klingon script.

Nine

The 9 character in Klingon script.

Comma

The comma character in Klingon script, denoted by an up-turned triangle.

FullStop

The full stop character in Klingon script, denoted by a down-turned triangle.

Mummification

The mummification character in Klingon script, also known as the klingon character for the empire or heart of virtue.

Instances

Instances details
Bounded Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Enum Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Eq Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Methods

(==) :: Klingon -> Klingon -> Bool #

(/=) :: Klingon -> Klingon -> Bool #

Data Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Methods

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

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

toConstr :: Klingon -> Constr #

dataTypeOf :: Klingon -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Read Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Show Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Generic Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Associated Types

type Rep Klingon :: Type -> Type #

Methods

from :: Klingon -> Rep Klingon x #

to :: Rep Klingon x -> Klingon #

Arbitrary Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

NFData Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Methods

rnf :: Klingon -> () #

Hashable Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

Methods

hashWithSalt :: Int -> Klingon -> Int #

hash :: Klingon -> Int #

UnicodeText Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

UnicodeCharacter Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

type Rep Klingon Source # 
Instance details

Defined in Data.Char.Private.Klingon

type Rep Klingon = D1 ('MetaData "Klingon" "Data.Char.Private.Klingon" "unicode-tricks-0.11.0.0-C7NrNgm5l6sAip6k96QRri" 'False) (((((C1 ('MetaCons "A" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "B" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Ch" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "D" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "E" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Gh" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "H" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "I" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "J" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "L" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "M" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "N" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Ng" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "O" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "P" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Q" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "QUpper" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "R" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "S" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "T" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Tlh" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "U" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "V" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "W" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Y" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GlottalStop" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Zero" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "One" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Two" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "Three" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Four" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Five" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Six" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Seven" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Eight" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Nine" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Comma" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FullStop" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Mummification" 'PrefixI 'False) (U1 :: Type -> Type)))))))