aboutsummaryrefslogtreecommitdiff
path: root/src/Text/Pandoc/Writers/JATS/Table.hs
diff options
context:
space:
mode:
authorAlbert Krewinkel <albert@zeitkraut.de>2020-11-13 10:44:05 +0100
committerAlbert Krewinkel <albert+github@zeitkraut.de>2020-11-17 09:46:30 +0100
commit94c9028819415a874b2469890de44108a98f8c48 (patch)
tree7d91cd2477b7be8b99451413920dd2c74a72e79e /src/Text/Pandoc/Writers/JATS/Table.hs
parentc9ada73caca108b912d4c1289cffc9a7fcd66ce0 (diff)
downloadpandoc-94c9028819415a874b2469890de44108a98f8c48.tar.gz
JATS writer: move Table handling to separate module
This makes it easier to split the module into smaller parts.
Diffstat (limited to 'src/Text/Pandoc/Writers/JATS/Table.hs')
-rw-r--r--src/Text/Pandoc/Writers/JATS/Table.hs81
1 files changed, 81 insertions, 0 deletions
diff --git a/src/Text/Pandoc/Writers/JATS/Table.hs b/src/Text/Pandoc/Writers/JATS/Table.hs
new file mode 100644
index 000000000..cccd866aa
--- /dev/null
+++ b/src/Text/Pandoc/Writers/JATS/Table.hs
@@ -0,0 +1,81 @@
+{-# LANGUAGE OverloadedStrings #-}
+{- |
+ Module : Text.Pandoc.Writers.JATS.Table
+ Copyright : © 2020 Albert Krewinkel
+ License : GNU GPL, version 2 or above
+
+ Maintainer : Albert Krewinkel <tarleb@zeitkraut.de>
+ Stability : alpha
+ Portability : portable
+
+Conversion of 'Pandoc' tables to JATS XML.
+-}
+module Text.Pandoc.Writers.JATS.Table
+ ( tableToJATS
+ ) where
+import Control.Monad.Reader (asks)
+import Data.Text (Text)
+import Text.Pandoc.Class.PandocMonad (PandocMonad)
+import Text.Pandoc.Definition
+import Text.Pandoc.Options (WriterOptions)
+import Text.DocLayout (Doc, empty, vcat, ($$))
+import Text.Pandoc.Shared (tshow)
+import Text.Pandoc.Writers.JATS.Types
+import Text.Pandoc.Writers.Shared (toLegacyTable)
+import Text.Pandoc.XML (inTags, inTagsIndented, selfClosingTag)
+
+
+tableToJATS :: PandocMonad m
+ => WriterOptions
+ -> Attr -> Caption -> [ColSpec] -> TableHead
+ -> [TableBody] -> TableFoot
+ -> JATS m (Doc Text)
+tableToJATS opts _attr blkCapt specs th tb tf = do
+ blockToJATS <- asks jatsBlockWriter
+ case toLegacyTable blkCapt specs th tb tf of
+ ([], aligns, widths, headers, rows) -> captionlessTable aligns widths headers rows
+ (caption, aligns, widths, headers, rows) -> do
+ captionDoc <- inTagsIndented "caption" <$> blockToJATS opts (Para caption)
+ tbl <- captionlessTable aligns widths headers rows
+ return $ inTags True "table-wrap" [] $ captionDoc $$ tbl
+ where
+ captionlessTable aligns widths headers rows = do
+ let percent w = tshow (truncate (100*w) :: Integer) <> "*"
+ let coltags = vcat $ zipWith (\w al -> selfClosingTag "col"
+ ([("width", percent w) | w > 0] ++
+ [("align", alignmentToText al)])) widths aligns
+ thead <- if all null headers
+ then return empty
+ else inTagsIndented "thead" <$> tableRowToJATS opts True headers
+ tbody <- inTagsIndented "tbody" . vcat <$>
+ mapM (tableRowToJATS opts False) rows
+ return $ inTags True "table" [] $ coltags $$ thead $$ tbody
+
+alignmentToText :: Alignment -> Text
+alignmentToText alignment = case alignment of
+ AlignLeft -> "left"
+ AlignRight -> "right"
+ AlignCenter -> "center"
+ AlignDefault -> "left"
+
+tableRowToJATS :: PandocMonad m
+ => WriterOptions
+ -> Bool
+ -> [[Block]]
+ -> JATS m (Doc Text)
+tableRowToJATS opts isHeader cols =
+ inTagsIndented "tr" . vcat <$> mapM (tableItemToJATS opts isHeader) cols
+
+tableItemToJATS :: PandocMonad m
+ => WriterOptions
+ -> Bool
+ -> [Block]
+ -> JATS m (Doc Text)
+tableItemToJATS opts isHeader [Plain item] = do
+ inlinesToJATS <- asks jatsInlinesWriter
+ inTags False (if isHeader then "th" else "td") [] <$>
+ inlinesToJATS opts item
+tableItemToJATS opts isHeader item = do
+ blockToJATS <- asks jatsBlockWriter
+ inTags False (if isHeader then "th" else "td") [] . vcat <$>
+ mapM (blockToJATS opts) item