Haskell Hierarchical Libraries (parsec package)ContentsIndex
Text.ParserCombinators.Parsec.Token
Portabilitynon-portable (uses existentially quantified data constructors)
Stabilityprovisional
Maintainerdaan@cs.uu.nl
Description
A helper module to parse lexical elements (tokens).
Documentation
data LanguageDef st
Constructors
LanguageDef
commentStart :: String
commentEnd :: String
commentLine :: String
nestedComments :: Bool
identStart :: (CharParser st Char)
identLetter :: (CharParser st Char)
opStart :: (CharParser st Char)
opLetter :: (CharParser st Char)
reservedNames :: [String]
reservedOpNames :: [String]
caseSensitive :: Bool
data TokenParser st
Constructors
TokenParser
identifier :: (CharParser st String)
reserved :: (String -> CharParser st ())
operator :: (CharParser st String)
reservedOp :: (String -> CharParser st ())
charLiteral :: (CharParser st Char)
stringLiteral :: (CharParser st String)
natural :: (CharParser st Integer)
integer :: (CharParser st Integer)
float :: (CharParser st Double)
naturalOrFloat :: (CharParser st (Either Integer Double))
decimal :: (CharParser st Integer)
hexadecimal :: (CharParser st Integer)
octal :: (CharParser st Integer)
symbol :: (String -> CharParser st String)
lexeme :: (forall a . CharParser st a -> CharParser st a)
whiteSpace :: (CharParser st ())
parens :: (forall a . CharParser st a -> CharParser st a)
braces :: (forall a . CharParser st a -> CharParser st a)
angles :: (forall a . CharParser st a -> CharParser st a)
brackets :: (forall a . CharParser st a -> CharParser st a)
squares :: (forall a . CharParser st a -> CharParser st a)
semi :: (CharParser st String)
comma :: (CharParser st String)
colon :: (CharParser st String)
dot :: (CharParser st String)
semiSep :: (forall a . CharParser st a -> CharParser st [a])
semiSep1 :: (forall a . CharParser st a -> CharParser st [a])
commaSep :: (forall a . CharParser st a -> CharParser st [a])
commaSep1 :: (forall a . CharParser st a -> CharParser st [a])
makeTokenParser :: LanguageDef st -> TokenParser st
Produced by Haddock version 0.7