aboutsummaryrefslogtreecommitdiff
path: root/src
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2020-09-02 13:05:34 -0700
committerJohn MacFarlane <jgm@berkeley.edu>2020-09-02 13:05:34 -0700
commit0a98648c1a64d382cdd577ecc1fc2245c6eb57e2 (patch)
tree0b6e2be8394e2f29185fd5f9a3bc01f0f495a4ed /src
parent529eb696dccd0a1923525e5fcb297a76cafa1ebe (diff)
downloadpandoc-0a98648c1a64d382cdd577ecc1fc2245c6eb57e2.tar.gz
LaTeX reader: support `\num` from siunitx.
Diffstat (limited to 'src')
-rw-r--r--src/Text/Pandoc/Readers/LaTeX.hs3
-rw-r--r--src/Text/Pandoc/Readers/LaTeX/SIunitx.hs43
2 files changed, 40 insertions, 6 deletions
diff --git a/src/Text/Pandoc/Readers/LaTeX.hs b/src/Text/Pandoc/Readers/LaTeX.hs
index c3e770578..689b88a33 100644
--- a/src/Text/Pandoc/Readers/LaTeX.hs
+++ b/src/Text/Pandoc/Readers/LaTeX.hs
@@ -877,8 +877,9 @@ inlineCommands = M.union inlineLanguageCommands $ M.fromList
, ("acfp", doAcronymPlural "full")
, ("acsp", doAcronymPlural "abbrv")
-- siuntix
- , ("SI", dosiunitx tok)
+ , ("SI", doSI tok)
, ("SIrange", doSIrange tok)
+ , ("num", doSInum)
-- hyphenat
, ("bshyp", lit "\\\173")
, ("fshyp", lit "/\173")
diff --git a/src/Text/Pandoc/Readers/LaTeX/SIunitx.hs b/src/Text/Pandoc/Readers/LaTeX/SIunitx.hs
index 458607efe..03375f224 100644
--- a/src/Text/Pandoc/Readers/LaTeX/SIunitx.hs
+++ b/src/Text/Pandoc/Readers/LaTeX/SIunitx.hs
@@ -1,23 +1,25 @@
{-# LANGUAGE OverloadedStrings #-}
module Text.Pandoc.Readers.LaTeX.SIunitx
- ( dosiunitx
+ ( doSI
, doSIrange
+ , doSInum
)
where
import Text.Pandoc.Builder
import Text.Pandoc.Readers.LaTeX.Parsing
import Text.Pandoc.Readers.LaTeX.Types
import Text.Pandoc.Class
-import Control.Monad (mzero)
-import Text.Pandoc.Parsing hiding (blankline, many, mathDisplay, mathInline,
+import Text.Pandoc.Parsing hiding (blankline, mathDisplay, mathInline,
optional, space, spaces, withRaw, (<|>))
import Control.Applicative ((<|>))
import qualified Data.Map as M
+import Data.Char (isDigit)
import Data.Text (Text)
+import qualified Data.Text as T
-- converts e.g. \SI{1}[\$]{} to "$ 1" or \SI{1}{\euro} to "1 €"
-dosiunitx :: PandocMonad m => LP m Inlines -> LP m Inlines
-dosiunitx tok = do
+doSI :: PandocMonad m => LP m Inlines -> LP m Inlines
+doSI tok = do
skipopts
value <- tok
valueprefix <- option "" $ bracketed tok
@@ -28,6 +30,37 @@ dosiunitx tok = do
emptyOr160 unit,
unit]
+doSInum :: PandocMonad m => LP m Inlines
+doSInum = do
+ skipopts
+ value <- untokenize <$> braced
+ case runParser parseNum () "" value of
+ Left _ -> return $ text value
+ Right num -> return num
+
+parseNum :: Parser Text () Inlines
+parseNum = mconcat <$> many parseNumPart
+
+parseNumPart :: Parser Text () Inlines
+parseNumPart =
+ parseDecimalNum <|>
+ parseComma <|>
+ parsePlusMinus <|>
+ parseI <|>
+ parseExp <|>
+ parseX <|>
+ parseSpace
+ where
+ parseDecimalNum =
+ str . T.pack <$> many1 (satisfy (\c -> isDigit c || c == '.'))
+ parseComma = str "." <$ char ','
+ parsePlusMinus = str "\xa0\xb1\xa0" <$ try (string "+-")
+ parseI = str "i" <$ char 'i'
+ parseX = str "\xa0\xd7\xa0" <$ char 'x'
+ parseExp = (\n -> str ("\xa0\xd7\xa0" <> "10") <> superscript n)
+ <$> (char 'e' *> parseDecimalNum)
+ parseSpace = mempty <$ skipMany1 (char ' ')
+
-- converts e.g. \SIrange{100}{200}{\ms} to "100 ms--200 ms"
doSIrange :: PandocMonad m => LP m Inlines -> LP m Inlines
doSIrange tok = do