{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE CPP #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE MagicHash #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}
module Std.Data.Parser
(
Result(..)
, ParseError
, Parser
, (<?>)
, parse, parse_, parseChunk, parseChunks, finishParsing
, runAndKeepTrack, match
, ensureN, endOfInput, atEnd
, decodePrim, decodePrimLE, decodePrimBE
, scan, scanChunks, peekMaybe, peek, satisfy, satisfyWith
, word8, char8, skipWord8, endOfLine, skip, skipWhile, skipSpaces
, take, takeTill, takeWhile, takeWhile1, bytes, bytesCI
, text
, uint, int
, hex
, rational
, float, double
, scientific
, scientifically
, rational'
, float', double'
, scientific'
, scientifically'
, isSpace, isHexDigit, isDigit
) where
import Std.Data.Parser.Base
import Std.Data.Parser.Numeric
import Prelude hiding (take, takeWhile)