Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- newtype ParserState = ParserState {}
- initialParserState :: ParserState
- setSince :: Version -> Parser ()
- type Parser = Parsec Text ParserState
- parseOnly :: Parser a -> Text -> Either String (ParserState, a)
- peekChar :: Parser (Maybe Char)
- peekChar' :: Parser Char
- string :: Text -> Parser Text
- scan :: (s -> Char -> Maybe s) -> s -> Parser Text
- takeWhile :: Parser Char -> Parser Text
- takeWhile1 :: Parser Char -> Parser Text
- decimal :: Integral a => Parser a
- hexadecimal :: (Integral a, Bits a) => Parser a
Documentation
newtype ParserState Source #
Instances
Eq ParserState Source # | |
Defined in Documentation.Haddock.Parser.Monad (==) :: ParserState -> ParserState -> Bool # (/=) :: ParserState -> ParserState -> Bool # | |
Show ParserState Source # | |
Defined in Documentation.Haddock.Parser.Monad showsPrec :: Int -> ParserState -> ShowS # show :: ParserState -> String # showList :: [ParserState] -> ShowS # | |
a ~ Text => IsString (Parser a) Source # | |
Defined in Documentation.Haddock.Parser.Monad fromString :: String -> Parser a # |
peekChar :: Parser (Maybe Char) Source #
Always succeeds, but returns Nothing
if at the end of input. Does not
consume input.
Scan the input text, accumulating characters as long as the scanning function returns true.
takeWhile :: Parser Char -> Parser Text Source #
Apply a parser for a character zero or more times and collect the result in a string.