File tree Expand file tree Collapse file tree 1 file changed +2
-4
lines changed Expand file tree Collapse file tree 1 file changed +2
-4
lines changed Original file line number Diff line number Diff line change 11{-# LANGUAGE FlexibleContexts #-}
22{-# LANGUAGE OverloadedStrings #-}
33{-# LANGUAGE ScopedTypeVariables #-}
4- {-# LANGUAGE ViewPatterns #-}
54
65{- |
76 Module : Text.Pandoc.Writers.ICML
@@ -309,9 +308,8 @@ blocksToICML opts style lst = do
309308-- | Convert a Pandoc block element to ICML.
310309blockToICML :: PandocMonad m => WriterOptions -> Style -> Block -> WS m (Doc Text )
311310blockToICML opts style (Plain lst) = parStyle opts style " " lst
312- -- title beginning with fig: indicates that the image is a figure
313- blockToICML opts style (Para img@ [Image _ txt (_,Text. stripPrefix " fig:" -> Just _)]) = do
314- figure <- parStyle opts (figureName: style) " " img
311+ blockToICML opts style (SimpleFigure attr txt src tit) = do
312+ figure <- parStyle opts (figureName: style) " " [Image attr txt (src, tit)]
315313 caption <- parStyle opts (imgCaptionName: style) " " txt
316314 return $ intersperseBrs [figure, caption]
317315blockToICML opts style (Para lst) = parStyle opts (paragraphName: style) " " lst
You can’t perform that action at this time.
0 commit comments