-- Hoogle documentation, generated by Haddock -- See Hoogle, http://www.haskell.org/hoogle/ -- | Monadic parser combinators -- -- This is an industrial-strength monadic parser combinator library. -- Megaparsec is a feature-rich package that tries to find a nice balance -- between speed, flexibility, and quality of parse errors. @package megaparsec @version 9.7.0 -- | Textual source position. The position includes name of file, line -- number, and column number. -- -- You probably do not want to import this module directly because -- Text.Megaparsec re-exports it anyway. module Text.Megaparsec.Pos -- | Pos is the type for positive integers. This is used to -- represent line number, column number, and similar things like -- indentation level. Semigroup instance can be used to safely and -- efficiently add Poses together. data Pos -- | Construction of Pos from Int. The function throws -- InvalidPosException when given a non-positive argument. mkPos :: Int -> Pos -- | Extract Int from Pos. unPos :: Pos -> Int -- | Position with value 1. pos1 :: Pos -- | Value of tab width used by default. Always prefer this constant when -- you want to refer to the default tab width because actual value -- may change in future. -- -- Currently: -- --
--   defaultTabWidth = mkPos 8
--   
defaultTabWidth :: Pos -- | The exception is thrown by mkPos when its argument is not a -- positive number. newtype InvalidPosException -- | Contains the actual value that was passed to mkPos InvalidPosException :: Int -> InvalidPosException -- | The data type SourcePos represents source positions. It -- contains the name of the source file, a line number, and a column -- number. Source line and column positions change intensively during -- parsing, so we need to make them strict to avoid memory leaks. data SourcePos SourcePos :: FilePath -> !Pos -> !Pos -> SourcePos -- | Name of source file [sourceName] :: SourcePos -> FilePath -- | Line number [sourceLine] :: SourcePos -> !Pos -- | Column number [sourceColumn] :: SourcePos -> !Pos -- | Construct initial position (line 1, column 1) given name of source -- file. initialPos :: FilePath -> SourcePos -- | Pretty-print a SourcePos. sourcePosPretty :: SourcePos -> String instance GHC.Internal.Data.Data.Data Text.Megaparsec.Pos.InvalidPosException instance GHC.Internal.Data.Data.Data Text.Megaparsec.Pos.Pos instance GHC.Internal.Data.Data.Data Text.Megaparsec.Pos.SourcePos instance GHC.Classes.Eq Text.Megaparsec.Pos.InvalidPosException instance GHC.Classes.Eq Text.Megaparsec.Pos.Pos instance GHC.Classes.Eq Text.Megaparsec.Pos.SourcePos instance GHC.Internal.Exception.Type.Exception Text.Megaparsec.Pos.InvalidPosException instance GHC.Internal.Generics.Generic Text.Megaparsec.Pos.InvalidPosException instance GHC.Internal.Generics.Generic Text.Megaparsec.Pos.Pos instance GHC.Internal.Generics.Generic Text.Megaparsec.Pos.SourcePos instance Control.DeepSeq.NFData Text.Megaparsec.Pos.InvalidPosException instance Control.DeepSeq.NFData Text.Megaparsec.Pos.Pos instance Control.DeepSeq.NFData Text.Megaparsec.Pos.SourcePos instance GHC.Classes.Ord Text.Megaparsec.Pos.Pos instance GHC.Classes.Ord Text.Megaparsec.Pos.SourcePos instance GHC.Internal.Read.Read Text.Megaparsec.Pos.Pos instance GHC.Internal.Read.Read Text.Megaparsec.Pos.SourcePos instance GHC.Internal.Base.Semigroup Text.Megaparsec.Pos.Pos instance GHC.Internal.Show.Show Text.Megaparsec.Pos.InvalidPosException instance GHC.Internal.Show.Show Text.Megaparsec.Pos.Pos instance GHC.Internal.Show.Show Text.Megaparsec.Pos.SourcePos -- | Definition of Megaparsec's State. module Text.Megaparsec.State -- | This is the Megaparsec's state parametrized over stream type -- s and custom error component type e. data State s e State :: s -> {-# UNPACK #-} !Int -> PosState s -> [ParseError s e] -> State s e -- | The rest of input to process [stateInput] :: State s e -> s -- | Number of processed tokens so far [stateOffset] :: State s e -> {-# UNPACK #-} !Int -- | State that is used for line/column calculation [statePosState] :: State s e -> PosState s -- | Collection of “delayed” ParseErrors in reverse order. This -- means that the last registered error is the first element of the list. [stateParseErrors] :: State s e -> [ParseError s e] -- | Given the name of the source file and the input construct the initial -- state for a parser. initialState :: FilePath -> s -> State s e -- | A special kind of state that is used to calculate line/column -- positions on demand. data PosState s PosState :: s -> !Int -> !SourcePos -> Pos -> String -> PosState s -- | The rest of input to process [pstateInput] :: PosState s -> s -- | Offset corresponding to beginning of pstateInput [pstateOffset] :: PosState s -> !Int -- | Source position corresponding to beginning of pstateInput [pstateSourcePos] :: PosState s -> !SourcePos -- | Tab width to use for column calculation [pstateTabWidth] :: PosState s -> Pos -- | Prefix to prepend to offending line [pstateLinePrefix] :: PosState s -> String -- | Given the name of source file and the input construct the initial -- positional state. initialPosState :: FilePath -> s -> PosState s instance GHC.Internal.Data.Data.Data s => GHC.Internal.Data.Data.Data (Text.Megaparsec.State.PosState s) instance (GHC.Internal.Data.Data.Data e, GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.ParseError s e), GHC.Internal.Data.Data.Data s) => GHC.Internal.Data.Data.Data (Text.Megaparsec.State.State s e) instance GHC.Classes.Eq s => GHC.Classes.Eq (Text.Megaparsec.State.PosState s) instance (GHC.Classes.Eq (Text.Megaparsec.Error.ParseError s e), GHC.Classes.Eq s) => GHC.Classes.Eq (Text.Megaparsec.State.State s e) instance GHC.Internal.Generics.Generic (Text.Megaparsec.State.PosState s) instance GHC.Internal.Generics.Generic (Text.Megaparsec.State.State s e) instance Control.DeepSeq.NFData s => Control.DeepSeq.NFData (Text.Megaparsec.State.PosState s) instance (Control.DeepSeq.NFData s, Control.DeepSeq.NFData (Text.Megaparsec.Error.ParseError s e)) => Control.DeepSeq.NFData (Text.Megaparsec.State.State s e) instance GHC.Internal.Show.Show s => GHC.Internal.Show.Show (Text.Megaparsec.State.PosState s) instance (GHC.Internal.Show.Show (Text.Megaparsec.Error.ParseError s e), GHC.Internal.Show.Show s) => GHC.Internal.Show.Show (Text.Megaparsec.State.State s e) -- | Utility functions for working with Unicode. module Text.Megaparsec.Unicode -- | Calculate length of a string taking into account the fact that certain -- Chars may span more than 1 column. stringLength :: Traversable t => t Char -> Int -- | Return length of an individual Char. charLength :: Char -> Int -- | Determine whether the given Char is “wide”, that is, whether it -- spans 2 columns instead of one. isWideChar :: Char -> Bool -- | Megaparsec's input stream facilities. -- -- You probably do not want to import this module directly because -- Text.Megaparsec re-exports it anyway. module Text.Megaparsec.Stream -- | Type class for inputs that can be consumed by the library. -- -- Note that the Stream instances for Text and -- ByteString (strict and lazy) default to "input sharing" (see -- ShareInput, NoShareInput). We plan to move away from -- input sharing in a future major release; if you want to retain the -- current behaviour and are concerned with maximum performance you -- should consider using the ShareInput wrapper explicitly. -- -- Note: before the version 9.0.0 the class included the -- methods from VisualStream and TraversableStream. class (Ord Token s, Ord Tokens s) => Stream s where { -- | Type of token in the stream. type Token s; -- | Type of “chunk” of the stream. type Tokens s; } -- | Lift a single token to chunk of the stream. The default implementation -- is: -- --
--   tokenToChunk pxy = tokensToChunk pxy . pure
--   
-- -- However for some types of stream there may be a more efficient way to -- lift. tokenToChunk :: Stream s => Proxy s -> Token s -> Tokens s -- | The first method that establishes isomorphism between list of tokens -- and chunk of the stream. Valid implementation should satisfy: -- --
--   chunkToTokens pxy (tokensToChunk pxy ts) == ts
--   
tokensToChunk :: Stream s => Proxy s -> [Token s] -> Tokens s -- | The second method that establishes isomorphism between list of tokens -- and chunk of the stream. Valid implementation should satisfy: -- --
--   tokensToChunk pxy (chunkToTokens pxy chunk) == chunk
--   
chunkToTokens :: Stream s => Proxy s -> Tokens s -> [Token s] -- | Return length of a chunk of the stream. chunkLength :: Stream s => Proxy s -> Tokens s -> Int -- | Check if a chunk of the stream is empty. The default implementation is -- in terms of the more general chunkLength: -- --
--   chunkEmpty pxy ts = chunkLength pxy ts <= 0
--   
-- -- However for many streams there may be a more efficient implementation. chunkEmpty :: Stream s => Proxy s -> Tokens s -> Bool -- | Extract a single token form the stream. Return Nothing if the -- stream is empty. take1_ :: Stream s => s -> Maybe (Token s, s) -- | takeN_ n s should try to extract a chunk of length -- n, or if the stream is too short, the rest of the stream. -- Valid implementation should follow the rules: -- -- takeN_ :: Stream s => Int -> s -> Maybe (Tokens s, s) -- | Extract chunk of the stream taking tokens while the supplied predicate -- returns True. Return the chunk and the rest of the stream. -- -- For many types of streams, the method allows for significant -- performance improvements, although it is not strictly necessary from -- conceptual point of view. takeWhile_ :: Stream s => (Token s -> Bool) -> s -> (Tokens s, s) -- | This wrapper selects the input-sharing Stream implementation -- for Text (Text) and ByteString -- (ByteString). By input sharing we mean that our parsers will -- use slices whenever possible to avoid having to copy parts of the -- input. See also the documentation of split. -- -- Note that using slices is in general faster than copying; on the other -- hand it also has the potential for causing surprising memory leaks: if -- any slice of the input survives in the output, holding on to the -- output will force the entire input Text/ByteString to -- stay in memory! Even when using lazy Text/ByteString we -- will hold on to whole chunks at a time leading to to significantly -- worse memory residency in some cases. -- -- See NoShareInput for a somewhat slower implementation that -- avoids this memory leak scenario. newtype ShareInput a ShareInput :: a -> ShareInput a [unShareInput] :: ShareInput a -> a -- | This wrapper selects the no-input-sharing Stream implementation -- for Text (Text) and ByteString -- (ByteString). This means that our parsers will create -- independent copies rather than using slices of the input. See also the -- documentation of copy. -- -- More importantly, any parser output will be independent of the input, -- and holding on to parts of the output will never prevent the input -- from being garbage collected. -- -- For maximum performance you might consider using ShareInput -- instead, but beware of its pitfalls! newtype NoShareInput a NoShareInput :: a -> NoShareInput a [unNoShareInput] :: NoShareInput a -> a -- | Type class for inputs that can also be used for debugging. class Stream s => VisualStream s -- | Pretty-print non-empty stream of tokens. This function is also used to -- print single tokens (represented as singleton lists). showTokens :: VisualStream s => Proxy s -> NonEmpty (Token s) -> String -- | Return the number of characters that a non-empty stream of tokens -- spans. The default implementation is sufficient if every token spans -- exactly 1 character. tokensLength :: VisualStream s => Proxy s -> NonEmpty (Token s) -> Int -- | Type class for inputs that can also be used for error reporting. class Stream s => TraversableStream s -- | Given an offset o and initial PosState, adjust the -- state in such a way that it starts at the offset. -- -- Return two values (in order): -- -- -- -- The String representing the offending line in input stream -- should satisfy the following: -- -- -- -- Note: type signature of the function was changed in the version -- 9.0.0. reachOffset :: TraversableStream s => Int -> PosState s -> (Maybe String, PosState s) -- | A version of reachOffset that may be faster because it doesn't -- need to fetch the line at which the given offset in located. -- -- The default implementation is this: -- --
--   reachOffsetNoLine o pst =
--     snd (reachOffset o pst)
--   
-- -- Note: type signature of the function was changed in the version -- 8.0.0. reachOffsetNoLine :: TraversableStream s => Int -> PosState s -> PosState s instance Text.Megaparsec.Stream.Stream Data.ByteString.Lazy.Internal.ByteString instance Text.Megaparsec.Stream.Stream Data.ByteString.Internal.Type.ByteString instance GHC.Classes.Ord a => Text.Megaparsec.Stream.Stream [a] instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.NoShareInput Data.ByteString.Internal.Type.ByteString) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.NoShareInput Data.ByteString.Lazy.Internal.ByteString) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.NoShareInput Data.Text.Internal.Text) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.NoShareInput Data.Text.Internal.Lazy.Text) instance GHC.Classes.Ord a => Text.Megaparsec.Stream.Stream (Data.Sequence.Internal.Seq a) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.ShareInput Data.ByteString.Internal.Type.ByteString) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.ShareInput Data.ByteString.Lazy.Internal.ByteString) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.ShareInput Data.Text.Internal.Text) instance Text.Megaparsec.Stream.Stream (Text.Megaparsec.Stream.ShareInput Data.Text.Internal.Lazy.Text) instance Text.Megaparsec.Stream.Stream Data.Text.Internal.Lazy.Text instance Text.Megaparsec.Stream.Stream Data.Text.Internal.Text instance Text.Megaparsec.Stream.TraversableStream Data.ByteString.Lazy.Internal.ByteString instance Text.Megaparsec.Stream.TraversableStream Data.ByteString.Internal.Type.ByteString instance Text.Megaparsec.Stream.TraversableStream GHC.Internal.Base.String instance Text.Megaparsec.Stream.TraversableStream Data.Text.Internal.Lazy.Text instance Text.Megaparsec.Stream.TraversableStream Data.Text.Internal.Text instance Text.Megaparsec.Stream.VisualStream Data.ByteString.Lazy.Internal.ByteString instance Text.Megaparsec.Stream.VisualStream Data.ByteString.Internal.Type.ByteString instance Text.Megaparsec.Stream.VisualStream GHC.Internal.Base.String instance Text.Megaparsec.Stream.VisualStream Data.Text.Internal.Lazy.Text instance Text.Megaparsec.Stream.VisualStream Data.Text.Internal.Text -- | Parse errors. The current version of Megaparsec supports typed errors -- instead of String-based ones. This gives a lot of flexibility -- in describing what exactly went wrong as well as a way to return -- arbitrary data in case of failure. -- -- You probably do not want to import this module directly because -- Text.Megaparsec re-exports it anyway. module Text.Megaparsec.Error -- | A data type that is used to represent “unexpected/expected” items in -- ParseError. It is parametrized over the token type t. data ErrorItem t -- | Non-empty stream of tokens Tokens :: NonEmpty t -> ErrorItem t -- | Label (cannot be empty) Label :: NonEmpty Char -> ErrorItem t -- | End of input EndOfInput :: ErrorItem t -- | Additional error data, extendable by user. When no custom data is -- necessary, the type is typically indexed by Void to “cancel” -- the ErrorCustom constructor. data ErrorFancy e -- | fail has been used in parser monad ErrorFail :: String -> ErrorFancy e -- | Incorrect indentation error: desired ordering between reference level -- and actual level, reference indentation level, actual indentation -- level ErrorIndentation :: Ordering -> Pos -> Pos -> ErrorFancy e -- | Custom error data ErrorCustom :: e -> ErrorFancy e -- | ParseError s e represents a parse error parametrized -- over the stream type s and the custom data e. -- -- Semigroup and Monoid instances of the data type allow us -- to merge parse errors from different branches of parsing. When merging -- two ParseErrors, the longest match is preferred; if positions -- are the same, custom data sets and collections of message items are -- combined. Note that fancy errors take precedence over trivial errors -- in merging. data ParseError s e -- | Trivial errors, generated by the Megaparsec's machinery. The data -- constructor includes the offset of error, unexpected token (if any), -- and expected tokens. -- -- Type of the first argument was changed in the version 7.0.0. TrivialError :: Int -> Maybe (ErrorItem (Token s)) -> Set (ErrorItem (Token s)) -> ParseError s e -- | Fancy, custom errors. -- -- Type of the first argument was changed in the version 7.0.0. FancyError :: Int -> Set (ErrorFancy e) -> ParseError s e -- | Modify the custom data component in a parse error. This could be done -- via fmap if not for the Ord constraint. mapParseError :: Ord e' => (e -> e') -> ParseError s e -> ParseError s e' -- | Get the offset of a ParseError. errorOffset :: ParseError s e -> Int -- | Set the offset of a ParseError. setErrorOffset :: Int -> ParseError s e -> ParseError s e -- | A non-empty collection of ParseErrors equipped with -- PosState that allows us to pretty-print the errors efficiently -- and correctly. data ParseErrorBundle s e ParseErrorBundle :: NonEmpty (ParseError s e) -> PosState s -> ParseErrorBundle s e -- | A collection of ParseErrors that is sorted by parse error -- offsets [bundleErrors] :: ParseErrorBundle s e -> NonEmpty (ParseError s e) -- | The state that is used for line/column calculation [bundlePosState] :: ParseErrorBundle s e -> PosState s -- | Attach SourcePoses to items in a Traversable container -- given that there is a projection allowing us to get an offset per -- item. -- -- Items must be in ascending order with respect to their offsets. attachSourcePos :: (Traversable t, TraversableStream s) => (a -> Int) -> t a -> PosState s -> (t (a, SourcePos), PosState s) -- | The type class defines how to print a custom component of -- ParseError. class Ord a => ShowErrorComponent a -- | Pretty-print a component of ParseError. showErrorComponent :: ShowErrorComponent a => a -> String -- | Length of the error component in characters, used for highlighting of -- parse errors in input string. errorComponentLen :: ShowErrorComponent a => a -> Int -- | Pretty-print a ParseErrorBundle. All ParseErrors in the -- bundle will be pretty-printed in order together with the corresponding -- offending lines by doing a single pass over the input stream. The -- rendered String always ends with a newline. errorBundlePretty :: (VisualStream s, TraversableStream s, ShowErrorComponent e) => ParseErrorBundle s e -> String -- | Pretty-print a ParseErrorBundle. All ParseErrors in the -- bundle will be pretty-printed in order by doing a single pass over the -- input stream. -- -- The rendered format is suitable for custom GHC pre-processors (as can -- be specified with -F -pgmF). errorBundlePrettyForGhcPreProcessors :: (VisualStream s, TraversableStream s, ShowErrorComponent e) => ParseErrorBundle s e -> String -- | Pretty-print a ParseErrorBundle. All ParseErrors in the -- bundle will be pretty-printed in order, by applying a provided format -- function, with a single pass over the input stream. errorBundlePrettyWith :: (VisualStream s, TraversableStream s) => (Maybe String -> SourcePos -> ParseError s e -> String) -> ParseErrorBundle s e -> String -- | Pretty-print a ParseError. The rendered String always -- ends with a newline. parseErrorPretty :: (VisualStream s, ShowErrorComponent e) => ParseError s e -> String -- | Pretty-print a textual part of a ParseError, that is, -- everything except for its position. The rendered String always -- ends with a newline. parseErrorTextPretty :: (VisualStream s, ShowErrorComponent e) => ParseError s e -> String -- | Pretty-print an ErrorItem. showErrorItem :: VisualStream s => Proxy s -> ErrorItem (Token s) -> String instance GHC.Internal.Data.Data.Data e => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Internal.Data.Data.Data t => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.ErrorItem t) instance (GHC.Internal.Data.Data.Data s, GHC.Internal.Data.Data.Data (Text.Megaparsec.Stream.Token s), GHC.Classes.Ord (Text.Megaparsec.Stream.Token s), GHC.Internal.Data.Data.Data e, GHC.Classes.Ord e) => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.ParseError s e) instance (GHC.Internal.Data.Data.Data s, GHC.Internal.Data.Data.Data (Text.Megaparsec.Stream.Token s), GHC.Classes.Ord (Text.Megaparsec.Stream.Token s), GHC.Internal.Data.Data.Data e, GHC.Classes.Ord e) => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.ParseErrorBundle s e) instance GHC.Classes.Eq e => GHC.Classes.Eq (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Classes.Eq t => GHC.Classes.Eq (Text.Megaparsec.Error.ErrorItem t) instance (GHC.Classes.Eq (Text.Megaparsec.Stream.Token s), GHC.Classes.Eq e) => GHC.Classes.Eq (Text.Megaparsec.Error.ParseError s e) instance (GHC.Classes.Eq s, GHC.Classes.Eq (Text.Megaparsec.Stream.Token s), GHC.Classes.Eq e) => GHC.Classes.Eq (Text.Megaparsec.Error.ParseErrorBundle s e) instance (GHC.Internal.Show.Show s, GHC.Internal.Show.Show (Text.Megaparsec.Stream.Token s), GHC.Internal.Show.Show e, Text.Megaparsec.Error.ShowErrorComponent e, Text.Megaparsec.Stream.VisualStream s, GHC.Internal.Data.Typeable.Internal.Typeable s, GHC.Internal.Data.Typeable.Internal.Typeable e) => GHC.Internal.Exception.Type.Exception (Text.Megaparsec.Error.ParseError s e) instance (GHC.Internal.Show.Show s, GHC.Internal.Show.Show (Text.Megaparsec.Stream.Token s), GHC.Internal.Show.Show e, Text.Megaparsec.Error.ShowErrorComponent e, Text.Megaparsec.Stream.VisualStream s, Text.Megaparsec.Stream.TraversableStream s, GHC.Internal.Data.Typeable.Internal.Typeable s, GHC.Internal.Data.Typeable.Internal.Typeable e) => GHC.Internal.Exception.Type.Exception (Text.Megaparsec.Error.ParseErrorBundle s e) instance GHC.Internal.Base.Functor Text.Megaparsec.Error.ErrorFancy instance GHC.Internal.Base.Functor Text.Megaparsec.Error.ErrorItem instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.ErrorItem t) instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.ParseError s e) instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.ParseErrorBundle s e) instance (Text.Megaparsec.Stream.Stream s, GHC.Classes.Ord e) => GHC.Internal.Base.Monoid (Text.Megaparsec.Error.ParseError s e) instance Control.DeepSeq.NFData a => Control.DeepSeq.NFData (Text.Megaparsec.Error.ErrorFancy a) instance Control.DeepSeq.NFData t => Control.DeepSeq.NFData (Text.Megaparsec.Error.ErrorItem t) instance (Control.DeepSeq.NFData (Text.Megaparsec.Stream.Token s), Control.DeepSeq.NFData e) => Control.DeepSeq.NFData (Text.Megaparsec.Error.ParseError s e) instance (Control.DeepSeq.NFData s, Control.DeepSeq.NFData (Text.Megaparsec.Stream.Token s), Control.DeepSeq.NFData e) => Control.DeepSeq.NFData (Text.Megaparsec.Error.ParseErrorBundle s e) instance GHC.Classes.Ord e => GHC.Classes.Ord (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Classes.Ord t => GHC.Classes.Ord (Text.Megaparsec.Error.ErrorItem t) instance GHC.Internal.Read.Read e => GHC.Internal.Read.Read (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Internal.Read.Read t => GHC.Internal.Read.Read (Text.Megaparsec.Error.ErrorItem t) instance (Text.Megaparsec.Stream.Stream s, GHC.Classes.Ord e) => GHC.Internal.Base.Semigroup (Text.Megaparsec.Error.ParseError s e) instance Text.Megaparsec.Error.ShowErrorComponent GHC.Internal.Base.Void instance GHC.Internal.Show.Show e => GHC.Internal.Show.Show (Text.Megaparsec.Error.ErrorFancy e) instance GHC.Internal.Show.Show t => GHC.Internal.Show.Show (Text.Megaparsec.Error.ErrorItem t) instance (GHC.Internal.Show.Show (Text.Megaparsec.Stream.Token s), GHC.Internal.Show.Show e) => GHC.Internal.Show.Show (Text.Megaparsec.Error.ParseError s e) instance (GHC.Internal.Show.Show s, GHC.Internal.Show.Show (Text.Megaparsec.Stream.Token s), GHC.Internal.Show.Show e) => GHC.Internal.Show.Show (Text.Megaparsec.Error.ParseErrorBundle s e) -- | A set of helpers that should make construction of ParseErrors -- more concise. This is primarily useful in test suites and for -- debugging. module Text.Megaparsec.Error.Builder -- | Assemble a ParseError from the offset and the ET -- t value. ET t is a monoid and can be assembled by -- combining primitives provided by this module, see below. err :: Int -> ET s -> ParseError s e -- | Like err, but constructs a “fancy” ParseError. errFancy :: Int -> EF e -> ParseError s e -- | Construct an “unexpected token” error component. utok :: Token s -> ET s -- | Construct an “unexpected tokens” error component. Empty chunk produces -- EndOfInput. utoks :: Stream s => Tokens s -> ET s -- | Construct an “unexpected label” error component. Do not use with empty -- strings (for empty strings it's bottom). ulabel :: String -> ET s -- | Construct an “unexpected end of input” error component. ueof :: ET s -- | Construct an “expected token” error component. etok :: Token s -> ET s -- | Construct an “expected tokens” error component. Empty chunk produces -- EndOfInput. etoks :: Stream s => Tokens s -> ET s -- | Construct an “expected label” error component. Do not use with empty -- strings. elabel :: String -> ET s -- | Construct an “expected end of input” error component. eeof :: ET s -- | Construct a custom error component. fancy :: ErrorFancy e -> EF e -- | Auxiliary type for construction of trivial parse errors. data ET s -- | Auxiliary type for construction of fancy parse errors. data EF e instance (GHC.Internal.Data.Data.Data e, GHC.Classes.Ord e) => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.Builder.EF e) instance (GHC.Internal.Data.Data.Data s, GHC.Internal.Data.Data.Data (Text.Megaparsec.Stream.Token s), GHC.Classes.Ord (Text.Megaparsec.Stream.Token s)) => GHC.Internal.Data.Data.Data (Text.Megaparsec.Error.Builder.ET s) instance GHC.Classes.Eq e => GHC.Classes.Eq (Text.Megaparsec.Error.Builder.EF e) instance GHC.Classes.Eq (Text.Megaparsec.Stream.Token s) => GHC.Classes.Eq (Text.Megaparsec.Error.Builder.ET s) instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.Builder.EF e) instance GHC.Internal.Generics.Generic (Text.Megaparsec.Error.Builder.ET s) instance GHC.Classes.Ord e => GHC.Internal.Base.Monoid (Text.Megaparsec.Error.Builder.EF e) instance Text.Megaparsec.Stream.Stream s => GHC.Internal.Base.Monoid (Text.Megaparsec.Error.Builder.ET s) instance GHC.Classes.Ord e => GHC.Classes.Ord (Text.Megaparsec.Error.Builder.EF e) instance GHC.Classes.Ord (Text.Megaparsec.Stream.Token s) => GHC.Classes.Ord (Text.Megaparsec.Error.Builder.ET s) instance GHC.Classes.Ord e => GHC.Internal.Base.Semigroup (Text.Megaparsec.Error.Builder.EF e) instance Text.Megaparsec.Stream.Stream s => GHC.Internal.Base.Semigroup (Text.Megaparsec.Error.Builder.ET s) -- | Internal definitions. Versioning rules do not apply here. Please do -- not rely on these unless you really know what you're doing. module Text.Megaparsec.Internal -- | Hints represent a collection of ErrorItems to be -- included into ParseError (when it's a TrivialError) as -- “expected” message items when a parser fails without consuming input -- right after successful parser that produced the hints. -- -- For example, without hints you could get: -- --
--   >>> parseTest (many (char 'r') <* eof) "ra"
--   1:2:
--   unexpected 'a'
--   expecting end of input
--   
-- -- We're getting better error messages with the help of hints: -- --
--   >>> parseTest (many (char 'r') <* eof) "ra"
--   1:2:
--   unexpected 'a'
--   expecting 'r' or end of input
--   
newtype Hints t Hints :: Set (ErrorItem t) -> Hints t -- | All information available after parsing. This includes consumption of -- input, success (with the returned value) or failure (with the parse -- error), and parser state at the end of parsing. Reply can also -- be used to resume parsing. -- -- See also: Consumption, Result. data Reply e s a Reply :: State s e -> Consumption -> Result s e a -> Reply e s a -- | Whether the input has been consumed or not. -- -- See also: Result, Reply. data Consumption -- | Some part of input stream was consumed Consumed :: Consumption -- | No input was consumed NotConsumed :: Consumption -- | Whether the parser has failed or not. On success we include the -- resulting value, on failure we include a ParseError. -- -- See also: Consumption, Reply. data Result s e a -- | Parser succeeded (includes hints) OK :: Hints (Token s) -> a -> Result s e a -- | Parser failed Error :: ParseError s e -> Result s e a -- | ParsecT e s m a is a parser with custom data component -- of error e, stream type s, underlying monad -- m and return type a. newtype ParsecT e s (m :: Type -> Type) a ParsecT :: (forall b. () => State s e -> (a -> State s e -> Hints (Token s) -> m b) -> (ParseError s e -> State s e -> m b) -> (a -> State s e -> Hints (Token s) -> m b) -> (ParseError s e -> State s e -> m b) -> m b) -> ParsecT e s (m :: Type -> Type) a [unParser] :: ParsecT e s (m :: Type -> Type) a -> forall b. () => State s e -> (a -> State s e -> Hints (Token s) -> m b) -> (ParseError s e -> State s e -> m b) -> (a -> State s e -> Hints (Token s) -> m b) -> (ParseError s e -> State s e -> m b) -> m b -- | Convert a ParseError record into Hints. toHints :: Stream s => Int -> ParseError s e -> Hints (Token s) -- | withHints hs c makes “error” continuation c -- use given hints hs. -- -- Note that if resulting continuation gets ParseError that -- has custom data in it, hints are ignored. withHints :: Stream s => Hints (Token s) -> (ParseError s e -> State s e -> m b) -> ParseError s e -> State s e -> m b -- | accHints hs c results in “OK” continuation that will -- add given hints hs to third argument of original continuation -- c. accHints :: Stream s => Hints (Token s) -> (a -> State s e -> Hints (Token s) -> m b) -> a -> State s e -> Hints (Token s) -> m b -- | Replace the hints with the given ErrorItem (or delete it if -- Nothing is given). This is used in the label primitive. refreshHints :: Hints t -> Maybe (ErrorItem t) -> Hints t -- | Low-level unpacking of the ParsecT type. runParsecT :: Monad m => ParsecT e s m a -> State s e -> m (Reply e s a) -- | Transform any custom errors thrown by the parser using the given -- function. Similar in function and purpose to withExceptT. -- -- Note that the inner parser will start with an empty collection -- of “delayed” ParseErrors. Any delayed ParseErrors -- produced in the inner parser will be lifted by applying the provided -- function and added to the collection of delayed parse errors of the -- outer parser. withParsecT :: forall e e' s (m :: Type -> Type) a. Ord e' => (e -> e') -> ParsecT e s m a -> ParsecT e' s m a instance (GHC.Classes.Ord e, Text.Megaparsec.Stream.Stream s) => GHC.Internal.Base.Alternative (Text.Megaparsec.Internal.ParsecT e s m) instance Text.Megaparsec.Stream.Stream s => GHC.Internal.Base.Applicative (Text.Megaparsec.Internal.ParsecT e s m) instance GHC.Internal.Base.Functor (Text.Megaparsec.Internal.ParsecT e s m) instance GHC.Internal.Base.Functor (Text.Megaparsec.Internal.Reply e s) instance GHC.Internal.Base.Functor (Text.Megaparsec.Internal.Result s e) instance (a GHC.Types.~ Text.Megaparsec.Stream.Tokens s, GHC.Internal.Data.String.IsString a, GHC.Classes.Eq a, Text.Megaparsec.Stream.Stream s, GHC.Classes.Ord e) => GHC.Internal.Data.String.IsString (Text.Megaparsec.Internal.ParsecT e s m a) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.Cont.Class.MonadCont m) => Control.Monad.Cont.Class.MonadCont (Text.Megaparsec.Internal.ParsecT e s m) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.Error.Class.MonadError e' m) => Control.Monad.Error.Class.MonadError e' (Text.Megaparsec.Internal.ParsecT e s m) instance Text.Megaparsec.Stream.Stream s => GHC.Internal.Control.Monad.Fail.MonadFail (Text.Megaparsec.Internal.ParsecT e s m) instance (Text.Megaparsec.Stream.Stream s, GHC.Internal.Control.Monad.Fix.MonadFix m) => GHC.Internal.Control.Monad.Fix.MonadFix (Text.Megaparsec.Internal.ParsecT e s m) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.IO.Class.MonadIO m) => Control.Monad.IO.Class.MonadIO (Text.Megaparsec.Internal.ParsecT e s m) instance Text.Megaparsec.Stream.Stream s => GHC.Internal.Base.Monad (Text.Megaparsec.Internal.ParsecT e s m) instance (GHC.Classes.Ord e, Text.Megaparsec.Stream.Stream s) => Text.Megaparsec.Class.MonadParsec e s (Text.Megaparsec.Internal.ParsecT e s m) instance (GHC.Classes.Ord e, Text.Megaparsec.Stream.Stream s) => GHC.Internal.Base.MonadPlus (Text.Megaparsec.Internal.ParsecT e s m) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.Reader.Class.MonadReader r m) => Control.Monad.Reader.Class.MonadReader r (Text.Megaparsec.Internal.ParsecT e s m) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.State.Class.MonadState st m) => Control.Monad.State.Class.MonadState st (Text.Megaparsec.Internal.ParsecT e s m) instance Text.Megaparsec.Stream.Stream s => Control.Monad.Trans.Class.MonadTrans (Text.Megaparsec.Internal.ParsecT e s) instance (Text.Megaparsec.Stream.Stream s, Control.Monad.Writer.Class.MonadWriter w m) => Control.Monad.Writer.Class.MonadWriter w (Text.Megaparsec.Internal.ParsecT e s m) instance GHC.Classes.Ord t => GHC.Internal.Base.Monoid (Text.Megaparsec.Internal.Hints t) instance (Text.Megaparsec.Stream.Stream s, GHC.Internal.Base.Monoid a) => GHC.Internal.Base.Monoid (Text.Megaparsec.Internal.ParsecT e s m a) instance GHC.Classes.Ord t => GHC.Internal.Base.Semigroup (Text.Megaparsec.Internal.Hints t) instance (Text.Megaparsec.Stream.Stream s, GHC.Internal.Base.Semigroup a) => GHC.Internal.Base.Semigroup (Text.Megaparsec.Internal.ParsecT e s m a) -- | Debugging helpers. module Text.Megaparsec.Debug -- | Type class describing parser monads that can trace during evaluation. class MonadParsec e s m => MonadParsecDbg e s (m :: Type -> Type) -- | dbg label p parser works exactly like p, but -- when it's evaluated it prints information useful for debugging. The -- label is only used to refer to this parser in the debugging -- output. This combinator uses the trace function from -- Debug.Trace under the hood. -- -- Typical usage is to wrap every sub-parser in misbehaving parser with -- dbg assigning meaningful labels. Then give it a shot and go -- through the print-out. As of current version, this combinator prints -- all available information except for hints, which are probably -- only interesting to the maintainer of Megaparsec itself and may be -- quite verbose to output in general. Let me know if you would like to -- be able to see hints in the debugging output. -- -- The output itself is pretty self-explanatory, although the following -- abbreviations should be clarified (they are derived from the low-level -- source code): -- -- -- -- Note: up until the version 9.3.0 this was a -- non-polymorphic function that worked only in ParsecT. It was -- first introduced in the version 7.0.0. dbg :: (MonadParsecDbg e s m, Show a) => String -> m a -> m a -- | Just like dbg, but doesn't require the return value of the -- parser to be Show-able. dbg' :: MonadParsecDbg e s m => String -> m a -> m a instance Text.Megaparsec.Debug.MonadParsecDbg e s m => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.Identity.IdentityT m) instance (Text.Megaparsec.Stream.VisualStream s, Text.Megaparsec.Error.ShowErrorComponent e) => Text.Megaparsec.Debug.MonadParsecDbg e s (Text.Megaparsec.Internal.ParsecT e s m) instance (GHC.Internal.Base.Monoid w, GHC.Internal.Show.Show w, GHC.Internal.Show.Show st, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.RWS.Strict.RWST r w st m) instance (GHC.Internal.Base.Monoid w, GHC.Internal.Show.Show w, GHC.Internal.Show.Show st, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.RWS.Lazy.RWST r w st m) instance Text.Megaparsec.Debug.MonadParsecDbg e s m => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.Reader.ReaderT r m) instance (GHC.Internal.Show.Show st, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.State.Strict.StateT st m) instance (GHC.Internal.Show.Show st, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.State.Lazy.StateT st m) instance (GHC.Internal.Base.Monoid w, GHC.Internal.Show.Show w, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.Writer.Strict.WriterT w m) instance (GHC.Internal.Base.Monoid w, GHC.Internal.Show.Show w, Text.Megaparsec.Debug.MonadParsecDbg e s m) => Text.Megaparsec.Debug.MonadParsecDbg e s (Control.Monad.Trans.Writer.Lazy.WriterT w m) instance GHC.Internal.Show.Show (Text.Megaparsec.Debug.Blind x) instance (GHC.Internal.Show.Show c, GHC.Internal.Show.Show a) => GHC.Internal.Show.Show (Text.Megaparsec.Debug.ShowComment c a) -- | This module includes everything you need to get started writing a -- parser. If you are new to Megaparsec and don't know where to begin, -- take a look at the tutorial -- https://markkarpov.com/tutorial/megaparsec.html. -- -- In addition to the Text.Megaparsec module, which exports and -- re-exports almost everything that you may need, we advise to import -- Text.Megaparsec.Char if you plan to work with a stream of -- Char tokens or Text.Megaparsec.Byte if you intend to -- parse binary data. -- -- It is common to start working with the library by defining a type -- synonym like this: -- --
--   type Parser = Parsec Void Text
--                        ^    ^
--                        |    |
--   Custom error component    Input stream type
--   
-- -- Then you can write type signatures like Parser Int—for -- a parser that returns an Int for example. -- -- Similarly (since it's known to cause confusion), you should use -- ParseErrorBundle type parametrized like this: -- --
--   ParseErrorBundle Text Void
--                    ^    ^
--                    |    |
--    Input stream type    Custom error component (the same you used in Parser)
--   
-- -- Megaparsec uses some type-level machinery to provide flexibility -- without compromising on type safety. Thus type signatures are -- sometimes necessary to avoid ambiguous types. If you're seeing an -- error message that reads like “Type variable e0 is ambiguous -- …”, you need to give an explicit signature to your parser to resolve -- the ambiguity. It's a good idea to provide type signatures for all -- top-level definitions. module Text.Megaparsec -- | This is the Megaparsec's state parametrized over stream type -- s and custom error component type e. data State s e State :: s -> {-# UNPACK #-} !Int -> PosState s -> [ParseError s e] -> State s e -- | The rest of input to process [stateInput] :: State s e -> s -- | Number of processed tokens so far [stateOffset] :: State s e -> {-# UNPACK #-} !Int -- | State that is used for line/column calculation [statePosState] :: State s e -> PosState s -- | Collection of “delayed” ParseErrors in reverse order. This -- means that the last registered error is the first element of the list. [stateParseErrors] :: State s e -> [ParseError s e] -- | A special kind of state that is used to calculate line/column -- positions on demand. data PosState s PosState :: s -> !Int -> !SourcePos -> Pos -> String -> PosState s -- | The rest of input to process [pstateInput] :: PosState s -> s -- | Offset corresponding to beginning of pstateInput [pstateOffset] :: PosState s -> !Int -- | Source position corresponding to beginning of pstateInput [pstateSourcePos] :: PosState s -> !SourcePos -- | Tab width to use for column calculation [pstateTabWidth] :: PosState s -> Pos -- | Prefix to prepend to offending line [pstateLinePrefix] :: PosState s -> String -- | Parsec is a non-transformer variant of the more general -- ParsecT monad transformer. type Parsec e s = ParsecT e s Identity -- | ParsecT e s m a is a parser with custom data component -- of error e, stream type s, underlying monad -- m and return type a. data ParsecT e s (m :: Type -> Type) a -- | parse p file input runs parser p over -- Identity (see runParserT if you're using the -- ParsecT monad transformer; parse itself is just a -- synonym for runParser). It returns either a -- ParseErrorBundle (Left) or a value of type a -- (Right). errorBundlePretty can be used to turn -- ParseErrorBundle into the string representation of the error -- message. See Text.Megaparsec.Error if you need to do more -- advanced error analysis. -- --
--   main = case parse numbers "" "11,2,43" of
--            Left bundle -> putStr (errorBundlePretty bundle)
--            Right xs -> print (sum xs)
--   
--   numbers = decimal `sepBy` char ','
--   
-- -- parse is the same as runParser. parse :: Parsec e s a -> String -> s -> Either (ParseErrorBundle s e) a -- | parseMaybe p input runs the parser p on -- input and returns the result inside Just on success -- and Nothing on failure. This function also parses eof, -- so if the parser doesn't consume all of its input, it will fail. -- -- The function is supposed to be useful for lightweight parsing, where -- error messages (and thus file names) are not important and entire -- input should be consumed. For example, it can be used for parsing of a -- single number according to a specification of its format. parseMaybe :: (Ord e, Stream s) => Parsec e s a -> s -> Maybe a -- | The expression parseTest p input applies the parser -- p on the input input and prints the result to -- stdout. Useful for testing. parseTest :: (ShowErrorComponent e, Show a, VisualStream s, TraversableStream s) => Parsec e s a -> s -> IO () -- | runParser p file input runs parser p on the -- input stream of tokens input, obtained from source -- file. The file is only used in error messages and -- may be the empty string. Returns either a ParseErrorBundle -- (Left) or a value of type a (Right). -- --
--   parseFromFile p file = runParser p file <$> readFile file
--   
-- -- runParser is the same as parse. runParser :: Parsec e s a -> String -> s -> Either (ParseErrorBundle s e) a -- | The function is similar to runParser with the difference that -- it accepts and returns the parser state. This allows us e.g. to -- specify arbitrary textual position at the beginning of parsing. This -- is the most general way to run a parser over the Identity -- monad. runParser' :: Parsec e s a -> State s e -> (State s e, Either (ParseErrorBundle s e) a) -- | runParserT p file input runs parser p on the -- input list of tokens input, obtained from source -- file. The file is only used in error messages and -- may be the empty string. Returns a computation in the underlying monad -- m that returns either a ParseErrorBundle (Left) -- or a value of type a (Right). runParserT :: Monad m => ParsecT e s m a -> String -> s -> m (Either (ParseErrorBundle s e) a) -- | This function is similar to runParserT, but like -- runParser' it accepts and returns parser state. This is thus -- the most general way to run a parser. runParserT' :: Monad m => ParsecT e s m a -> State s e -> m (State s e, Either (ParseErrorBundle s e) a) -- | Type class describing monads that implement the full set of primitive -- parsers. -- -- Note that the following primitives are “fast” and should be -- taken advantage of as much as possible if your aim is a fast parser: -- tokens, takeWhileP, takeWhile1P, and -- takeP. class (Stream s, MonadPlus m) => MonadParsec e s (m :: Type -> Type) | m -> e s -- | Stop parsing and report the ParseError. This is the only way to -- control position of the error without manipulating the parser state -- manually. parseError :: MonadParsec e s m => ParseError s e -> m a -- | The parser label name p behaves as parser p, -- but whenever the parser p fails without consuming any -- input, it replaces names of “expected” tokens with the name -- name. label :: MonadParsec e s m => String -> m a -> m a -- | hidden p behaves just like parser p, but it -- doesn't show any “expected” tokens in error message when p -- fails. -- -- Please use hidden instead of the old label "" -- idiom. hidden :: MonadParsec e s m => m a -> m a -- | The parser try p behaves like the parser p, -- except that it backtracks the parser state when p fails -- (either consuming input or not). -- -- This combinator is used whenever arbitrary look ahead is needed. Since -- it pretends that it hasn't consumed any input when p fails, -- the (<|>) combinator will try its second alternative even -- if the first parser failed while consuming input. -- -- For example, here is a parser that is supposed to parse the word “let” -- or the word “lexical”: -- --
--   >>> parseTest (string "let" <|> string "lexical") "lexical"
--   1:1:
--   unexpected "lex"
--   expecting "let"
--   
-- -- What happens here? The first parser consumes “le” and fails (because -- it doesn't see a “t”). The second parser, however, isn't tried, since -- the first parser has already consumed some input! try fixes -- this behavior and allows backtracking to work: -- --
--   >>> parseTest (try (string "let") <|> string "lexical") "lexical"
--   "lexical"
--   
-- -- try also improves error messages in case of overlapping -- alternatives, because Megaparsec's hint system can be used: -- --
--   >>> parseTest (try (string "let") <|> string "lexical") "le"
--   1:1:
--   unexpected "le"
--   expecting "let" or "lexical"
--   
-- -- Note that as of Megaparsec 4.4.0, string backtracks -- automatically (see tokens), so it does not need try. -- However, the examples above demonstrate the idea behind try so -- well that it was decided to keep them. You still need to use -- try when your alternatives are complex, composite parsers. try :: MonadParsec e s m => m a -> m a -- | If p in lookAhead p succeeds (either -- consuming input or not) the whole parser behaves like p -- succeeded without consuming anything (parser state is not updated as -- well). If p fails, lookAhead has no effect, i.e. it -- will fail consuming input if p fails consuming input. Combine -- with try if this is undesirable. lookAhead :: MonadParsec e s m => m a -> m a -- | notFollowedBy p only succeeds when the parser -- p fails. This parser never consumes any input and -- never modifies parser state. It can be used to implement the -- “longest match” rule. notFollowedBy :: MonadParsec e s m => m a -> m () -- | withRecovery r p allows us to continue parsing even if -- the parser p fails. In this case r is called with -- the actual ParseError as its argument. Typical usage is to -- return a value signifying failure to parse this particular object and -- to consume some part of the input up to the point where the next -- object starts. -- -- Note that if r fails, the original error message is reported -- as if without withRecovery. In no way recovering parser -- r can influence error messages. withRecovery :: MonadParsec e s m => (ParseError s e -> m a) -> m a -> m a -- | observing p allows us to “observe” failure of the -- p parser, should it happen, without actually ending parsing -- but instead getting the ParseError in Left. On success -- parsed value is returned in Right as usual. Note that this -- primitive just allows you to observe parse errors as they happen, it -- does not backtrack or change how the p parser works in any -- way. observing :: MonadParsec e s m => m a -> m (Either (ParseError s e) a) -- | This parser only succeeds at the end of input. eof :: MonadParsec e s m => m () -- | The parser token test expected accepts tokens for -- which the matching function test returns Just results. -- If Nothing is returned the expected set is used to -- report the items that were expected. -- -- For example, the satisfy parser is implemented as: -- --
--   satisfy f = token testToken Set.empty
--     where
--       testToken x = if f x then Just x else Nothing
--   
-- -- Note: type signature of this primitive was changed in the -- version 7.0.0. token :: MonadParsec e s m => (Token s -> Maybe a) -> Set (ErrorItem (Token s)) -> m a -- | The parser tokens test chk parses a chunk of input -- chk and returns it. The supplied predicate test is -- used to check equality of given and parsed chunks after a candidate -- chunk of correct length is fetched from the stream. -- -- This can be used for example to write chunk: -- --
--   chunk = tokens (==)
--   
-- -- Note that beginning from Megaparsec 4.4.0, this is an -- auto-backtracking primitive, which means that if it fails, it never -- consumes any input. This is done to make its consumption model match -- how error messages for this primitive are reported (which becomes an -- important thing as user gets more control with primitives like -- withRecovery): -- --
--   >>> parseTest (string "abc") "abd"
--   1:1:
--   unexpected "abd"
--   expecting "abc"
--   
-- -- This means, in particular, that it's no longer necessary to use -- try with tokens-based parsers, such as string and -- string'. This feature does not affect performance in any -- way. tokens :: MonadParsec e s m => (Tokens s -> Tokens s -> Bool) -> Tokens s -> m (Tokens s) -- | Parse zero or more tokens for which the supplied predicate -- holds. Try to use this as much as possible because for many streams -- this combinator is much faster than parsers built with many and -- satisfy. -- --
--   takeWhileP (Just "foo") f = many (satisfy f <?> "foo")
--   takeWhileP Nothing      f = many (satisfy f)
--   
-- -- The combinator never fails, although it may parse the empty chunk. takeWhileP :: MonadParsec e s m => Maybe String -> (Token s -> Bool) -> m (Tokens s) -- | Similar to takeWhileP, but fails if it can't parse at least one -- token. Try to use this as much as possible because for many streams -- this combinator is much faster than parsers built with some and -- satisfy. -- --
--   takeWhile1P (Just "foo") f = some (satisfy f <?> "foo")
--   takeWhile1P Nothing      f = some (satisfy f)
--   
-- -- Note that the combinator either succeeds or fails without consuming -- any input, so try is not necessary with it. takeWhile1P :: MonadParsec e s m => Maybe String -> (Token s -> Bool) -> m (Tokens s) -- | Extract the specified number of tokens from the input stream and -- return them packed as a chunk of stream. If there is not enough tokens -- in the stream, a parse error will be signaled. It's guaranteed that if -- the parser succeeds, the requested number of tokens will be returned. -- -- The parser is roughly equivalent to: -- --
--   takeP (Just "foo") n = count n (anySingle <?> "foo")
--   takeP Nothing      n = count n anySingle
--   
-- -- Note that if the combinator fails due to insufficient number of tokens -- in the input stream, it backtracks automatically. No try is -- necessary with takeP. takeP :: MonadParsec e s m => Maybe String -> Int -> m (Tokens s) -- | Return the full parser state as a State record. getParserState :: MonadParsec e s m => m (State s e) -- | updateParserState f applies the function f to -- the parser state. updateParserState :: MonadParsec e s m => (State s e -> State s e) -> m () -- | An escape hatch for defining custom MonadParsec primitives. You -- will need to import Text.Megaparsec.Internal in order to -- construct Reply. mkParsec :: MonadParsec e s m => (State s e -> Reply e s a) -> m a -- | Stop parsing and report a trivial ParseError. failure :: MonadParsec e s m => Maybe (ErrorItem (Token s)) -> Set (ErrorItem (Token s)) -> m a -- | Stop parsing and report a fancy ParseError. To report a single -- custom parse error, see customFailure. fancyFailure :: MonadParsec e s m => Set (ErrorFancy e) -> m a -- | The parser unexpected item fails with an error message -- telling about unexpected item item without consuming any -- input. -- --
--   unexpected item = failure (Just item) Set.empty
--   
unexpected :: MonadParsec e s m => ErrorItem (Token s) -> m a -- | Report a custom parse error. For a more general version, see -- fancyFailure. -- --
--   customFailure = fancyFailure . Set.singleton . ErrorCustom
--   
customFailure :: MonadParsec e s m => e -> m a -- | Specify how to process ParseErrors that happen inside of this -- wrapper. This applies to both normal and delayed ParseErrors. -- -- As a side-effect of the implementation the inner computation will -- start with an empty collection of delayed errors and they will be -- updated and “restored” on the way out of region. region :: MonadParsec e s m => (ParseError s e -> ParseError s e) -> m a -> m a -- | Register a ParseError for later reporting. This action does not -- end parsing and has no effect except for adding the given -- ParseError to the collection of “delayed” ParseErrors -- which will be taken into consideration at the end of parsing. Only if -- this collection is empty the parser will succeed. This is the main way -- to report several parse errors at once. registerParseError :: MonadParsec e s m => ParseError s e -> m () -- | Like failure, but for delayed ParseErrors. registerFailure :: MonadParsec e s m => Maybe (ErrorItem (Token s)) -> Set (ErrorItem (Token s)) -> m () -- | Like fancyFailure, but for delayed ParseErrors. registerFancyFailure :: MonadParsec e s m => Set (ErrorFancy e) -> m () -- | single t only matches the single token t. -- --
--   semicolon = single ';'
--   
-- -- See also: token, anySingle, char, char. single :: MonadParsec e s m => Token s -> m (Token s) -- | The parser satisfy f succeeds for any token for which -- the supplied function f returns True. -- --
--   digitChar = satisfy isDigit <?> "digit"
--   oneOf cs  = satisfy (`elem` cs)
--   
-- -- Performance note: when you need to parse a single token, it is -- often a good idea to use satisfy with the right predicate -- function instead of creating a complex parser using the combinators. -- -- See also: anySingle, anySingleBut, oneOf, -- noneOf. satisfy :: MonadParsec e s m => (Token s -> Bool) -> m (Token s) -- | Parse and return a single token. It's a good idea to attach a -- label to this parser. -- --
--   anySingle = satisfy (const True)
--   
-- -- See also: satisfy, anySingleBut. anySingle :: MonadParsec e s m => m (Token s) -- | Match any token but the given one. It's a good idea to attach a -- label to this parser. -- --
--   anySingleBut t = satisfy (/= t)
--   
-- -- See also: single, anySingle, satisfy. anySingleBut :: MonadParsec e s m => Token s -> m (Token s) -- | oneOf ts succeeds if the current token is in the -- supplied collection of tokens ts. Returns the parsed token. -- Note that this parser cannot automatically generate the “expected” -- component of error message, so usually you should label it manually -- with label or (<?>). -- --
--   oneOf cs = satisfy (`elem` cs)
--   
-- -- See also: satisfy. -- --
--   digit = oneOf ['0'..'9'] <?> "digit"
--   
-- -- Performance note: prefer satisfy when you can because -- it's faster when you have only a couple of tokens to compare to: -- --
--   quoteFast = satisfy (\x -> x == '\'' || x == '\"')
--   quoteSlow = oneOf "'\""
--   
oneOf :: (Foldable f, MonadParsec e s m) => f (Token s) -> m (Token s) -- | As the dual of oneOf, noneOf ts succeeds if the -- current token not in the supplied list of tokens ts. -- Returns the parsed character. Note that this parser cannot -- automatically generate the “expected” component of error message, so -- usually you should label it manually with label or -- (<?>). -- --
--   noneOf cs = satisfy (`notElem` cs)
--   
-- -- See also: satisfy. -- -- Performance note: prefer satisfy and anySingleBut -- when you can because it's faster. noneOf :: (Foldable f, MonadParsec e s m) => f (Token s) -> m (Token s) -- | chunk chk only matches the chunk chk. -- --
--   divOrMod = chunk "div" <|> chunk "mod"
--   
-- -- See also: tokens, string, string. chunk :: MonadParsec e s m => Tokens s -> m (Tokens s) -- | A synonym for label in the form of an operator. () :: MonadParsec e s m => m a -> String -> m a infix 0 -- | Return both the result of a parse and a chunk of input that was -- consumed during parsing. This relies on the change of the -- stateOffset value to evaluate how many tokens were consumed. If -- you mess with it manually in the argument parser, prepare for -- troubles. match :: MonadParsec e s m => m a -> m (Tokens s, a) -- | Consume the rest of the input and return it as a chunk. This parser -- never fails, but may return the empty chunk. -- --
--   takeRest = takeWhileP Nothing (const True)
--   
takeRest :: MonadParsec e s m => m (Tokens s) -- | Return True when end of input has been reached. -- --
--   atEnd = option False (True <$ hidden eof)
--   
atEnd :: MonadParsec e s m => m Bool -- | Return the current input. getInput :: MonadParsec e s m => m s -- | setInput input continues parsing with input. setInput :: MonadParsec e s m => s -> m () -- | Return the current source position. This function is not cheap, -- do not call it e.g. on matching of every token, that's a bad idea. -- Still you can use it to get SourcePos to attach to things that -- you parse. -- -- The function works under the assumption that we move in the input -- stream only forwards and never backwards, which is always true unless -- the user abuses the library. getSourcePos :: (TraversableStream s, MonadParsec e s m) => m SourcePos -- | Get the number of tokens processed so far. -- -- See also: setOffset. getOffset :: MonadParsec e s m => m Int -- | Set the number of tokens processed so far. -- -- See also: getOffset. setOffset :: MonadParsec e s m => Int -> m () -- | setParserState st sets the parser state to -- st. -- -- See also: getParserState, updateParserState. setParserState :: MonadParsec e s m => State s e -> m () -- | Commonly used character parsers. module Text.Megaparsec.Char -- | Parse a newline character. newline :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a carriage return character followed by a newline character. -- Return the sequence of characters parsed. crlf :: (MonadParsec e s m, Token s ~ Char) => m (Tokens s) -- | Parse a CRLF (see crlf) or LF (see newline) end of line. -- Return the sequence of characters parsed. eol :: (MonadParsec e s m, Token s ~ Char) => m (Tokens s) -- | Parse a tab character. tab :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Skip zero or more white space characters. -- -- See also: skipMany and spaceChar. space :: (MonadParsec e s m, Token s ~ Char) => m () -- | Like space, but does not accept newlines and carriage returns. hspace :: (MonadParsec e s m, Token s ~ Char) => m () -- | Skip one or more white space characters. -- -- See also: skipSome and spaceChar. space1 :: (MonadParsec e s m, Token s ~ Char) => m () -- | Like space1, but does not accept newlines and carriage returns. hspace1 :: (MonadParsec e s m, Token s ~ Char) => m () -- | Parse a control character (a non-printing character of the Latin-1 -- subset of Unicode). controlChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode space character, and the control characters: tab, -- newline, carriage return, form feed, and vertical tab. spaceChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse an upper-case or title-case alphabetic Unicode character. Title -- case is used by a small number of letter ligatures like the -- single-character form of Lj. upperChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a lower-case alphabetic Unicode character. lowerChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse an alphabetic Unicode character: lower-case, upper-case, or -- title-case letter, or a letter of case-less scripts/modifier letter. letterChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse an alphabetic or numeric digit Unicode characters. -- -- Note that the numeric digits outside the ASCII range are parsed by -- this parser but not by digitChar. Such digits may be part of -- identifiers but are not used by the printer and reader to represent -- numbers. alphaNumChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a printable Unicode character: letter, number, mark, -- punctuation, symbol or space. printChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse an ASCII digit, i.e between “0” and “9”. digitChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a binary digit, i.e. "0" or "1". binDigitChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse an octal digit, i.e. between “0” and “7”. octDigitChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a hexadecimal digit, i.e. between “0” and “9”, or “a” and “f”, -- or “A” and “F”. hexDigitChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode mark character (accents and the like), which combines -- with preceding characters. markChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode numeric character, including digits from various -- scripts, Roman numerals, etc. numberChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode punctuation character, including various kinds of -- connectors, brackets and quotes. punctuationChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode symbol characters, including mathematical and currency -- symbols. symbolChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a Unicode space and separator characters. separatorChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a character from the first 128 characters of the Unicode -- character set, corresponding to the ASCII character set. asciiChar :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | Parse a character from the first 256 characters of the Unicode -- character set, corresponding to the ISO 8859-1 (Latin-1) character -- set. latin1Char :: (MonadParsec e s m, Token s ~ Char) => m (Token s) -- | charCategory cat parses character in Unicode General -- Category cat, see GeneralCategory. charCategory :: (MonadParsec e s m, Token s ~ Char) => GeneralCategory -> m (Token s) -- | Return the human-readable name of Unicode General Category. categoryName :: GeneralCategory -> String -- | A type-constrained version of single. -- --
--   semicolon = char ';'
--   
char :: (MonadParsec e s m, Token s ~ Char) => Token s -> m (Token s) -- | The same as char but case-insensitive. This parser returns the -- actually parsed character preserving its case. -- --
--   >>> parseTest (char' 'e') "E"
--   'E'
--   
--   >>> parseTest (char' 'e') "G"
--   1:1:
--   unexpected 'G'
--   expecting 'E' or 'e'
--   
char' :: (MonadParsec e s m, Token s ~ Char) => Token s -> m (Token s) -- | A synonym for chunk. string :: MonadParsec e s m => Tokens s -> m (Tokens s) -- | The same as string, but case-insensitive. On success returns -- string cased as the parsed input. -- --
--   >>> parseTest (string' "foobar") "foObAr"
--   "foObAr"
--   
string' :: (MonadParsec e s m, FoldCase (Tokens s)) => Tokens s -> m (Tokens s) -- | High-level parsers to help you write your lexer. The module doesn't -- impose how you should write your parser, but certain approaches may be -- more elegant than others. -- -- Parsing of white space is an important part of any parser. We propose -- a convention where every lexeme parser assumes no spaces before -- the lexeme and consumes all spaces after the lexeme; this -- is what the lexeme combinator does, and so it's enough to wrap -- every lexeme parser with lexeme to achieve this. Note that -- you'll need to call space manually to consume any white space -- before the first lexeme (i.e. at the beginning of the file). -- -- This module is intended to be imported qualified: -- --
--   import qualified Text.Megaparsec.Char.Lexer as L
--   
-- -- To do lexing of byte streams, see Text.Megaparsec.Byte.Lexer. module Text.Megaparsec.Char.Lexer -- | space sc lineComment blockComment produces a parser -- that can parse white space in general. It's expected that you create -- such a parser once and pass it to other functions in this module as -- needed (when you see spaceConsumer in documentation, usually -- it means that something like space is expected there). -- -- sc is used to parse blocks of space characters. You can use -- space1 from Text.Megaparsec.Char for this purpose as -- well as your own parser (if you don't want to automatically consume -- newlines, for example). Make sure that the parser does not succeed on -- the empty input though. In an earlier version of the library -- spaceChar was recommended, but now parsers based on -- takeWhile1P are preferred because of their speed. -- -- lineComment is used to parse line comments. You can use -- skipLineComment if you don't need anything special. -- -- blockComment is used to parse block (multi-line) comments. -- You can use skipBlockComment or -- skipBlockCommentNested if you don't need anything special. -- -- If you don't want to allow a kind of comment, simply pass empty -- which will fail instantly when parsing of that sort of comment is -- attempted and space will just move on or finish depending on -- whether there is more white space for it to consume. space :: MonadParsec e s m => m () -> m () -> m () -> m () -- | This is a wrapper for lexemes. The typical usage is to supply the -- first argument (parser that consumes white space, probably defined via -- space) and use the resulting function to wrap parsers for every -- lexeme. -- --
--   lexeme  = L.lexeme spaceConsumer
--   integer = lexeme L.decimal
--   
lexeme :: MonadParsec e s m => m () -> m a -> m a -- | This is a helper to parse symbols, i.e. verbatim strings. You pass the -- first argument (parser that consumes white space, probably defined via -- space) and then you can use the resulting function to parse -- strings: -- --
--   symbol    = L.symbol spaceConsumer
--   
--   parens    = between (symbol "(") (symbol ")")
--   braces    = between (symbol "{") (symbol "}")
--   angles    = between (symbol "<") (symbol ">")
--   brackets  = between (symbol "[") (symbol "]")
--   semicolon = symbol ";"
--   comma     = symbol ","
--   colon     = symbol ":"
--   dot       = symbol "."
--   
symbol :: MonadParsec e s m => m () -> Tokens s -> m (Tokens s) -- | A case-insensitive version of symbol. This may be helpful if -- you're working with case-insensitive languages. symbol' :: (MonadParsec e s m, FoldCase (Tokens s)) => m () -> Tokens s -> m (Tokens s) -- | Given a comment prefix this function returns a parser that skips line -- comments. Note that it stops just before the newline character but -- doesn't consume the newline. Newline is either supposed to be consumed -- by space parser or picked up manually. skipLineComment :: (MonadParsec e s m, Token s ~ Char) => Tokens s -> m () -- | skipBlockComment start end skips non-nested block -- comment starting with start and ending with end. skipBlockComment :: MonadParsec e s m => Tokens s -> Tokens s -> m () -- | skipBlockCommentNested start end skips possibly nested -- block comment starting with start and ending with -- end. skipBlockCommentNested :: (MonadParsec e s m, Token s ~ Char) => Tokens s -> Tokens s -> m () -- | Return the current indentation level. -- -- The function is a simple shortcut defined as: -- --
--   indentLevel = sourceColumn <$> getPosition
--   
indentLevel :: (TraversableStream s, MonadParsec e s m) => m Pos -- | Fail reporting incorrect indentation error. The error has attached -- information: -- -- incorrectIndent :: MonadParsec e s m => Ordering -> Pos -> Pos -> m a -- | indentGuard spaceConsumer ord ref first consumes all -- white space (indentation) with spaceConsumer parser, then it -- checks the column position. Ordering between current indentation level -- and the reference indentation level ref should be -- ord, otherwise the parser fails. On success the current -- column position is returned. -- -- When you want to parse a block of indentation, first run this parser -- with arguments like indentGuard spaceConsumer GT -- pos1—this will make sure you have some indentation. Use -- returned value to check indentation on every subsequent line according -- to syntax of your language. indentGuard :: (TraversableStream s, MonadParsec e s m) => m () -> Ordering -> Pos -> m Pos -- | Parse a non-indented construction. This ensures that there is no -- indentation before actual data. Useful, for example, as a wrapper for -- top-level function definitions. nonIndented :: (TraversableStream s, MonadParsec e s m) => m () -> m a -> m a -- | Behaviors for parsing of indented tokens. This is used in -- indentBlock, which see. data IndentOpt (m :: Type -> Type) a b -- | Parse no indented tokens, just return the value IndentNone :: a -> IndentOpt (m :: Type -> Type) a b -- | Parse many indented tokens (possibly zero), use given indentation -- level (if Nothing, use level of the first indented token); the -- second argument tells how to get the final result, and the third -- argument describes how to parse an indented token IndentMany :: Maybe Pos -> ([b] -> m a) -> m b -> IndentOpt (m :: Type -> Type) a b -- | Just like IndentMany, but requires at least one indented token -- to be present IndentSome :: Maybe Pos -> ([b] -> m a) -> m b -> IndentOpt (m :: Type -> Type) a b -- | Parse a “reference” token and a number of other tokens that have a -- greater (but the same for all of them) level of indentation than that -- of the “reference” token. The reference token can influence parsing, -- see IndentOpt for more information. -- -- Note: the first argument of this function must consume -- newlines among other white space characters. indentBlock :: (TraversableStream s, MonadParsec e s m, Token s ~ Char) => m () -> m (IndentOpt m a b) -> m a -- | Create a parser that supports line-folding. The first argument is used -- to consume white space between components of line fold, thus it -- must consume newlines in order to work properly. The second -- argument is a callback that receives a custom space-consuming parser -- as an argument. This parser should be used after separate components -- of line fold that can be put on different lines. -- -- An example should clarify the usage pattern: -- --
--   sc = L.space (void spaceChar) empty empty
--   
--   myFold = L.lineFold sc $ \sc' -> do
--     L.symbol sc' "foo"
--     L.symbol sc' "bar"
--     L.symbol sc  "baz" -- for the last symbol we use normal space consumer
--   
lineFold :: (TraversableStream s, MonadParsec e s m) => m () -> (m () -> m a) -> m a -- | The lexeme parser parses a single literal character without quotes. -- The purpose of this parser is to help with parsing of conventional -- escape sequences. It's your responsibility to take care of character -- literal syntax in your language (by surrounding it with single quotes -- or similar). -- -- The literal character is parsed according to the grammar rules defined -- in the Haskell report. -- -- Note that you can use this parser as a building block to parse various -- string literals: -- --
--   stringLiteral = char '"' >> manyTill L.charLiteral (char '"')
--   
-- -- Performance note: the parser is not particularly efficient at -- the moment. charLiteral :: (MonadParsec e s m, Token s ~ Char) => m Char -- | Parse an integer in the decimal representation according to the format -- of integer literals described in the Haskell report. -- -- If you need to parse signed integers, see the signed -- combinator. -- -- Note: before the version 6.0.0 the function returned -- Integer, i.e. it wasn't polymorphic in its return type. -- -- Warning: this function does not perform range checks. decimal :: (MonadParsec e s m, Token s ~ Char, Num a) => m a -- | Parse an integer in binary representation. The binary number is -- expected to be a non-empty sequence of zeroes “0” and ones “1”. -- -- You could of course parse some prefix before the actual number: -- --
--   binary = char '0' >> char' 'b' >> L.binary
--   
-- -- Warning: this function does not perform range checks. binary :: (MonadParsec e s m, Token s ~ Char, Num a) => m a -- | Parse an integer in the octal representation. The format of the octal -- number is expected to be according to the Haskell report except for -- the fact that this parser doesn't parse “0o” or “0O” prefix. It is a -- responsibility of the programmer to parse correct prefix before -- parsing the number itself. -- -- For example you can make it conform to the Haskell report like this: -- --
--   octal = char '0' >> char' 'o' >> L.octal
--   
-- -- Note: before version 6.0.0 the function returned -- Integer, i.e. it wasn't polymorphic in its return type. -- -- Warning: this function does not perform range checks. octal :: (MonadParsec e s m, Token s ~ Char, Num a) => m a -- | Parse an integer in the hexadecimal representation. The format of the -- hexadecimal number is expected to be according to the Haskell report -- except for the fact that this parser doesn't parse “0x” or “0X” -- prefix. It is a responsibility of the programmer to parse correct -- prefix before parsing the number itself. -- -- For example you can make it conform to the Haskell report like this: -- --
--   hexadecimal = char '0' >> char' 'x' >> L.hexadecimal
--   
-- -- Note: before version 6.0.0 the function returned -- Integer, i.e. it wasn't polymorphic in its return type. -- -- Warning: this function does not perform range checks. hexadecimal :: (MonadParsec e s m, Token s ~ Char, Num a) => m a -- | Parse a floating point value as a Scientific number. -- Scientific is great for parsing of arbitrary precision numbers -- coming from an untrusted source. See documentation in -- Data.Scientific for more information. -- -- The parser can be used to parse integers or floating point values. Use -- functions like floatingOrInteger from Data.Scientific to -- test and extract integer or real values. -- -- This function does not parse sign, if you need to parse signed -- numbers, see signed. scientific :: (MonadParsec e s m, Token s ~ Char) => m Scientific -- | Parse a floating point number according to the syntax for floating -- point literals described in the Haskell report. -- -- This function does not parse sign, if you need to parse signed -- numbers, see signed. -- -- Note: before version 6.0.0 the function returned -- Double, i.e. it wasn't polymorphic in its return type. -- -- Note: in versions 6.0.06.1.1 this function -- accepted plain integers. float :: (MonadParsec e s m, Token s ~ Char, RealFloat a) => m a -- | signed space p parses an optional sign character (“+” -- or “-”), then if there is a sign it consumes optional white space -- (using the space parser), then it runs the parser p -- which should return a number. Sign of the number is changed according -- to the previously parsed sign character. -- -- For example, to parse signed integer you can write: -- --
--   lexeme        = L.lexeme spaceConsumer
--   integer       = lexeme L.decimal
--   signedInteger = L.signed spaceConsumer integer
--   
signed :: (MonadParsec e s m, Token s ~ Char, Num a) => m () -> m a -> m a -- | Binary-format number parsers. module Text.Megaparsec.Byte.Binary -- | Data types that can be converted to little- or big- endian numbers. class BinaryChunk chunk convertChunkBE :: (BinaryChunk chunk, Bits a, Num a) => chunk -> a convertChunkLE :: (BinaryChunk chunk, Bits a, Num a) => chunk -> a -- | Parse a little-endian number. -- -- You may wish to call this with a visible type application: -- --
--   number <- anyLE (Just "little-endian 32 bit word") @Word32
--   
anyLE :: forall a e s m. (MonadParsec e s m, FiniteBits a, Num a, BinaryChunk (Tokens s)) => Maybe String -> m a -- | Parse a big-endian number. -- -- You may wish to call this with a visible type application: -- --
--   number <- anyBE (Just "big-endian 32 bit word") @Word32
--   
anyBE :: forall a e s m. (MonadParsec e s m, FiniteBits a, Num a, BinaryChunk (Tokens s)) => Maybe String -> m a -- | Parse a Word8. word8 :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word8 -- | Parse a little-endian Word16. word16le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word16 -- | Parse a big-endian Word16. word16be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word16 -- | Parse a little-endian Word32. word32le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word32 -- | Parse a big-endian Word32. word32be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word32 -- | Parse a little-endian Word64. word64le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word64 -- | Parse a big-endian Word64. word64be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Word64 -- | Parse a Int8. int8 :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int8 -- | Parse a little-endian Int16. int16le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int16 -- | Parse a big-endian Int16. int16be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int16 -- | Parse a little-endian Int32. int32le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int32 -- | Parse a big-endian Int32. int32be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int32 -- | Parse a little-endian Int64. int64le :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int64 -- | Parse a big-endian Int64. int64be :: (MonadParsec e s m, BinaryChunk (Tokens s)) => m Int64 instance Text.Megaparsec.Byte.Binary.BinaryChunk Data.ByteString.Lazy.Internal.ByteString instance Text.Megaparsec.Byte.Binary.BinaryChunk Data.ByteString.Internal.Type.ByteString -- | Commonly used binary parsers. module Text.Megaparsec.Byte -- | Parse a newline byte. newline :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a carriage return character followed by a newline character. -- Return the sequence of characters parsed. crlf :: (MonadParsec e s m, Token s ~ Word8) => m (Tokens s) -- | Parse a CRLF (see crlf) or LF (see newline) end of line. -- Return the sequence of characters parsed. eol :: (MonadParsec e s m, Token s ~ Word8) => m (Tokens s) -- | Parse a tab character. tab :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Skip zero or more white space characters. -- -- See also: skipMany and spaceChar. space :: (MonadParsec e s m, Token s ~ Word8) => m () -- | Like space, but does not accept newlines and carriage returns. hspace :: (MonadParsec e s m, Token s ~ Word8) => m () -- | Skip one or more white space characters. -- -- See also: skipSome and spaceChar. space1 :: (MonadParsec e s m, Token s ~ Word8) => m () -- | Like space1, but does not accept newlines and carriage returns. hspace1 :: (MonadParsec e s m, Token s ~ Word8) => m () -- | Parse a control character. controlChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a space character, and the control characters: tab, newline, -- carriage return, form feed, and vertical tab. spaceChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse an upper-case character. upperChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a lower-case alphabetic character. lowerChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse an alphabetic character: lower-case or upper-case. letterChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse an alphabetic or digit characters. alphaNumChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a printable character: letter, number, mark, punctuation, symbol -- or space. printChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse an ASCII digit, i.e between “0” and “9”. digitChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a binary digit, i.e. “0” or “1”. binDigitChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse an octal digit, i.e. between “0” and “7”. octDigitChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a hexadecimal digit, i.e. between “0” and “9”, or “a” and “f”, -- or “A” and “F”. hexDigitChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | Parse a character from the first 128 characters of the Unicode -- character set, corresponding to the ASCII character set. asciiChar :: (MonadParsec e s m, Token s ~ Word8) => m (Token s) -- | A type-constrained version of single. -- --
--   newline = char 10
--   
char :: (MonadParsec e s m, Token s ~ Word8) => Token s -> m (Token s) -- | The same as char but case-insensitive. This parser returns the -- actually parsed character preserving its case. -- --
--   >>> parseTest (char' 101) "E"
--   69 -- 'E'
--   
--   >>> parseTest (char' 101) "G"
--   1:1:
--   unexpected 'G'
--   expecting 'E' or 'e'
--   
char' :: (MonadParsec e s m, Token s ~ Word8) => Token s -> m (Token s) -- | A synonym for chunk. string :: MonadParsec e s m => Tokens s -> m (Tokens s) -- | The same as string, but case-insensitive. On success returns -- string cased as the parsed input. -- --
--   >>> parseTest (string' "foobar") "foObAr"
--   "foObAr"
--   
string' :: (MonadParsec e s m, FoldCase (Tokens s)) => Tokens s -> m (Tokens s) -- | Stripped-down version of Text.Megaparsec.Char.Lexer for streams -- of bytes. -- -- This module is intended to be imported qualified: -- --
--   import qualified Text.Megaparsec.Byte.Lexer as L
--   
module Text.Megaparsec.Byte.Lexer -- | space sc lineComment blockComment produces a parser -- that can parse white space in general. It's expected that you create -- such a parser once and pass it to other functions in this module as -- needed (when you see spaceConsumer in documentation, usually -- it means that something like space is expected there). -- -- sc is used to parse blocks of space characters. You can use -- space1 from Text.Megaparsec.Char for this purpose as -- well as your own parser (if you don't want to automatically consume -- newlines, for example). Make sure that the parser does not succeed on -- the empty input though. In an earlier version of the library -- spaceChar was recommended, but now parsers based on -- takeWhile1P are preferred because of their speed. -- -- lineComment is used to parse line comments. You can use -- skipLineComment if you don't need anything special. -- -- blockComment is used to parse block (multi-line) comments. -- You can use skipBlockComment or -- skipBlockCommentNested if you don't need anything special. -- -- If you don't want to allow a kind of comment, simply pass empty -- which will fail instantly when parsing of that sort of comment is -- attempted and space will just move on or finish depending on -- whether there is more white space for it to consume. space :: MonadParsec e s m => m () -> m () -> m () -> m () -- | This is a wrapper for lexemes. The typical usage is to supply the -- first argument (parser that consumes white space, probably defined via -- space) and use the resulting function to wrap parsers for every -- lexeme. -- --
--   lexeme  = L.lexeme spaceConsumer
--   integer = lexeme L.decimal
--   
lexeme :: MonadParsec e s m => m () -> m a -> m a -- | This is a helper to parse symbols, i.e. verbatim strings. You pass the -- first argument (parser that consumes white space, probably defined via -- space) and then you can use the resulting function to parse -- strings: -- --
--   symbol    = L.symbol spaceConsumer
--   
--   parens    = between (symbol "(") (symbol ")")
--   braces    = between (symbol "{") (symbol "}")
--   angles    = between (symbol "<") (symbol ">")
--   brackets  = between (symbol "[") (symbol "]")
--   semicolon = symbol ";"
--   comma     = symbol ","
--   colon     = symbol ":"
--   dot       = symbol "."
--   
symbol :: MonadParsec e s m => m () -> Tokens s -> m (Tokens s) -- | A case-insensitive version of symbol. This may be helpful if -- you're working with case-insensitive languages. symbol' :: (MonadParsec e s m, FoldCase (Tokens s)) => m () -> Tokens s -> m (Tokens s) -- | Given a comment prefix this function returns a parser that skips line -- comments. Note that it stops just before the newline character but -- doesn't consume the newline. Newline is either supposed to be consumed -- by space parser or picked up manually. skipLineComment :: (MonadParsec e s m, Token s ~ Word8) => Tokens s -> m () -- | skipBlockComment start end skips non-nested block -- comment starting with start and ending with end. skipBlockComment :: MonadParsec e s m => Tokens s -> Tokens s -> m () -- | skipBlockCommentNested start end skips possibly nested -- block comment starting with start and ending with -- end. skipBlockCommentNested :: (MonadParsec e s m, Token s ~ Word8) => Tokens s -> Tokens s -> m () -- | Parse an integer in the decimal representation according to the format -- of integer literals described in the Haskell report. -- -- If you need to parse signed integers, see the signed -- combinator. -- -- Warning: this function does not perform range checks. decimal :: (MonadParsec e s m, Token s ~ Word8, Num a) => m a -- | Parse an integer in the binary representation. The binary number is -- expected to be a non-empty sequence of zeroes “0” and ones “1”. -- -- You could of course parse some prefix before the actual number: -- --
--   binary = char 48 >> char' 98 >> L.binary
--   
-- -- Warning: this function does not perform range checks. binary :: (MonadParsec e s m, Token s ~ Word8, Num a) => m a -- | Parse an integer in the octal representation. The format of the octal -- number is expected to be according to the Haskell report except for -- the fact that this parser doesn't parse “0o” or “0O” prefix. It is a -- responsibility of the programmer to parse correct prefix before -- parsing the number itself. -- -- For example you can make it conform to the Haskell report like this: -- --
--   octal = char 48 >> char' 111 >> L.octal
--   
-- -- Warning: this function does not perform range checks. octal :: (MonadParsec e s m, Token s ~ Word8, Num a) => m a -- | Parse an integer in the hexadecimal representation. The format of the -- hexadecimal number is expected to be according to the Haskell report -- except for the fact that this parser doesn't parse “0x” or “0X” -- prefix. It is a responsibility of the programmer to parse correct -- prefix before parsing the number itself. -- -- For example you can make it conform to the Haskell report like this: -- --
--   hexadecimal = char 48 >> char' 120 >> L.hexadecimal
--   
-- -- Warning: this function does not perform range checks. hexadecimal :: (MonadParsec e s m, Token s ~ Word8, Num a) => m a -- | Parse a floating point value as a Scientific number. -- Scientific is great for parsing of arbitrary precision numbers -- coming from an untrusted source. See documentation in -- Data.Scientific for more information. -- -- The parser can be used to parse integers or floating point values. Use -- functions like floatingOrInteger from Data.Scientific to -- test and extract integer or real values. -- -- This function does not parse sign, if you need to parse signed -- numbers, see signed. scientific :: (MonadParsec e s m, Token s ~ Word8) => m Scientific -- | Parse a floating point number according to the syntax for floating -- point literals described in the Haskell report. -- -- This function does not parse sign, if you need to parse signed -- numbers, see signed. -- -- Note: in versions 6.0.06.1.1 this function -- accepted plain integers. float :: (MonadParsec e s m, Token s ~ Word8, RealFloat a) => m a -- | signed space p parser parses an optional sign -- character (“+” or “-”), then if there is a sign it consumes optional -- white space (using space parser), then it runs parser -- p which should return a number. Sign of the number is changed -- according to the previously parsed sign character. -- -- For example, to parse signed integer you can write: -- --
--   lexeme        = L.lexeme spaceConsumer
--   integer       = lexeme L.decimal
--   signedInteger = L.signed spaceConsumer integer
--   
signed :: (MonadParsec e s m, Token s ~ Word8, Num a) => m () -> m a -> m a