aboutsummaryrefslogtreecommitdiff
path: root/src/Text/Pandoc
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2020-02-05 09:48:42 -0800
committerJohn MacFarlane <jgm@berkeley.edu>2020-02-05 09:48:42 -0800
commit9c4dc8b49b3894d51aa37fbcff1c228776ffb98f (patch)
treee5fb3f27d90fb897186b98c06dd755c647b23b5b /src/Text/Pandoc
parentb018028ee9f733d5c6907e4ef362794e75b8c38c (diff)
downloadpandoc-9c4dc8b49b3894d51aa37fbcff1c228776ffb98f.tar.gz
LaTeX reader: skip comments in more places where this is needed.
Closes #6114.
Diffstat (limited to 'src/Text/Pandoc')
-rw-r--r--src/Text/Pandoc/Readers/LaTeX.hs34
-rw-r--r--src/Text/Pandoc/Readers/LaTeX/Parsing.hs6
2 files changed, 21 insertions, 19 deletions
diff --git a/src/Text/Pandoc/Readers/LaTeX.hs b/src/Text/Pandoc/Readers/LaTeX.hs
index b11a04f3b..69aec212f 100644
--- a/src/Text/Pandoc/Readers/LaTeX.hs
+++ b/src/Text/Pandoc/Readers/LaTeX.hs
@@ -590,10 +590,10 @@ nlToSpace x = x
keyval :: PandocMonad m => LP m (Text, Text)
keyval = try $ do
Tok _ Word key <- satisfyTok isWordTok
- optional sp
+ sp
val <- option mempty $ do
symbol '='
- optional sp
+ sp
(untokenize <$> braced) <|>
(mconcat <$> many1 (
(untokenize . snd <$> withRaw braced)
@@ -607,11 +607,11 @@ keyval = try $ do
Tok _ Symbol "}" -> False
_ -> True))))))
optional (symbol ',')
- optional sp
+ sp
return (key, T.strip val)
keyvals :: PandocMonad m => LP m [(Text, Text)]
-keyvals = try $ symbol '[' >> manyTill keyval (symbol ']')
+keyvals = try $ symbol '[' >> manyTill keyval (symbol ']') <* sp
accent :: PandocMonad m => Char -> Maybe Char -> LP m Inlines
accent combiningAccent fallBack = try $ do
@@ -690,12 +690,12 @@ simpleCiteArgs = try $ do
citationLabel :: PandocMonad m => LP m Text
citationLabel = do
- optional spaces
+ sp
untokenize <$>
(many1 (satisfyTok isWordTok <|> symbolIn bibtexKeyChar)
- <* optional spaces
+ <* sp
<* optional (symbol ',')
- <* optional spaces)
+ <* sp)
where bibtexKeyChar = ".:;?!`'()/*@_+=-&[]" :: [Char]
cites :: PandocMonad m => CitationMode -> Bool -> LP m [Citation]
@@ -772,7 +772,7 @@ inlineCommand' :: PandocMonad m => LP m Inlines
inlineCommand' = try $ do
Tok _ (CtrlSeq name) cmd <- anyControlSeq
guard $ name /= "begin" && name /= "end"
- star <- option "" ("*" <$ symbol '*' <* optional sp)
+ star <- option "" ("*" <$ symbol '*' <* sp)
overlay <- option "" overlaySpecification
let name' = name <> star <> overlay
let names = ordNub [name', name] -- check non-starred as fallback
@@ -797,9 +797,9 @@ paropt = parenWrapped inline
rawopt :: PandocMonad m => LP m Text
rawopt = try $ do
- optional sp
+ sp
inner <- untokenize <$> bracketedToks
- optional sp
+ sp
return $ "[" <> inner <> "]"
skipopts :: PandocMonad m => LP m ()
@@ -1024,7 +1024,7 @@ inlineCommands = M.union inlineLanguageCommands $ M.fromList
, ("nolinkurl", ((unescapeURL . untokenize) <$> bracedUrl) >>= \url ->
pure (code url))
, ("href", (unescapeURL . untokenize <$>
- bracedUrl <* optional sp) >>= \url ->
+ bracedUrl <* sp) >>= \url ->
tok >>= \lab -> pure (link url "" lab))
, ("includegraphics", do options <- option [] keyvals
src <- unescapeURL . removeDoubleQuotes . untokenize <$> braced
@@ -1108,7 +1108,7 @@ inlineCommands = M.union inlineLanguageCommands $ M.fromList
, ("Supercites", citation "Supercites" NormalCitation True)
, ("Footcitetexts", inNote <$> citation "Footcitetexts" NormalCitation True)
, ("citetext", complexNatbibCitation NormalCitation)
- , ("citeauthor", (try (tok *> optional sp *> controlSeq "citetext") *>
+ , ("citeauthor", (try (tok *> sp *> controlSeq "citetext") *>
complexNatbibCitation AuthorInText)
<|> citation "citeauthor" AuthorInText False)
, ("nocite", mempty <$ (citation "nocite" NormalCitation False >>=
@@ -1737,7 +1737,7 @@ blockCommand :: PandocMonad m => LP m Blocks
blockCommand = try $ do
Tok _ (CtrlSeq name) txt <- anyControlSeq
guard $ name /= "begin" && name /= "end"
- star <- option "" ("*" <$ symbol '*' <* optional sp)
+ star <- option "" ("*" <$ symbol '*' <* sp)
let name' = name <> star
let names = ordNub [name', name]
let rawDefiniteBlock = do
@@ -2173,7 +2173,7 @@ descItem :: PandocMonad m => LP m (Inlines, [Blocks])
descItem = do
blocks -- skip blocks before item
controlSeq "item"
- optional sp
+ sp
ils <- opt
bs <- blocks
return (ils, [bs])
@@ -2209,7 +2209,7 @@ orderedList' = try $ do
ctr <- untokenize <$> braced
guard $ "enum" `T.isPrefixOf` ctr
guard $ T.all (`elem` ['i','v']) (T.drop 4 ctr)
- optional sp
+ sp
num <- untokenize <$> braced
case safeRead num of
Just i -> return (i + 1 :: Int)
@@ -2255,8 +2255,8 @@ splitWordTok = do
parseAligns :: PandocMonad m => LP m [(Alignment, Double, ([Tok], [Tok]))]
parseAligns = try $ do
- let maybeBar = skipMany $
- sp <|> () <$ symbol '|' <|> () <$ (symbol '@' >> braced)
+ let maybeBar = skipMany
+ (try $ sp *> (() <$ symbol '|' <|> () <$ (symbol '@' >> braced)))
let cAlign = AlignCenter <$ symbol 'c'
let lAlign = AlignLeft <$ symbol 'l'
let rAlign = AlignRight <$ symbol 'r'
diff --git a/src/Text/Pandoc/Readers/LaTeX/Parsing.hs b/src/Text/Pandoc/Readers/LaTeX/Parsing.hs
index a01abda46..5630ed868 100644
--- a/src/Text/Pandoc/Readers/LaTeX/Parsing.hs
+++ b/src/Text/Pandoc/Readers/LaTeX/Parsing.hs
@@ -528,7 +528,9 @@ symbolIn cs = satisfyTok isInCs
isInCs _ = False
sp :: PandocMonad m => LP m ()
-sp = whitespace <|> endline
+sp = do
+ optional $ skipMany (whitespace <|> comment)
+ optional $ endline *> skipMany (whitespace <|> comment)
whitespace :: PandocMonad m => LP m ()
whitespace = () <$ satisfyTok isSpaceTok
@@ -595,7 +597,7 @@ primEscape = do
bgroup :: PandocMonad m => LP m Tok
bgroup = try $ do
- skipMany sp
+ optional sp
symbol '{' <|> controlSeq "bgroup" <|> controlSeq "begingroup"
egroup :: PandocMonad m => LP m Tok