From 6673f832ea6bb2498f588b78eb6fb8c099fb408a Mon Sep 17 00:00:00 2001 From: Julia Diaz Date: Thu, 10 Aug 2023 22:02:43 +0200 Subject: [PATCH] Fix display of block elements in JATS reader (PR #8971) A number of block elements, like disp-quote, list, and disp-formula, were always treated as inlines if appearing inside paragraphs, even if their usage granted a separate block. The function isElementBlock has been refined to prevent this, and a number of specific parse cases have been added to parseBlock. Also, some minimal cleanup of the test file, in order for it to pass XML validation against the JATS DTD 1.3 (it was not compliant with the current or any previous versions of JATS). Closes #8889. --- src/Text/Pandoc/Readers/JATS.hs | 103 +- test/Tests/Readers/JATS.hs | 1 - test/jats-reader.native | 2724 ++++++++++++++++++------------- test/jats-reader.xml | 239 ++- 4 files changed, 1869 insertions(+), 1198 deletions(-) diff --git a/src/Text/Pandoc/Readers/JATS.hs b/src/Text/Pandoc/Readers/JATS.hs index 538fb8264b2a..5056eb3ff509 100644 --- a/src/Text/Pandoc/Readers/JATS.hs +++ b/src/Text/Pandoc/Readers/JATS.hs @@ -15,7 +15,7 @@ Conversion of JATS XML to 'Pandoc' document. module Text.Pandoc.Readers.JATS ( readJATS ) where import Control.Monad.State.Strict ( StateT(runStateT), gets, modify ) -import Control.Monad (forM_, when, unless, MonadPlus(mplus)) +import Control.Monad (forM_, when, unless) import Control.Monad.Except (throwError) import Text.Pandoc.Error (PandocError(..)) import Data.Char (isDigit, isSpace) @@ -105,31 +105,30 @@ instance HasMeta JATSState where deleteMeta field s = s {jatsMeta = deleteMeta field (jatsMeta s)} isBlockElement :: Content -> Bool -isBlockElement (Elem e) = qName (elName e) `S.member` blocktags - where blocktags = S.fromList (paragraphLevel ++ lists ++ mathML ++ other) \\ S.fromList inlinetags - paragraphLevel = ["address", "array", "boxed-text", "chem-struct-wrap", - "code", "fig", "fig-group", "graphic", "media", "preformat", +isBlockElement (Elem e) = case qName (elName e) of + "disp-formula" -> if onlyOneChild e + then if hasFormulaChild e + then False + else case filterChild (named "alternatives") e of + Just a -> if hasFormulaChild a then False else True + Nothing -> True + else True + "alternatives" -> if hasFormulaChild e then False else True + _ -> qName (elName e) `S.member` blocktags + + where blocktags = S.fromList (paragraphLevel ++ lists ++ formulae ++ other) \\ S.fromList canBeInline + paragraphLevel = ["address", "answer", "answer-set", "array", "boxed-text", "chem-struct-wrap", + "code", "explanation", "fig", "fig-group", "graphic", "media", "preformat", "question", "question-wrap", "question-wrap-group", "supplementary-material", "table-wrap", "table-wrap-group", "alternatives", "disp-formula", "disp-formula-group"] lists = ["def-list", "list"] - mathML = ["tex-math", "mml:math"] + formulae = ["tex-math", "mml:math"] other = ["p", "related-article", "related-object", "ack", "disp-quote", "speech", "statement", "verse-group", "x"] - inlinetags = ["email", "ext-link", "uri", "inline-supplementary-material", - "related-article", "related-object", "hr", "bold", "fixed-case", - "italic", "monospace", "overline", "overline-start", "overline-end", - "roman", "sans-serif", "sc", "strike", "underline", "underline-start", - "underline-end", "ruby", "alternatives", "inline-graphic", "private-char", - "chem-struct", "inline-formula", "tex-math", "mml:math", "abbrev", - "milestone-end", "milestone-start", "named-content", "styled-content", - "fn", "target", "xref", "sub", "sup", "x", "address", "array", - "boxed-text", "chem-struct-wrap", "code", "fig", "fig-group", "graphic", - "media", "preformat", "supplementary-material", "table-wrap", - "table-wrap-group", "disp-formula", "disp-formula-group", - "citation-alternatives", "element-citation", "mixed-citation", - "nlm-citation", "award-id", "funding-source", "open-access", - "def-list", "list", "ack", "disp-quote", "speech", "statement", - "verse-group"] + canBeInline = ["tex-math", "mml:math", "related-object", "x"] + onlyOneChild x = length (allChildren x) == 1 + allChildren x = filterChildren (const True) x + isBlockElement _ = False -- Trim leading and trailing newline characters @@ -217,6 +216,13 @@ parseBlock (Elem e) = do else divWith (attrValue "id" e, ["caption"], []) <$> wrapWithHeader 6 (getBlocks e) "fn-group" -> parseFootnoteGroup "ref-list" -> parseRefList e + "alternatives" -> if hasFormulaChild e + then blockFormula displayMath e + else getBlocks e + "disp-formula" -> if hasFormulaChild e + then blockFormula displayMath e + else divWith (attrValue "id" e, ["disp-formula"], []) + <$> getBlocks e "?xml" -> return mempty _ -> getBlocks e where parseMixed container conts = do @@ -363,9 +369,7 @@ parseBlock (Elem e) = do wrapWithHeader n mBlocks = do isBook <- gets jatsBook let n' = if isBook || n == 0 then n + 1 else n - headerText <- case filterChild (named "title") e `mplus` - (filterChild (named "info") e >>= - filterChild (named "title")) of + headerText <- case filterChild (named "title") e of Just t -> getInlines t Nothing -> return mempty oldN <- gets jatsSectionLevel @@ -602,8 +606,11 @@ parseInline (Elem e) = let attr = (attrValue "id" e, [], []) return $ linkWith attr href title ils' - "disp-formula" -> formula displayMath - "inline-formula" -> formula math + "alternatives" -> if hasFormulaChild e + then inlineFormula math e + else innerInlines id + "disp-formula" -> inlineFormula displayMath e + "inline-formula" -> inlineFormula math e "math" | qURI (elName e) == Just "http://www.w3.org/1998/Math/MathML" -> return . math $ mathML e "tex-math" -> return . math $ textContent e @@ -616,11 +623,14 @@ parseInline (Elem e) = _ -> innerInlines id where innerInlines f = extractSpaces f . mconcat <$> mapM parseInline (elContent e) - mathML x = - case readMathML . showElement $ everywhere (mkT removePrefix) x of - Left _ -> mempty - Right m -> writeTeX m - formula constructor = do + codeWithLang = do + let classes' = case attrValue "language" e of + "" -> [] + l -> [l] + return $ codeWith (attrValue "id" e,classes',[]) $ strContentRecursive e + +inlineFormula :: PandocMonad m => (Text->Inlines) -> Element -> JATS m Inlines +inlineFormula constructor e = do let whereToLook = fromMaybe e $ filterElement (named "alternatives") e texMaths = map textContent $ filterChildren (named "tex-math") whereToLook @@ -628,12 +638,29 @@ parseInline (Elem e) = filterChildren isMathML whereToLook return . mconcat . take 1 . map constructor $ texMaths ++ mathMLs - isMathML x = qName (elName x) == "math" && +blockFormula :: PandocMonad m => (Text->Inlines) -> Element -> JATS m Blocks +blockFormula constructor e = do + let whereToLook = fromMaybe e $ filterElement (named "alternatives") e + texMaths = map textContent $ + filterChildren (named "tex-math") whereToLook + mathMLs = map mathML $ + filterChildren isMathML whereToLook + return . para . head . take 1 . map constructor $ texMaths ++ mathMLs + +mathML :: Element -> Text +mathML x = + case readMathML . showElement $ everywhere (mkT removePrefix) x of + Left _ -> mempty + Right m -> writeTeX m + where removePrefix elname = elname { qPrefix = Nothing } + +isMathML :: Element -> Bool +isMathML x = qName (elName x) == "math" && qURI (elName x) == Just "http://www.w3.org/1998/Math/MathML" - removePrefix elname = elname { qPrefix = Nothing } - codeWithLang = do - let classes' = case attrValue "language" e of - "" -> [] - l -> [l] - return $ codeWith (attrValue "id" e,classes',[]) $ strContentRecursive e + +formulaChildren :: Element -> [Element] +formulaChildren x = filterChildren isMathML x ++ filterChildren (named "tex-math") x + +hasFormulaChild :: Element -> Bool +hasFormulaChild x = length (formulaChildren x) > 0 \ No newline at end of file diff --git a/test/Tests/Readers/JATS.hs b/test/Tests/Readers/JATS.hs index a9c9a0586a07..b7d36dc00a1f 100644 --- a/test/Tests/Readers/JATS.hs +++ b/test/Tests/Readers/JATS.hs @@ -27,7 +27,6 @@ jats = purely $ readJATS def tests :: [TestTree] tests = [ testGroup "inline code" [ test jats "basic" $ "

\n @&\n

" =?> para (code "@&") - , test jats "lang" $ "

\n @&\n

" =?> para (codeWith ("", ["c"], []) "@&") ] , testGroup "block code" [ test jats "basic" $ "@&" =?> codeBlock "@&" diff --git a/test/jats-reader.native b/test/jats-reader.native index a9ea11191e80..83172527e5da 100644 --- a/test/jats-reader.native +++ b/test/jats-reader.native @@ -8,6 +8,13 @@ Pandoc , MetaInlines [ Str "Anonymous" ] ] ) + , ( "references" + , MetaList + [ MetaMap (fromList [ ( "id" , MetaString "note_1" ) ]) + , MetaMap + (fromList [ ( "id" , MetaString "note_longnote" ) ]) + ] + ) , ( "title" , MetaInlines [ Str "Pandoc" @@ -218,12 +225,14 @@ Pandoc , Space , Str "a" , Space - , Str "hard" - , Space - , Str "line" - , Space - , Str "break" - , LineBreak + , Strong + [ Str "hard" + , Space + , Str "line" + , Space + , Str "break" + , LineBreak + ] , Str "here." ] , Header 1 ( "statements" , [] , [] ) [ Str "Statements" ] @@ -366,6 +375,428 @@ Pandoc , Space , Str "paragraph." ] + , Para + [ Str "Here" + , Space + , Str "is" + , Space + , Str "a" + , Space + , Str "block" + , Space + , Str "quote" + , Space + , Str "inside" + , Space + , Str "a" + , Space + , Str "paragraph." + , Space + , Str "Start" + , Space + , Str "of" + , Space + , Str "a" + , Space + , Str "paragraph" + , Space + , Str "is" + , Space + , Str "here," + , Space + , Str "and" + , Space + , Str "the" + , Space + , Str "quote" + , Space + , Str "is" + , Space + , Str "below:" + ] + , BlockQuote + [ Para + [ Str "My" , Space , Str "block" , Space , Str "quote" ] + ] + , Para + [ Str "End" + , Space + , Str "of" + , Space + , Str "a" + , Space + , Str "paragraph" + ] + , Header 1 ( "formulae" , [] , [] ) [ Str "Formulae" ] + , Header + 2 + ( "inline-formulae" , [] , [] ) + [ Str "Inline" + , Space + , Str "formulae" + , Space + , Str "with" + , Space + , Emph [ Str "inline-formula" ] + ] + , Para + [ Strong + [ Str "Inside" , Space , Str "a" , Space , Str "paragraph" ] + , Str "," + , Space + , Str "should" + , Space + , Str "be" + , Space + , Str "natively" + , Space + , Str "coded" + , Space + , Str "inside" + , Space + , Str "the" + , Space + , Str "paragraph," + , Space + , Str "and" + , Space + , Str "show" + , Space + , Str "inline:" + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + , Space + , Math InlineMath "e=mc^2" + , Str "." + , SoftBreak + , Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Header + 2 + ( "disp-formulae" , [] , [] ) + [ Str "Block" + , Space + , Str "formulae" + , Space + , Str "with" + , Space + , Emph [ Str "disp-formula" ] + ] + , Para + [ Strong + [ Str "Inside" , Space , Str "a" , Space , Str "paragraph" ] + , Str "," + , Space + , Str "should" + , Space + , Str "be" + , Space + , Str "natively" + , Space + , Str "coded" + , Space + , Str "inside" + , Space + , Str "the" + , Space + , Str "pragraph," + , Space + , Str "but" + , Space + , Str "show" + , Space + , Str "as" + , Space + , Str "block:" + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + , Space + , Math DisplayMath "e=mc^2" + , Str "." + , SoftBreak + , Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Para + [ Strong + [ Str "Outside" , Space , Str "a" , Space , Str "pararaph" ] + , Str "," + , Space + , Str "should" + , Space + , Str "show" + , Space + , Str "as" + , Space + , Str "block:" + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + ] + , Div + ( "" , [ "disp-formula" ] , [] ) + [ Para [ Math DisplayMath "e=mc^2" ] ] + , Para + [ Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Header + 2 + ( "no-formula-wrapper" , [] , [] ) + [ Str "Without" + , Space + , Str "a" + , Space + , Str "formula" + , Space + , Str "wrapper" + ] + , Para + [ Strong + [ Str "Inside" , Space , Str "a" , Space , Str "pragraph" ] + , Str "," + , Space + , Str "should" + , Space + , Str "show" + , Space + , Str "inline:" + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + , Space + , Math InlineMath "e=mc^2" + , Str "." + , SoftBreak + , Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Para + [ Strong + [ Str "Outside" + , Space + , Str "a" + , Space + , Str "paragraph" + ] + , Str "," + , Space + , Str "should" + , Space + , Str "show" + , Space + , Str "as" + , Space + , Str "block:" + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + ] + , Para [ Math DisplayMath "e=mc^2" ] + , Para + [ Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Header + 2 + ( "misc-formulae" , [] , [] ) + [ Str "Formulae" + , Space + , Str "with" + , Space + , Str "miscelaneus" + , Space + , Str "elements" + ] + , Para + [ Str "Regardless" + , Space + , Str "of" + , Space + , Str "whether" + , Space + , Str "or" + , Space + , Str "not" + , Space + , Str "they" + , Space + , Str "are" + , Space + , Str "inside" + , Space + , Str "a" + , Space + , Str "paragraph," + , Space + , Str "should" + , Space + , Str "be" + , Space + , Str "wrapped" + , Space + , Str "in" + , Space + , Str "a" + , Space + , Str "div," + , Space + , Str "and" + , Space + , Str "displayed" + , Space + , Str "in" + , Space + , Str "a" + , Space + , Str "block:" + ] + , Para + [ Strong + [ Str "Inside" + , Space + , Str "a" + , Space + , Str "paragraph:" + ] + ] + , Para + [ Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + ] + , Div + ( "" , [ "disp-formula" ] , [] ) + [ Para [ Str "Abstract" , Space , Str "text" ] + , Para + [ Image + ( "" , [] , [] ) + [] + ( "https://lh3.googleusercontent.com/dB7iirJ3ncQaVMBGE2YX-WCeoAVIChb6NAzoFcKCFChMsrixJvD7ZRbvcaC-ceXEzXYaoH4K5vaoRDsUyBHFkpIDPnsn3bnzovbvi0a2Gg=s660" + , "" + ) + ] + , Para [ Math DisplayMath "e=mc^2" ] + ] + , Para + [ Str "." + , SoftBreak + , Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] + , Para + [ Strong + [ Str "Outside" + , Space + , Str "of" + , Space + , Str "a" + , Space + , Str "paragraph:" + ] + ] + , Para + [ Str "Paragraph" + , Space + , Str "before:" + , Space + , Str "Einstein" + , Space + , Str "showed" + , Space + , Str "that" + ] + , Div + ( "" , [ "disp-formula" ] , [] ) + [ Para [ Str "Abstract" , Space , Str "text" ] + , Para + [ Image + ( "" , [] , [] ) + [] + ( "https://lh3.googleusercontent.com/dB7iirJ3ncQaVMBGE2YX-WCeoAVIChb6NAzoFcKCFChMsrixJvD7ZRbvcaC-ceXEzXYaoH4K5vaoRDsUyBHFkpIDPnsn3bnzovbvi0a2Gg=s660" + , "" + ) + ] + , Para [ Math DisplayMath "e=mc^2" ] + ] + , Para + [ Str "This" + , Space + , Str "formula" + , Space + , Str "is" + , Space + , Str "important" + , Space + , Str "because\8230" + ] , Header 1 ( "code-blocks" , [] , [] ) @@ -493,8 +924,18 @@ Pandoc , [ Para [ Str "Item" , Space , Str "3." ] ] ] , Para [ Str "List" , Space , Str "styles:" ] - , OrderedList ( 1 , DefaultStyle , DefaultDelim ) [] - , OrderedList ( 1 , LowerRoman , DefaultDelim ) [] + , OrderedList + ( 1 , DefaultStyle , DefaultDelim ) + [ [ Para [ Str "one" ] ] + , [ Para [ Str "two" ] ] + , [ Para [ Str "three" ] ] + ] + , OrderedList + ( 1 , LowerRoman , DefaultDelim ) + [ [ Para [ Str "one" ] ] + , [ Para [ Str "two" ] ] + , [ Para [ Str "three" ] ] + ] , Header 2 ( "nested" , [] , [] ) [ Str "Nested" ] , BulletList [ [ Para [ Str "Tab" ] @@ -653,7 +1094,10 @@ Pandoc ] ] ) - , ( [ Str "Cello" , LineBreak , Str "Violoncello" ] + , ( [ Str "Cello" + , Strong [ LineBreak ] + , Str "Violoncello" + ] , [ [ Para [ Str "Low-voiced" , Space @@ -665,6 +1109,30 @@ Pandoc ] ) ] + , Header + 2 + ( "list-inside-paragraph" , [] , [] ) + [ Str "List" + , Space + , Str "inside" + , Space + , Str "a" + , Space + , Str "paragraph" + ] + , Para + [ Str "Start" + , Space + , Str "of" + , Space + , Str "a" + , Space + , Str "paragraph." + ] + , BulletList + [ [ Para [ Str "Red" ] ] , [ Para [ Str "Blue" ] ] ] + , Para + [ Str "End" , Space , Str "of" , Space , Str "paragraph." ] , Header 1 ( "inline-markup" , [] , [] ) @@ -1851,747 +2319,774 @@ Pandoc , Space , Str "Headers" ] - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "r1a" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "r1b" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "r1c" ] ] - ] - , Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "r1a" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "r1b" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "r1c" ] ] + ] + , Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "X" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Y" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "Z" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "X" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Y" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "Z" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) , Header 2 ( "tables-without-headers" , [] , [] ) @@ -2601,234 +3096,246 @@ Pandoc , Space , Str "Headers" ] - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] - ] - , Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) , Header 2 ( "table-with-spans-and-alignments" , [] , [] ) @@ -2842,167 +3349,173 @@ Pandoc , Space , Str "alignments" ] - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead - ( "" , [] , [] ) - [ Row + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table + ( "" , [] , [] ) + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) - [ Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 2) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignRight - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - ] - ]) - [ TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 2) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignLeft - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - ] - , Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 2) - (ColSpan 1) - [ Para [ Str "4" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "5" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "6" ] ] - ] - , Row + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 2) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignRight + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + ] + ]) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 2) - [ Para [ Str "7" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 2) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignLeft + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 2) + (ColSpan 1) + [ Para [ Str "4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "6" ] ] + ] + , Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 2) + [ Para [ Str "7" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) , Header 2 ( "table-with-footer" , [] , [] ) [ Str "Table" , Space , Str "with" , Space , Str "footer" ] - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "3" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "3" ] ] + ] ] ] - ] - (TableFoot - ( "" , [] , [] ) - [ Row - ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignRight - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f3" ] ] - ] - , Row + (TableFoot ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignRight - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f4" ] ] - , Cell + [ Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f5" ] ] - , Cell + [ Cell + ( "" , [] , [] ) + AlignRight + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f3" ] ] + ] + , Row ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "f6" ] ] - ] - ]) + [ Cell + ( "" , [] , [] ) + AlignRight + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f4" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f5" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "f6" ] ] + ] + ]) + ] , Header 2 ( "table-with-multiple-bodies" , [] , [] ) @@ -3014,68 +3527,71 @@ Pandoc , Space , Str "Bodies" ] - , Table - ( "" , [] , [] ) - (Caption Nothing []) - [ ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - , ( AlignLeft , ColWidthDefault ) - ] - (TableHead ( "" , [] , [] ) []) - [ TableBody + , Div + ( "" , [ "table-wrap" ] , [] ) + [ Table ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row + (Caption Nothing []) + [ ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + , ( AlignLeft , ColWidthDefault ) + ] + (TableHead ( "" , [] , [] ) []) + [ TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignRight - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "a1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "a2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "a3" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignRight + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "a1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "a2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "a3" ] ] + ] ] - ] - , TableBody - ( "" , [] , [] ) - (RowHeadColumns 0) - [] - [ Row + , TableBody ( "" , [] , [] ) - [ Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "b1" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "b2" ] ] - , Cell - ( "" , [] , [] ) - AlignDefault - (RowSpan 1) - (ColSpan 1) - [ Para [ Str "b3" ] ] + (RowHeadColumns 0) + [] + [ Row + ( "" , [] , [] ) + [ Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "b1" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "b2" ] ] + , Cell + ( "" , [] , [] ) + AlignDefault + (RowSpan 1) + (ColSpan 1) + [ Para [ Str "b3" ] ] + ] ] ] + (TableFoot ( "" , [] , [] ) []) ] - (TableFoot ( "" , [] , [] ) []) , Header 2 ( "empty-tables" , [] , [] ) @@ -3091,4 +3607,8 @@ Pandoc , Space , Str "empty." ] + , Header 1 ( "" , [] , [] ) [ Str "References" ] + , Div ( "refs" , [] , [] ) [] + , Header 1 ( "" , [] , [] ) [ Str "Notes" ] + , Div ( "refs" , [] , [] ) [] ] diff --git a/test/jats-reader.xml b/test/jats-reader.xml index 435663fc1005..af67445b9c20 100644 --- a/test/jats-reader.xml +++ b/test/jats-reader.xml @@ -67,7 +67,7 @@

Here's a regular paragraph.

In Markdown 1.0.0 and earlier. Version 8. This line turns into a list item. Because a hard-wrapped line in the middle of a paragraph looked like a list item.

Here's one with a bullet. * criminey.

-

There should be a hard line breakhere.

+

There should be a hard line breakhere.

Statements @@ -131,6 +131,96 @@

And a following paragraph.

+

+ Here is a block quote inside a paragraph. Start of a paragraph is here, and the quote is below: + +

My block quote

+ + End of a paragraph +

+
+ + Formulae + + Inline formulae with <italic>inline-formula</italic> +

Inside a paragraph, should be natively coded inside the paragraph, and show inline:

+

Einstein showed that + + e=mc2. + This formula is important because…

+
+ + Block formulae with <italic>disp-formula</italic> +

Inside a paragraph, should be natively coded inside the pragraph, but show as block:

+

Einstein showed that + + e=mc2. + This formula is important because…

+

Outside a pararaph, should show as block:

+

Einstein showed that

+ + + e=mc2 +

This formula is important because…

+
+ + Without a formula wrapper +

Inside a pragraph, should show inline:

+

Einstein showed that + + e=mc2. + This formula is important because…

+

Outside a paragraph, should show as block:

+

Einstein showed that

+ + + e=mc2 +

This formula is important because…

+
+ + Formulae with miscelaneus elements +

Regardless of whether or not they are inside a paragraph, should be wrapped in a div, and displayed in a block:

+

Inside a paragraph:

+

Einstein showed that + + +

Abstract text

+ + + Alternative text 1 +

Google doodle from 14 March 2003

+
+ + + e=mc2 + + Alternative text 2 +

Google doodle from 14 March 2003

+
+
+ . + This formula is important because…

+

Outside of a paragraph:

+

Paragraph before: Einstein showed that

+ + +

Abstract text

+
+ + Alternative text 1 +

Google doodle from 14 March 2003

+
+ + + e=mc2 + + Alternative text 2 +

Google doodle from 14 March 2003

+
+
+
+

This formula is important because…

+
Code Blocks @@ -289,8 +379,16 @@ These should not be escaped: \$ \\ \> \[ \{

List styles:

- - + +

one

, +

two

, +

three

+
+ +

one

, +

two

, +

three

+
Nested @@ -406,7 +504,7 @@ These should not be escaped: \$ \\ \> \[ \{ - CelloVioloncello + CelloVioloncello

Low-voiced stringed instrument.

@@ -414,25 +512,42 @@ These should not be escaped: \$ \\ \> \[ \{
+ + List inside a paragraph +

+ Start of a paragraph. + + + +

Red

+ + + +

Blue

+
+ + End of paragraph. +

+
Inline Markup

This is emphasized, and so is this.

-

This is strong, and so - is this.

-

Empty and .

+

This is strong, and so + is this.

+

Empty and .

An emphasized link.

-

This is strong and em.

-

So is this word.

-

This is strong and em.

-

So is this word.

+

This is strong and em.

+

So is this word.

+

This is strong and em.

+

So is this word.

This is code: >, $, \, \$, <html>.

-

This is small caps.

+

This is small caps.

These are all underlined: foo and bar.

These are all strikethrough: foo, bar, and baz.

@@ -660,7 +775,7 @@ These should not be escaped: \$ \\ \> \[ \{ Tables Tables with Headers - +
@@ -701,8 +816,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -743,8 +858,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -785,8 +900,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -827,8 +942,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -869,8 +984,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -911,8 +1026,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -953,8 +1068,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -1006,8 +1121,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -1048,11 +1163,11 @@ These should not be escaped: \$ \\ \> \[ \{ -
+
Tables without Headers - +
@@ -1080,8 +1195,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -1109,8 +1224,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -1138,8 +1253,8 @@ These should not be escaped: \$ \\ \> \[ \{ -
- +
+ @@ -1167,11 +1282,11 @@ These should not be escaped: \$ \\ \> \[ \{ -
+
Tables with spans and alignments - +
@@ -1211,27 +1326,14 @@ These should not be escaped: \$ \\ \> \[ \{ -
+
Table with footer - +
- - - - - - - -
-

1

-
-

2

-
-

3

-
@@ -1256,11 +1358,24 @@ These should not be escaped: \$ \\ \> \[ \{
+ + + +

1

+ + +

2

+ + +

3

+ + + +
Table With Multiple Bodies - +
@@ -1290,7 +1405,7 @@ These should not be escaped: \$ \\ \> \[ \{ -
+
Empty Tables @@ -1299,5 +1414,15 @@ These should not be escaped: \$ \\ \> \[ \{ + + References +

This is reference 1

+

This is a long note

+
+ + Notes +

This is note 1

+

This is another long note

+