module Text.Parsers.Frisby.Char where
import Data.Char
import Text.Parsers.Frisby (P, anyChar, onlyIf)
control :: P s Char
control :: forall s. P s Char
control = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isControl
space :: P s Char
space :: forall s. P s Char
space = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isSpace
lower :: P s Char
lower :: forall s. P s Char
lower = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isLower
upper :: P s Char
upper :: forall s. P s Char
upper = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isUpper
alpha :: P s Char
alpha :: forall s. P s Char
alpha = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isAlpha
alphaNum :: P s Char
alphaNum :: forall s. P s Char
alphaNum = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isAlphaNum
printable :: P s Char
printable :: forall s. P s Char
printable = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isPrint
digit :: P s Char
digit :: forall s. P s Char
digit = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isDigit
octDigit :: P s Char
octDigit :: forall s. P s Char
octDigit = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isOctDigit
hexDigit :: P s Char
hexDigit :: forall s. P s Char
hexDigit = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isHexDigit
letter :: P s Char
letter :: forall s. P s Char
letter = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isLetter
mark :: P s Char
mark :: forall s. P s Char
mark = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isMark
number :: P s Char
number :: forall s. P s Char
number = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isNumber
punctuation :: P s Char
punctuation :: forall s. P s Char
punctuation = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isPunctuation
symbol :: P s Char
symbol :: forall s. P s Char
symbol = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isSymbol
separator :: P s Char
separator :: forall s. P s Char
separator = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isSeparator
ascii :: P s Char
ascii :: forall s. P s Char
ascii = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isAscii
latin1 :: P s Char
latin1 :: forall s. P s Char
latin1 = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isLatin1
asciiUpper :: P s Char
asciiUpper :: forall s. P s Char
asciiUpper = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isAsciiUpper
asciiLower :: P s Char
asciiLower :: forall s. P s Char
asciiLower = forall s. P s Char
anyChar forall s a. P s a -> (a -> Bool) -> P s a
`onlyIf` Char -> Bool
isAsciiLower