Copyright | (c) Edward Kmett 2010 |
---|---|
License | BSD3 |
Maintainer | ekmett@gmail.com |
Stability | experimental |
Portability | portable |
Safe Haskell | Safe-Inferred |
Language | Haskell2010 |
Provides unicode general categories, which are typically connoted by
\p{Ll}
or \p{Modifier_Letter}
. Lookups can be constructed using categories
or individual character sets can be used directly.
Synopsis
- data UnicodeCategory = UnicodeCategory String String CharSet String
- unicodeCategories :: [UnicodeCategory]
- modifierLetter :: CharSet
- otherLetter :: CharSet
- letter :: CharSet
- lowercaseLetter :: CharSet
- uppercaseLetter :: CharSet
- titlecaseLetter :: CharSet
- letterAnd :: CharSet
- nonSpacingMark :: CharSet
- spacingCombiningMark :: CharSet
- enclosingMark :: CharSet
- mark :: CharSet
- space :: CharSet
- lineSeparator :: CharSet
- paragraphSeparator :: CharSet
- separator :: CharSet
- mathSymbol :: CharSet
- currencySymbol :: CharSet
- modifierSymbol :: CharSet
- otherSymbol :: CharSet
- symbol :: CharSet
- decimalNumber :: CharSet
- letterNumber :: CharSet
- otherNumber :: CharSet
- number :: CharSet
- dashPunctuation :: CharSet
- openPunctuation :: CharSet
- closePunctuation :: CharSet
- initialQuote :: CharSet
- finalQuote :: CharSet
- connectorPunctuation :: CharSet
- otherPunctuation :: CharSet
- punctuation :: CharSet
- control :: CharSet
- format :: CharSet
- privateUse :: CharSet
- surrogate :: CharSet
- notAssigned :: CharSet
- other :: CharSet
Unicode General Category
data UnicodeCategory Source #
Instances
Data UnicodeCategory Source # | |
Defined in Data.CharSet.Unicode gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnicodeCategory -> c UnicodeCategory # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnicodeCategory # toConstr :: UnicodeCategory -> Constr # dataTypeOf :: UnicodeCategory -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnicodeCategory) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnicodeCategory) # gmapT :: (forall b. Data b => b -> b) -> UnicodeCategory -> UnicodeCategory # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnicodeCategory -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnicodeCategory -> r # gmapQ :: (forall d. Data d => d -> u) -> UnicodeCategory -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UnicodeCategory -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnicodeCategory -> m UnicodeCategory # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnicodeCategory -> m UnicodeCategory # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnicodeCategory -> m UnicodeCategory # | |
Show UnicodeCategory Source # | |
Defined in Data.CharSet.Unicode showsPrec :: Int -> UnicodeCategory -> ShowS # show :: UnicodeCategory -> String # showList :: [UnicodeCategory] -> ShowS # |
Lookup
CharSets by UnicodeCategory
Letter
Letter&
Mark
Separator
Symbol
mathSymbol :: CharSet Source #
Number
Punctuation
finalQuote :: CharSet Source #
Other
privateUse :: CharSet Source #