pandoc-3.6.2: Conversion between markup formats
CopyrightCopyright (C) 2006-2024 John MacFarlane
LicenseGNU GPL, version 2 or above
MaintainerJohn MacFarlane <jgm@berkeley.edu>
Stabilityalpha
Portabilityportable
Safe HaskellNone
LanguageHaskell2010

Text.Pandoc.Parsing

Description

A utility library with parsers used in pandoc readers.

Synopsis

Documentation

countChar :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char, Monad m) => Int -> ParsecT s st m Char -> ParsecT s st m Text Source #

Like count, but packs its result

textStr :: forall s (m :: Type -> Type) u. (Stream s m Char, UpdateSourcePos s Char) => Text -> ParsecT s u m Text Source #

Like string, but uses Text.

anyLine :: forall (m :: Type -> Type) st. Monad m => ParsecT Sources st m Text Source #

Parse any line of text, returning the contents without the final newline.

anyLineNewline :: forall (m :: Type -> Type) st. Monad m => ParsecT Sources st m Text Source #

Parse any line, include the final newline in the output

indentWith :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char, HasReaderOptions st) => Int -> ParsecT s st m Text Source #

Parse indent by specified number of spaces (or equiv. tabs)

manyChar :: forall s (m :: Type -> Type) t st. Stream s m t => ParsecT s st m Char -> ParsecT s st m Text Source #

Like many, but packs its result.

many1Char :: forall s (m :: Type -> Type) t st. Stream s m t => ParsecT s st m Char -> ParsecT s st m Text Source #

Like many1, but packs its result.

manyTillChar :: forall s (m :: Type -> Type) t st a. Stream s m t => ParsecT s st m Char -> ParsecT s st m a -> ParsecT s st m Text Source #

Like manyTill, but packs its result.

many1TillChar :: forall end s (m :: Type -> Type) t st. (Show end, Stream s m t) => ParsecT s st m Char -> ParsecT s st m end -> ParsecT s st m Text Source #

Like many1Till, but packs its result

many1Till :: forall end s (m :: Type -> Type) t st a. (Show end, Stream s m t) => ParsecT s st m a -> ParsecT s st m end -> ParsecT s st m [a] Source #

Like manyTill, but reads at least one item.

manyUntil :: forall s u (m :: Type -> Type) a b. ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m ([a], b) Source #

Like manyTill, but also returns the result of end parser.

manyUntilChar :: forall s u (m :: Type -> Type) b. ParsecT s u m Char -> ParsecT s u m b -> ParsecT s u m (Text, b) Source #

Like manyUntil, but also packs its result.

sepBy1' :: forall s u (m :: Type -> Type) a sep. ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] Source #

Like sepBy1 from Parsec, but does not fail if it sep succeeds and p fails.

notFollowedBy' :: forall b s (m :: Type -> Type) a st. (Show b, Stream s m a) => ParsecT s st m b -> ParsecT s st m () Source #

A more general form of notFollowedBy. This one allows any type of parser to be specified, and succeeds only if that parser fails. It does not consume any input.

oneOfStrings :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => [Text] -> ParsecT s st m Text Source #

Parses one of a list of strings. If the list contains two strings one of which is a prefix of the other, the longer string will be matched if possible.

oneOfStringsCI :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => [Text] -> ParsecT s st m Text Source #

Parses one of a list of strings (tried in order), case insensitive.

spaceChar :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Char Source #

Parses a space or tab.

nonspaceChar :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Char Source #

Parses a nonspace, nonnewline character.

skipSpaces :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m () Source #

Skips zero or more spaces or tabs.

blankline :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Char Source #

Skips zero or more spaces or tabs, then reads a newline.

blanklines :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Text Source #

Parses one or more blank lines and returns a string of newlines.

gobbleSpaces :: forall st (m :: Type -> Type). (HasReaderOptions st, Monad m) => Int -> ParsecT Sources st m () Source #

Gobble n spaces; if tabs are encountered, expand them and gobble some or all of their spaces, leaving the rest.

gobbleAtMostSpaces :: forall st (m :: Type -> Type). (HasReaderOptions st, Monad m) => Int -> ParsecT Sources st m Int Source #

Gobble up to n spaces; if tabs are encountered, expand them and gobble some or all of their spaces, leaving the rest.

enclosed Source #

Arguments

:: forall end s (m :: Type -> Type) st t a. (Show end, Stream s m Char, UpdateSourcePos s Char) 
=> ParsecT s st m t

start parser

-> ParsecT s st m end

end parser

-> ParsecT s st m a

content parser (to be used repeatedly)

-> ParsecT s st m [a] 

Parses material enclosed between start and end parsers.

stringAnyCase :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => Text -> ParsecT s st m Text Source #

Parse string, case insensitive.

parseFromString :: forall (m :: Type -> Type) st r. Monad m => ParsecT Sources st m r -> Text -> ParsecT Sources st m r Source #

Parse contents of str using parser and return result.

parseFromString' :: forall (m :: Type -> Type) u a. (Monad m, HasLastStrPosition u) => ParsecT Sources u m a -> Text -> ParsecT Sources u m a Source #

Like parseFromString but specialized for ParserState. This resets stateLastStrPos, which is almost always what we want.

lineClump :: forall (m :: Type -> Type) st. Monad m => ParsecT Sources st m Text Source #

Parse raw line block up to and including blank lines.

charsInBalanced :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => Char -> Char -> ParsecT s st m Text -> ParsecT s st m Text Source #

Parse a string of characters between an open character and a close character, including text between balanced pairs of open and close, which must be different. For example, charsInBalanced '(' ')' (Data.Text.singleton $ anyChar) will parse "(hello (there))" and return "hello (there)".

romanNumeral Source #

Arguments

:: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) 
=> Bool

Uppercase if true

-> ParsecT s st m Int 

Parses a roman numeral (uppercase or lowercase), returns number.

emailAddress :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (Text, Text) Source #

Parses an email address; returns original and corresponding escaped mailto: URI.

uri :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (Text, Text) Source #

Parses a URI. Returns pair of original and URI-escaped version.

mathInline :: forall st s (m :: Type -> Type). (HasReaderOptions st, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Text Source #

mathDisplay :: forall st s (m :: Type -> Type). (HasReaderOptions st, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Text Source #

withHorizDisplacement Source #

Arguments

:: forall s (m :: Type -> Type) st a. (Stream s m Char, UpdateSourcePos s Char) 
=> ParsecT s st m a

Parsec to apply

-> ParsecT s st m (a, Int)

(result, displacement)

Applies a parser, returns tuple of its results and its horizontal displacement (the difference between the source column at the end and the source column at the beginning). Vertical displacement (source row) is ignored.

withRaw :: forall (m :: Type -> Type) st a. Monad m => ParsecT Sources st m a -> ParsecT Sources st m (a, Text) Source #

Applies a parser and returns the raw string that was parsed, along with the value produced by the parser.

escaped Source #

Arguments

:: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) 
=> ParsecT s st m Char

Parsec for character to escape

-> ParsecT s st m Char 

Parses backslash, then applies character parser.

characterReference :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Text Source #

Parse character entity.

upperRoman :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (ListNumberStyle, Int) Source #

Parses an uppercase roman numeral and returns (UpperRoman, number).

lowerRoman :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (ListNumberStyle, Int) Source #

Parses a lowercase roman numeral and returns (LowerRoman, number).

decimal :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (ListNumberStyle, Int) Source #

Parses a decimal numeral and returns (Decimal, number).

lowerAlpha :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (ListNumberStyle, Int) Source #

Parses a lowercase letter and returns (LowerAlpha, number).

upperAlpha :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m (ListNumberStyle, Int) Source #

Parses an uppercase letter and returns (UpperAlpha, number).

anyOrderedListMarker :: forall s (m :: Type -> Type). (Stream s m Char, UpdateSourcePos s Char) => ParsecT s ParserState m ListAttributes Source #

Parses an ordered list marker and returns list attributes.

orderedListMarker :: forall s (m :: Type -> Type). (Stream s m Char, UpdateSourcePos s Char) => ListNumberStyle -> ListNumberDelim -> ParsecT s ParserState m Int Source #

Parses an ordered list marker with a given style and delimiter, returns number.

charRef :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inline Source #

Parses a character reference and returns a Str element.

lineBlockLines :: forall (m :: Type -> Type) st. Monad m => ParsecT Sources st m [Text] Source #

Parses an RST-style line block and returns a list of strings.

tableWith Source #

Arguments

:: forall s (m :: Type -> Type) st mf sep end. (Stream s m Char, UpdateSourcePos s Char, HasReaderOptions st, Monad mf) 
=> ParsecT s st m (mf [Blocks], [Alignment], [Int])

header parser

-> ([Int] -> ParsecT s st m (mf [Blocks]))

row parser

-> ParsecT s st m sep

line parser

-> ParsecT s st m end

footer parser

-> ParsecT s st m (mf Blocks) 

Parse a table using headerParser, rowParser, lineParser, and footerParser.

tableWith' Source #

Arguments

:: forall s (m :: Type -> Type) st mf sep end. (Stream s m Char, UpdateSourcePos s Char, HasReaderOptions st, Monad mf) 
=> TableNormalization 
-> ParsecT s st m (mf [Blocks], [Alignment], [Int])

header parser

-> ([Int] -> ParsecT s st m (mf [Blocks]))

row parser

-> ParsecT s st m sep

line parser

-> ParsecT s st m end

footer parser

-> ParsecT s st m (mf TableComponents) 

widthsFromIndices :: Int -> [Int] -> [Double] Source #

Calculate relative widths of table columns, based on indices

gridTableWith Source #

Arguments

:: forall (m :: Type -> Type) mf st. (Monad m, Monad mf, HasLastStrPosition st, HasReaderOptions st) 
=> ParsecT Sources st m (mf Blocks)

Block list parser

-> ParsecT Sources st m (mf Blocks) 

Parse a grid table: starts with row of - on top, then header (which may be grid), then the rows, which may be grid, separated by blank lines, and ending with a footer (dashed line followed by blank line).

gridTableWith' Source #

Arguments

:: forall (m :: Type -> Type) mf st. (Monad m, Monad mf, HasReaderOptions st, HasLastStrPosition st) 
=> TableNormalization 
-> ParsecT Sources st m (mf Blocks)

Block list parser

-> ParsecT Sources st m (mf TableComponents) 

Like gridTableWith, but returns TableComponents instead of a Table.

data TableComponents Source #

Collection of components making up a Table block.

data TableNormalization Source #

Whether the table header should be normalized, i.e., whether an header row with only empty cells should be omitted.

toTableComponents :: [Alignment] -> [Double] -> [Blocks] -> [[Blocks]] -> TableComponents Source #

Bundles basic table components into a single value.

toTableComponents' :: TableNormalization -> [Alignment] -> [Double] -> [Blocks] -> [[Blocks]] -> TableComponents Source #

Bundles basic table components into a single value, performing normalizations as necessary.

readWith :: ToSources t => Parsec Sources st a -> st -> t -> Either PandocError a Source #

Parse a string with a given parser and state

readWithM Source #

Arguments

:: (Monad m, ToSources t) 
=> ParsecT Sources st m a

parser

-> st

initial state

-> t

input

-> m (Either PandocError a) 

Removes the ParsecT layer from the monad transformer stack

testStringWith :: Show a => ParsecT Sources ParserState Identity a -> Text -> IO () Source #

Parse a string with parser (for testing).

guardEnabled :: forall s (m :: Type -> Type) a st. (Stream s m a, HasReaderOptions st) => Extension -> ParsecT s st m () Source #

Succeed only if the extension is enabled.

guardDisabled :: forall s (m :: Type -> Type) a st. (Stream s m a, HasReaderOptions st) => Extension -> ParsecT s st m () Source #

Succeed only if the extension is disabled.

updateLastStrPos :: forall s (m :: Type -> Type) a st. (Stream s m a, HasLastStrPosition st) => ParsecT s st m () Source #

Update the position on which the last string ended.

notAfterString :: forall s (m :: Type -> Type) a st. (Stream s m a, HasLastStrPosition st) => ParsecT s st m Bool Source #

Whether we are right after the end of a string.

logMessage :: forall s (m :: Type -> Type) a st. (Stream s m a, HasLogMessages st) => LogMessage -> ParsecT s st m () Source #

Add a log message.

reportLogMessages :: forall (m :: Type -> Type) st s. (PandocMonad m, HasLogMessages st) => ParsecT s st m () Source #

Report all the accumulated log messages, according to verbosity level.

data ParserState Source #

Parsing options.

Constructors

ParserState 

Fields

Instances

Instances details
Default ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

def :: ParserState #

HasIdentifierList ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractIdentifierList :: ParserState -> Set Text Source #

updateIdentifierList :: (Set Text -> Set Text) -> ParserState -> ParserState Source #

HasIncludeFiles ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

HasLastStrPosition ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

HasLogMessages ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

HasMacros ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractMacros :: ParserState -> Map Text Macro Source #

updateMacros :: (Map Text Macro -> Map Text Macro) -> ParserState -> ParserState Source #

HasReaderOptions ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractReaderOptions :: ParserState -> ReaderOptions Source #

getOption :: forall s (m :: Type -> Type) t b. Stream s m t => (ReaderOptions -> b) -> ParsecT s ParserState m b Source #

HasMeta ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

setMeta :: ToMetaValue b => Text -> b -> ParserState -> ParserState

deleteMeta :: Text -> ParserState -> ParserState

Monad m => HasQuoteContext ParserState m Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

class HasReaderOptions st where Source #

Minimal complete definition

extractReaderOptions

Methods

extractReaderOptions :: st -> ReaderOptions Source #

getOption :: forall s (m :: Type -> Type) t b. Stream s m t => (ReaderOptions -> b) -> ParsecT s st m b Source #

Instances

Instances details
HasReaderOptions ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractReaderOptions :: ParserState -> ReaderOptions Source #

getOption :: forall s (m :: Type -> Type) t b. Stream s m t => (ReaderOptions -> b) -> ParsecT s ParserState m b Source #

class HasIdentifierList st where Source #

Methods

extractIdentifierList :: st -> Set Text Source #

updateIdentifierList :: (Set Text -> Set Text) -> st -> st Source #

Instances

Instances details
HasIdentifierList ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractIdentifierList :: ParserState -> Set Text Source #

updateIdentifierList :: (Set Text -> Set Text) -> ParserState -> ParserState Source #

class HasMacros st where Source #

Methods

extractMacros :: st -> Map Text Macro Source #

updateMacros :: (Map Text Macro -> Map Text Macro) -> st -> st Source #

Instances

Instances details
HasMacros ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

extractMacros :: ParserState -> Map Text Macro Source #

updateMacros :: (Map Text Macro -> Map Text Macro) -> ParserState -> ParserState Source #

class HasLastStrPosition st where Source #

Methods

setLastStrPos :: Maybe SourcePos -> st -> st Source #

getLastStrPos :: st -> Maybe SourcePos Source #

Instances

Instances details
HasLastStrPosition ParserState Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

class HasIncludeFiles st where Source #

Methods

getIncludeFiles :: st -> [Text] Source #

addIncludeFile :: Text -> st -> st Source #

dropLatestIncludeFile :: st -> st Source #

data HeaderType Source #

Constructors

SingleHeader Char

Single line of characters underneath

DoubleHeader Char

Lines of characters above and below

Instances

Instances details
Show HeaderType Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

showsPrec :: Int -> HeaderType -> ShowS

show :: HeaderType -> String

showList :: [HeaderType] -> ShowS

Eq HeaderType Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

(==) :: HeaderType -> HeaderType -> Bool

(/=) :: HeaderType -> HeaderType -> Bool

data ParserContext Source #

Constructors

ListItemState

Used when running parser on list item contents

NullState

Default state

Instances

Instances details
Show ParserContext Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

showsPrec :: Int -> ParserContext -> ShowS

show :: ParserContext -> String

showList :: [ParserContext] -> ShowS

Eq ParserContext Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

data QuoteContext Source #

Constructors

InSingleQuote

Used when parsing inside single quotes

InDoubleQuote

Used when parsing inside double quotes

NoQuote

Used when not parsing inside quotes

Instances

Instances details
Show QuoteContext Source # 
Instance details

Defined in Text.Pandoc.Parsing.Capabilities

Methods

showsPrec :: Int -> QuoteContext -> ShowS

show :: QuoteContext -> String

showList :: [QuoteContext] -> ShowS

Eq QuoteContext Source # 
Instance details

Defined in Text.Pandoc.Parsing.Capabilities

Methods

(==) :: QuoteContext -> QuoteContext -> Bool

(/=) :: QuoteContext -> QuoteContext -> Bool

class HasQuoteContext st (m :: Type -> Type) where Source #

Instances

Instances details
Monad m => HasQuoteContext ParserState m Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

type NoteTable = [(Text, Text)] Source #

type NoteTable' = Map Text (SourcePos, Future ParserState Blocks) Source #

type KeyTable = Map Key (Target, Attr) Source #

type SubstTable = Map Key Blocks Source #

newtype Key Source #

Constructors

Key Text 

Instances

Instances details
Read Key Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

readsPrec :: Int -> ReadS Key

readList :: ReadS [Key]

readPrec :: ReadPrec Key

readListPrec :: ReadPrec [Key]

Show Key Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

showsPrec :: Int -> Key -> ShowS

show :: Key -> String

showList :: [Key] -> ShowS

Eq Key Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

(==) :: Key -> Key -> Bool

(/=) :: Key -> Key -> Bool

Ord Key Source # 
Instance details

Defined in Text.Pandoc.Parsing.State

Methods

compare :: Key -> Key -> Ordering

(<) :: Key -> Key -> Bool

(<=) :: Key -> Key -> Bool

(>) :: Key -> Key -> Bool

(>=) :: Key -> Key -> Bool

max :: Key -> Key -> Key

min :: Key -> Key -> Key

toKey :: Text -> Key Source #

registerHeader :: forall s (m :: Type -> Type) a st. (Stream s m a, HasReaderOptions st, HasLogMessages st, HasIdentifierList st) => Attr -> Inlines -> ParsecT s st m Attr Source #

Add header to the list of headers in state, together with its associated identifier. If the identifier is null and the auto_identifiers extension is set, generate a new unique identifier, and update the list of identifiers in state. Issue a warning if an explicit identifier is encountered that duplicates an earlier identifier (explicit or automatically generated).

smartPunctuation :: forall st (m :: Type -> Type) s. (HasReaderOptions st, HasLastStrPosition st, HasQuoteContext st m, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inlines -> ParsecT s st m Inlines Source #

Parses various ASCII punctuation, quotes, and apostrophe in a smart way, inferring their semantic meaning.

Fails unless the Ext_smart extension has been enabled.

singleQuoteStart :: forall st (m :: Type -> Type) s. (HasLastStrPosition st, HasQuoteContext st m, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m () Source #

Succeeds if the parser is

  • not within single quoted text;
  • not directly after a word; and
  • looking at an opening single quote char that's not followed by a space.

Gobbles the quote character on success.

singleQuoteEnd :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m () Source #

doubleQuoteStart :: forall st (m :: Type -> Type) s. (HasLastStrPosition st, HasQuoteContext st m, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m () Source #

Succeeds if the parser is

  • not within a double quoted text;
  • not directly after a word; and
  • looking at an opening double quote char that's not followed by a space.

Gobbles the quote character on success.

doubleQuoteEnd :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m () Source #

Parses a closing quote character.

apostrophe :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inlines Source #

Parses an ASCII apostrophe (') or right single quotation mark and returns a RIGHT SINGLE QUOtatiON MARK character.

doubleCloseQuote :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inlines Source #

Parses an ASCII quotation mark character and returns a RIGHT DOUBLE QUOTATION MARK.

ellipses :: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inlines Source #

Parses three dots as HORIZONTAL ELLIPSIS.

dash :: forall st s (m :: Type -> Type). (HasReaderOptions st, Stream s m Char, UpdateSourcePos s Char) => ParsecT s st m Inlines Source #

Parses two hyphens as EN DASH and three as EM DASH.

If the extension Ext_old_dashes is enabled, then two hyphens are parsed as EM DASH, and one hyphen is parsed as EN DASH if it is followed by a digit.

citeKey Source #

Arguments

:: forall s (m :: Type -> Type) st. (Stream s m Char, UpdateSourcePos s Char, HasLastStrPosition st) 
=> Bool

If True, allow expanded @{..} syntax.

-> ParsecT s st m (Bool, Text) 

type Parsec s u = ParsecT s u Identity #

data ParsecT s u (m :: Type -> Type) a #

Instances

Instances details
MonadError e m => MonadError e (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

throwError :: e -> ParsecT s u m a

catchError :: ParsecT s u m a -> (e -> ParsecT s u m a) -> ParsecT s u m a

MonadReader r m => MonadReader r (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

ask :: ParsecT s u m r

local :: (r -> r) -> ParsecT s u m a -> ParsecT s u m a

reader :: (r -> a) -> ParsecT s u m a

MonadState s m => MonadState s (ParsecT s' u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

get :: ParsecT s' u m s

put :: s -> ParsecT s' u m ()

state :: (s -> (a, s)) -> ParsecT s' u m a

MonadTrans (ParsecT s u) 
Instance details

Defined in Text.Parsec.Prim

Methods

lift :: Monad m => m a -> ParsecT s u m a

MonadIO m => MonadIO (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

liftIO :: IO a -> ParsecT s u m a

Alternative (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

empty :: ParsecT s u m a

(<|>) :: ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a

some :: ParsecT s u m a -> ParsecT s u m [a]

many :: ParsecT s u m a -> ParsecT s u m [a]

Applicative (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

pure :: a -> ParsecT s u m a

(<*>) :: ParsecT s u m (a -> b) -> ParsecT s u m a -> ParsecT s u m b

liftA2 :: (a -> b -> c) -> ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m c

(*>) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m b

(<*) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m a

Functor (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

fmap :: (a -> b) -> ParsecT s u m a -> ParsecT s u m b

(<$) :: a -> ParsecT s u m b -> ParsecT s u m a

Monad (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

(>>=) :: ParsecT s u m a -> (a -> ParsecT s u m b) -> ParsecT s u m b

(>>) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m b

return :: a -> ParsecT s u m a

MonadPlus (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

mzero :: ParsecT s u m a

mplus :: ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a

MonadFail (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

fail :: String -> ParsecT s u m a

MonadCont m => MonadCont (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

callCC :: ((a -> ParsecT s u m b) -> ParsecT s u m a) -> ParsecT s u m a

PandocMonad m => PandocMonad (ParsecT s st m) Source # 
Instance details

Defined in Text.Pandoc.Class.PandocMonad

Methods

lookupEnv :: Text -> ParsecT s st m (Maybe Text) Source #

getCurrentTime :: ParsecT s st m UTCTime Source #

getCurrentTimeZone :: ParsecT s st m TimeZone Source #

newStdGen :: ParsecT s st m StdGen Source #

newUniqueHash :: ParsecT s st m Int Source #

openURL :: Text -> ParsecT s st m (ByteString, Maybe MimeType) Source #

readFileLazy :: FilePath -> ParsecT s st m ByteString Source #

readFileStrict :: FilePath -> ParsecT s st m ByteString Source #

readStdinStrict :: ParsecT s st m ByteString Source #

glob :: String -> ParsecT s st m [FilePath] Source #

fileExists :: FilePath -> ParsecT s st m Bool Source #

getDataFileName :: FilePath -> ParsecT s st m FilePath Source #

getModificationTime :: FilePath -> ParsecT s st m UTCTime Source #

getCommonState :: ParsecT s st m CommonState Source #

putCommonState :: CommonState -> ParsecT s st m () Source #

getsCommonState :: (CommonState -> a) -> ParsecT s st m a Source #

modifyCommonState :: (CommonState -> CommonState) -> ParsecT s st m () Source #

logOutput :: LogMessage -> ParsecT s st m () Source #

trace :: Text -> ParsecT s st m () Source #

(Monoid a, Semigroup (ParsecT s u m a)) => Monoid (ParsecT s u m a) 
Instance details

Defined in Text.Parsec.Prim

Methods

mempty :: ParsecT s u m a

mappend :: ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a

mconcat :: [ParsecT s u m a] -> ParsecT s u m a

Semigroup a => Semigroup (ParsecT s u m a) 
Instance details

Defined in Text.Parsec.Prim

Methods

(<>) :: ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a

sconcat :: NonEmpty (ParsecT s u m a) -> ParsecT s u m a

stimes :: Integral b => b -> ParsecT s u m a -> ParsecT s u m a

newtype Future s a Source #

Reader monad wrapping the parser state. This is used to possibly delay evaluation until all relevant information has been parsed and made available in the parser state.

Constructors

Future 

Fields

Instances

Instances details
Applicative (Future s) Source # 
Instance details

Defined in Text.Pandoc.Parsing.Future

Methods

pure :: a -> Future s a

(<*>) :: Future s (a -> b) -> Future s a -> Future s b

liftA2 :: (a -> b -> c) -> Future s a -> Future s b -> Future s c

(*>) :: Future s a -> Future s b -> Future s b

(<*) :: Future s a -> Future s b -> Future s a

Functor (Future s) Source # 
Instance details

Defined in Text.Pandoc.Parsing.Future

Methods

fmap :: (a -> b) -> Future s a -> Future s b

(<$) :: a -> Future s b -> Future s a

Monad (Future s) Source # 
Instance details

Defined in Text.Pandoc.Parsing.Future

Methods

(>>=) :: Future s a -> (a -> Future s b) -> Future s b

(>>) :: Future s a -> Future s b -> Future s b

return :: a -> Future s a

(Semigroup a, Monoid a) => Monoid (Future s a) Source # 
Instance details

Defined in Text.Pandoc.Parsing.Future

Methods

mempty :: Future s a

mappend :: Future s a -> Future s a -> Future s a

mconcat :: [Future s a] -> Future s a

Semigroup a => Semigroup (Future s a) Source # 
Instance details

Defined in Text.Pandoc.Parsing.Future

Methods

(<>) :: Future s a -> Future s a -> Future s a

sconcat :: NonEmpty (Future s a) -> Future s a

stimes :: Integral b => b -> Future s a -> Future s a

runF :: Future s a -> s -> a Source #

Run a delayed action with the given state.

asksF :: (s -> a) -> Future s a Source #

returnF :: Monad m => a -> m (Future s a) Source #

trimInlinesF :: Future s Inlines -> Future s Inlines Source #

Remove whitespace from start and end; just like trimInlines, but lifted into the Future type.

token :: forall s (m :: Type -> Type) t a st. Stream s m t => (t -> Text) -> (t -> SourcePos) -> (t -> Maybe a) -> ParsecT s st m a Source #

(<+?>) :: forall a s st (m :: Type -> Type). Monoid a => ParsecT s st m a -> ParsecT s st m a -> ParsecT s st m a infixr 5 Source #

insertIncludedFile Source #

Arguments

:: forall (m :: Type -> Type) st a b. (PandocMonad m, HasIncludeFiles st) 
=> ParsecT a st m b

parser to apply

-> (Text -> a)

convert Text to stream type

-> [FilePath]

search path (directories)

-> FilePath

path of file to include

-> Maybe Int

start line (negative counts from end)

-> Maybe Int

end line (negative counts from end)

-> ParsecT a st m b 

Re-exports from Text.Parsec

class Monad m => Stream s (m :: Type -> Type) t | s -> t where #

Methods

uncons :: s -> m (Maybe (t, s)) #

Instances

Instances details
Monad m => Stream ByteString m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: ByteString -> m (Maybe (Char, ByteString)) #

Monad m => Stream ByteString m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: ByteString -> m (Maybe (Char, ByteString)) #

Monad m => Stream Sources m Char Source # 
Instance details

Defined in Text.Pandoc.Sources

Methods

uncons :: Sources -> m (Maybe (Char, Sources)) #

Monad m => Stream Text m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: Text -> m (Maybe (Char, Text)) #

Monad m => Stream Text m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: Text -> m (Maybe (Char, Text)) #

Monad m => Stream [tok] m tok 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: [tok] -> m (Maybe (tok, [tok])) #

runParser :: Stream s Identity t => Parsec s u a -> u -> SourceName -> s -> Either ParseError a #

runParserT :: Stream s m t => ParsecT s u m a -> u -> SourceName -> s -> m (Either ParseError a) #

parse :: Stream s Identity t => Parsec s () a -> SourceName -> s -> Either ParseError a #

tokenPrim :: forall s (m :: Type -> Type) t a u. Stream s m t => (t -> String) -> (SourcePos -> t -> s -> SourcePos) -> (t -> Maybe a) -> ParsecT s u m a #

anyToken :: forall s (m :: Type -> Type) t u. (Stream s m t, Show t) => ParsecT s u m t #

getInput :: forall (m :: Type -> Type) s u. Monad m => ParsecT s u m s #

setInput :: forall (m :: Type -> Type) s u. Monad m => s -> ParsecT s u m () #

unexpected :: forall s (m :: Type -> Type) t u a. Stream s m t => String -> ParsecT s u m a #

skipMany :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> ParsecT s u m () #

skipMany1 :: forall s (m :: Type -> Type) t u a. Stream s m t => ParsecT s u m a -> ParsecT s u m () #

count :: forall s (m :: Type -> Type) t u a. Stream s m t => Int -> ParsecT s u m a -> ParsecT s u m [a] #

eof :: forall s (m :: Type -> Type) t u. (Stream s m t, Show t) => ParsecT s u m () #

lookAhead :: forall s (m :: Type -> Type) t u a. Stream s m t => ParsecT s u m a -> ParsecT s u m a #

notFollowedBy :: forall s (m :: Type -> Type) t a u. (Stream s m t, Show a) => ParsecT s u m a -> ParsecT s u m () #

many :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> ParsecT s u m [a] #

many1 :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> ParsecT s u m [a] #

manyTill :: forall s (m :: Type -> Type) t u a end. Stream s m t => ParsecT s u m a -> ParsecT s u m end -> ParsecT s u m [a] #

(<|>) :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a #

(<?>) :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> String -> ParsecT s u m a #

choice :: forall s (m :: Type -> Type) t u a. Stream s m t => [ParsecT s u m a] -> ParsecT s u m a #

try :: forall s u (m :: Type -> Type) a. ParsecT s u m a -> ParsecT s u m a #

sepBy :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

sepBy1 :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

sepEndBy :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

sepEndBy1 :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

endBy :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

endBy1 :: forall s (m :: Type -> Type) t u a sep. Stream s m t => ParsecT s u m a -> ParsecT s u m sep -> ParsecT s u m [a] #

option :: forall s (m :: Type -> Type) t a u. Stream s m t => a -> ParsecT s u m a -> ParsecT s u m a #

optional :: forall s (m :: Type -> Type) t u a. Stream s m t => ParsecT s u m a -> ParsecT s u m () #

optionMaybe :: forall s (m :: Type -> Type) t u a. Stream s m t => ParsecT s u m a -> ParsecT s u m (Maybe a) #

getState :: forall (m :: Type -> Type) s u. Monad m => ParsecT s u m u #

setState :: forall (m :: Type -> Type) u s. Monad m => u -> ParsecT s u m () #

updateState :: forall (m :: Type -> Type) u s. Monad m => (u -> u) -> ParsecT s u m () #

data SourcePos #

Instances

Instances details
Data SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourcePos -> c SourcePos

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourcePos

toConstr :: SourcePos -> Constr

dataTypeOf :: SourcePos -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourcePos)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourcePos)

gmapT :: (forall b. Data b => b -> b) -> SourcePos -> SourcePos

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r

gmapQ :: (forall d. Data d => d -> u) -> SourcePos -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourcePos -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos

Show SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

showsPrec :: Int -> SourcePos -> ShowS

show :: SourcePos -> String

showList :: [SourcePos] -> ShowS

Eq SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

(==) :: SourcePos -> SourcePos -> Bool

(/=) :: SourcePos -> SourcePos -> Bool

Ord SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

compare :: SourcePos -> SourcePos -> Ordering

(<) :: SourcePos -> SourcePos -> Bool

(<=) :: SourcePos -> SourcePos -> Bool

(>) :: SourcePos -> SourcePos -> Bool

(>=) :: SourcePos -> SourcePos -> Bool

max :: SourcePos -> SourcePos -> SourcePos

min :: SourcePos -> SourcePos -> SourcePos

type SourceName = String #

getPosition :: forall (m :: Type -> Type) s u. Monad m => ParsecT s u m SourcePos #

setPosition :: forall (m :: Type -> Type) s u. Monad m => SourcePos -> ParsecT s u m () #

type Line = Int #

type Column = Int #

data ParseError #

Instances

Instances details
Exception ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

toException :: ParseError -> SomeException

fromException :: SomeException -> Maybe ParseError

displayException :: ParseError -> String

backtraceDesired :: ParseError -> Bool

Show ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

showsPrec :: Int -> ParseError -> ShowS

show :: ParseError -> String

showList :: [ParseError] -> ShowS

Eq ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

(==) :: ParseError -> ParseError -> Bool

(/=) :: ParseError -> ParseError -> Bool

errorMessages :: ParseError -> [Message] #

messageString :: Message -> String #