diff options
| author | Albert Krewinkel <[email protected]> | 2022-01-28 18:05:49 +0100 |
|---|---|---|
| committer | Albert Krewinkel <[email protected]> | 2022-01-28 18:20:14 +0100 |
| commit | a6fa3df1146f7aee4e3bfa4cf506ab44e38ecb35 (patch) | |
| tree | 5da7601e160156f0bb4424ed4f60f53d6668181d /src/Text | |
| parent | d36a16a4df5ed54b80dfc1579c339bad24ba6b0c (diff) | |
HTML writer: avoid duplicate "style" attributes on table cells
Fixes: #7871
Diffstat (limited to 'src/Text')
| -rw-r--r-- | src/Text/Pandoc/CSS.hs | 6 | ||||
| -rw-r--r-- | src/Text/Pandoc/Writers/HTML.hs | 40 |
2 files changed, 32 insertions, 14 deletions
diff --git a/src/Text/Pandoc/CSS.hs b/src/Text/Pandoc/CSS.hs index ab31e3d5b..03065cc9b 100644 --- a/src/Text/Pandoc/CSS.hs +++ b/src/Text/Pandoc/CSS.hs @@ -18,6 +18,7 @@ module Text.Pandoc.CSS ) where +import Data.Either (fromRight) import Data.Maybe (mapMaybe, listToMaybe) import Data.Text (Text, pack) import Text.Pandoc.Shared (trim) @@ -37,10 +38,7 @@ styleAttrParser = many1 ruleParser -- Returns an empty list on failure. cssAttributes :: Text -> [(Text, Text)] cssAttributes styleString = - -- Use Data.Either.fromRight once GHC 8.0 is no longer supported - case parse styleAttrParser "" styleString of - Left _ -> [] - Right x -> x + fromRight [] $ parse styleAttrParser "" styleString -- | takes a list of keys/properties and a CSS string and -- returns the corresponding key-value-pairs. diff --git a/src/Text/Pandoc/Writers/HTML.hs b/src/Text/Pandoc/Writers/HTML.hs index 79846736a..b1161fded 100644 --- a/src/Text/Pandoc/Writers/HTML.hs +++ b/src/Text/Pandoc/Writers/HTML.hs @@ -44,6 +44,7 @@ import Text.Blaze.Internal (MarkupM (Empty), customLeaf, customParent) import Text.DocTemplates (FromContext (lookupContext), Context (..)) import Text.Blaze.Html hiding (contents) import Text.Pandoc.Translations (Term(Abstract)) +import Text.Pandoc.CSS (cssAttributes) import Text.Pandoc.Definition import Text.Pandoc.Highlighting (formatHtmlBlock, formatHtmlInline, highlight, styleToCss) @@ -1282,29 +1283,48 @@ tableCellToHtml :: PandocMonad m tableCellToHtml opts ctype colAlign (Cell attr align rowspan colspan item) = do contents <- blockListToHtml opts item html5 <- gets stHtml5 + let (ident, cls, kvs) = attr let tag' = case ctype of BodyCell -> H.td HeaderCell -> H.th let align' = case align of AlignDefault -> colAlign _ -> align - let alignAttribs = case alignmentToString align' of - Nothing -> - mempty - Just alignStr -> - if html5 - then A.style (toValue $ "text-align: " <> alignStr <> ";") - else A.align (toValue alignStr) - otherAttribs <- attrsToHtml opts attr + let kvs' = case alignmentToString align' of + Nothing -> + kvs + Just alignStr -> + if html5 + then addStyle ("text-align", alignStr) kvs + else case break ((== "align") . fst) kvs of + (_, []) -> ("align", alignStr) : kvs + (xs, _:rest) -> xs ++ ("align", alignStr) : rest + otherAttribs <- attrsToHtml opts (ident, cls, kvs') let attribs = mconcat - $ alignAttribs - : colspanAttrib colspan + $ colspanAttrib colspan : rowspanAttrib rowspan : otherAttribs return $ do tag' ! attribs $ contents nl +-- | Adds a key-value pair to the @style@ attribute. +addStyle :: (Text, Text) -> [(Text, Text)] -> [(Text, Text)] +addStyle (key, value) kvs = + let cssToStyle = T.intercalate " " . map (\(k, v) -> k <> ": " <> v <> ";") + in case break ((== "style") . fst) kvs of + (_, []) -> + -- no style attribute yet, add new one + ("style", cssToStyle [(key, value)]) : kvs + (xs, (_,cssStyles):rest) -> + -- modify the style attribute + xs ++ ("style", cssToStyle modifiedCssStyles) : rest + where + modifiedCssStyles = + case break ((== key) . fst) $ cssAttributes cssStyles of + (cssAttribs, []) -> (key, value) : cssAttribs + (pre, _:post) -> pre ++ (key, value) : post + toListItems :: [Html] -> [Html] toListItems items = map toListItem items ++ [nl] |
