aboutsummaryrefslogtreecommitdiff
path: root/src
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2019-05-16 21:39:03 -0700
committerJohn MacFarlane <jgm@berkeley.edu>2019-05-16 21:39:03 -0700
commite87b54dcad5e37133bc0f4cfc8039e9fd0dd1b4e (patch)
treeb9fe5cbdac943d42b13309ecbb99983c2c9c2fb9 /src
parent2e13c0a451fe87ebd1ef2c314f7f98c40f3ec422 (diff)
downloadpandoc-e87b54dcad5e37133bc0f4cfc8039e9fd0dd1b4e.tar.gz
JATS writer: properly handle footnotes.
"Best Practice: When footnotes are grouped at the end of an article, wrap them in a `<fn-group>` and use an `<xref>` element in the text, as usual, to tie each footnote in the list to a particular location in the text." Closes #5511.
Diffstat (limited to 'src')
-rw-r--r--src/Text/Pandoc/Writers/JATS.hs31
1 files changed, 24 insertions, 7 deletions
diff --git a/src/Text/Pandoc/Writers/JATS.hs b/src/Text/Pandoc/Writers/JATS.hs
index e2c4e1e72..25ef3b223 100644
--- a/src/Text/Pandoc/Writers/JATS.hs
+++ b/src/Text/Pandoc/Writers/JATS.hs
@@ -16,6 +16,7 @@ https://jats.nlm.nih.gov/publishing/tag-library
module Text.Pandoc.Writers.JATS ( writeJATS ) where
import Prelude
import Control.Monad.Reader
+import Control.Monad.State
import Data.Char (toLower)
import Data.Generics (everywhere, mkT)
import Data.List (isSuffixOf, partition, isPrefixOf)
@@ -39,11 +40,16 @@ import qualified Text.XML.Light as Xml
data JATSVersion = JATS1_1
deriving (Eq, Show)
-type JATS = ReaderT JATSVersion
+data JATSState = JATSState
+ { jatsNotes :: [(Int, Doc)] }
+
+type JATS a = StateT JATSState (ReaderT JATSVersion a)
writeJATS :: PandocMonad m => WriterOptions -> Pandoc -> m Text
writeJATS opts d =
- runReaderT (docToJATS opts d) JATS1_1
+ runReaderT (evalStateT (docToJATS opts d)
+ (JATSState{ jatsNotes = [] }))
+ JATS1_1
-- | Convert Pandoc document to string in JATS format.
docToJATS :: PandocMonad m => WriterOptions -> Pandoc -> JATS m Text
@@ -52,7 +58,7 @@ docToJATS opts (Pandoc meta blocks) = do
isBackBlock _ = False
let (backblocks, bodyblocks) = partition isBackBlock blocks
let elements = hierarchicalize bodyblocks
- let backElements = hierarchicalize backblocks
+ let backElements = hierarchicalize $ backblocks
let colwidth = if writerWrapText opts == WrapAuto
then Just $ writerColumns opts
else Nothing
@@ -77,8 +83,10 @@ docToJATS opts (Pandoc meta blocks) = do
meta
main <- (render' . vcat) <$>
mapM (elementToJATS opts' startLvl) elements
- back <- (render' . vcat) <$>
- mapM (elementToJATS opts' startLvl) backElements
+ notes <- reverse . map snd <$> gets jatsNotes
+ backs <- mapM (elementToJATS opts' startLvl) backElements
+ let fns = inTagsIndented "fn-group" $ vcat notes
+ let back = render' $ vcat backs $$ fns
let context = defField "body" main
$ defField "back" back
$ defField "mathml" (case writerHTMLMathMethod opts of
@@ -368,9 +376,18 @@ inlineToJATS _ Space = return space
inlineToJATS opts SoftBreak
| writerWrapText opts == WrapPreserve = return cr
| otherwise = return space
-inlineToJATS opts (Note contents) =
+inlineToJATS opts (Note contents) = do
-- TODO technically only <p> tags are allowed inside
- inTagsIndented "fn" <$> blocksToJATS opts contents
+ notes <- gets jatsNotes
+ let notenum = case notes of
+ (n, _):_ -> n + 1
+ [] -> 1
+ thenote <- inTags True "fn" [("id","fn" ++ show notenum)]
+ <$> blocksToJATS opts contents
+ modify $ \st -> st{ jatsNotes = (notenum, thenote) : notes }
+ return $ inTags False "xref" [("ref-type", "fn"),
+ ("rid", "fn" ++ show notenum)]
+ $ text (show notenum)
inlineToJATS opts (Cite _ lst) =
-- TODO revisit this after examining the jats.csl pipeline
inlinesToJATS opts lst