aboutsummaryrefslogtreecommitdiff
path: root/src/Text/Pandoc/Readers/LaTeX/Macro.hs
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2021-08-11 10:32:52 -0700
committerJohn MacFarlane <jgm@berkeley.edu>2021-08-11 10:32:52 -0700
commita0e44b1ff651ba59fe23b9e1b5d534d324dc0808 (patch)
treeb7847ac514fcacc088e1d7a0f3097436e5b93374 /src/Text/Pandoc/Readers/LaTeX/Macro.hs
parent06d97131e530d2ee9b14617290a157dd42c0db30 (diff)
downloadpandoc-a0e44b1ff651ba59fe23b9e1b5d534d324dc0808.tar.gz
LaTeX reader: improve handling of plain TeX macro primitives.
- Fixed semantics for `\let`. - Implement `\edef`, `\gdef`, and `\xdef`. - Add comment noting that currently `\def` and `\edef` set global macros (so are equivalent to `\gdef` and `\xdef`). This should be fixed by scoping macro definitions to groups, in a future commit. Closes #7474.
Diffstat (limited to 'src/Text/Pandoc/Readers/LaTeX/Macro.hs')
-rw-r--r--src/Text/Pandoc/Readers/LaTeX/Macro.hs31
1 files changed, 27 insertions, 4 deletions
diff --git a/src/Text/Pandoc/Readers/LaTeX/Macro.hs b/src/Text/Pandoc/Readers/LaTeX/Macro.hs
index 5495a8e74..6a7b0eed3 100644
--- a/src/Text/Pandoc/Readers/LaTeX/Macro.hs
+++ b/src/Text/Pandoc/Readers/LaTeX/Macro.hs
@@ -23,7 +23,8 @@ macroDef constructor = do
guardDisabled Ext_latex_macros)
<|> return mempty
where commandDef = do
- nameMacroPairs <- newcommand <|> letmacro <|> defmacro <|> newif
+ nameMacroPairs <- newcommand <|> letmacro <|>
+ edefmacro <|> defmacro <|> newif
guardDisabled Ext_latex_macros <|>
mapM_ (\(name, macro') ->
updateState (\s -> s{ sMacros = M.insert name macro'
@@ -46,23 +47,45 @@ macroDef constructor = do
letmacro :: PandocMonad m => LP m [(Text, Macro)]
letmacro = do
controlSeq "let"
- (name, contents) <- withVerbatimMode $ do
+ withVerbatimMode $ do
Tok _ (CtrlSeq name) _ <- anyControlSeq
optional $ symbol '='
spaces
-- we first parse in verbatim mode, and then expand macros,
-- because we don't want \let\foo\bar to turn into
-- \let\foo hello if we have previously \def\bar{hello}
+ macros <- sMacros <$> getState
+ target <- anyControlSeq <|> singleChar
+ case target of
+ (Tok _ (CtrlSeq name') _) ->
+ case M.lookup name' macros of
+ Just m -> return [(name, m)]
+ Nothing -> return [(name, Macro ExpandWhenDefined [] Nothing [target])]
+ _ -> return [(name, Macro ExpandWhenDefined [] Nothing [target])]
+
+edefmacro :: PandocMonad m => LP m [(Text, Macro)]
+edefmacro = do
+ controlSeq "edef" <|> controlSeq "xdef"
+ -- TODO Currently we don't distinguish these. \edef should only
+ -- affect its own group, while \xdef sets a global macro.
+ (name, contents) <- withVerbatimMode $ do
+ Tok _ (CtrlSeq name) _ <- anyControlSeq
+ -- we first parse in verbatim mode, and then expand macros,
+ -- because we don't want \let\foo\bar to turn into
+ -- \let\foo hello if we have previously \def\bar{hello}
contents <- bracedOrToken
return (name, contents)
- contents' <- doMacros' 0 contents
+ -- expand macros
+ contents' <- parseFromToks (many anyTok) contents
return [(name, Macro ExpandWhenDefined [] Nothing contents')]
defmacro :: PandocMonad m => LP m [(Text, Macro)]
defmacro = do
-- we use withVerbatimMode, because macros are to be expanded
-- at point of use, not point of definition
- controlSeq "def"
+ controlSeq "def" <|> controlSeq "gdef"
+ -- TODO Currently we don't distinguish these. \def should only
+ -- affect its own group, while \gdef sets a global macro.
withVerbatimMode $ do
Tok _ (CtrlSeq name) _ <- anyControlSeq
argspecs <- many (argspecArg <|> argspecPattern)