Class: Renamed 'warn' to 'addWarning' and consolidated RTF writer.
* Renaming Text.Pandoc.Class.warn to addWarning avoids conflict with Text.Pandoc.Shared.warn. * Removed writeRTFWithEmbeddedImages from Text.Pandoc.Writers.RTF. This is no longer needed; we automatically handle embedded images using the PandocM functions. [API change]
This commit is contained in:
parent
5ab8909661
commit
2710fc4261
11 changed files with 42 additions and 41 deletions
|
@ -322,8 +322,7 @@ writers = [
|
||||||
,("dokuwiki" , StringWriter writeDokuWiki)
|
,("dokuwiki" , StringWriter writeDokuWiki)
|
||||||
,("zimwiki" , StringWriter writeZimWiki)
|
,("zimwiki" , StringWriter writeZimWiki)
|
||||||
,("textile" , StringWriter writeTextile)
|
,("textile" , StringWriter writeTextile)
|
||||||
,("rtf" , StringWriter $ \o ->
|
,("rtf" , StringWriter writeRTF)
|
||||||
writeRTFWithEmbeddedImages o)
|
|
||||||
,("org" , StringWriter writeOrg)
|
,("org" , StringWriter writeOrg)
|
||||||
,("asciidoc" , StringWriter writeAsciiDoc)
|
,("asciidoc" , StringWriter writeAsciiDoc)
|
||||||
,("haddock" , StringWriter writeHaddock)
|
,("haddock" , StringWriter writeHaddock)
|
||||||
|
|
|
@ -36,14 +36,14 @@ module Text.Pandoc.Class ( PandocMonad(..)
|
||||||
, PureState(..)
|
, PureState(..)
|
||||||
, getPOSIXTime
|
, getPOSIXTime
|
||||||
, getZonedTime
|
, getZonedTime
|
||||||
, warn
|
, addWarning
|
||||||
|
, addWarningWithPos
|
||||||
, getWarnings
|
, getWarnings
|
||||||
, getMediaBag
|
, getMediaBag
|
||||||
, setMediaBag
|
, setMediaBag
|
||||||
, insertMedia
|
, insertMedia
|
||||||
, getInputFiles
|
, getInputFiles
|
||||||
, getOutputFile
|
, getOutputFile
|
||||||
, addWarningWithPos
|
|
||||||
, PandocIO(..)
|
, PandocIO(..)
|
||||||
, PandocPure(..)
|
, PandocPure(..)
|
||||||
, FileInfo(..)
|
, FileInfo(..)
|
||||||
|
@ -121,10 +121,8 @@ class (Functor m, Applicative m, Monad m, MonadError PandocError m, MonadState C
|
||||||
|
|
||||||
-- Functions defined for all PandocMonad instances
|
-- Functions defined for all PandocMonad instances
|
||||||
|
|
||||||
-- TODO should we rename this to avoid conflict with the like-named
|
addWarning :: PandocMonad m => String -> m ()
|
||||||
-- function from Shared? Perhaps "addWarning"?
|
addWarning msg = modify $ \st -> st{stWarnings = msg : stWarnings st}
|
||||||
warn :: PandocMonad m => String -> m ()
|
|
||||||
warn msg = modify $ \st -> st{stWarnings = msg : stWarnings st}
|
|
||||||
|
|
||||||
getWarnings :: PandocMonad m => m [String]
|
getWarnings :: PandocMonad m => m [String]
|
||||||
getWarnings = gets stWarnings
|
getWarnings = gets stWarnings
|
||||||
|
@ -160,7 +158,7 @@ addWarningWithPos :: PandocMonad m
|
||||||
-> ParserT [Char] ParserState m ()
|
-> ParserT [Char] ParserState m ()
|
||||||
addWarningWithPos mbpos msg =
|
addWarningWithPos mbpos msg =
|
||||||
lift $
|
lift $
|
||||||
warn $
|
addWarning $
|
||||||
msg ++ maybe "" (\pos -> " " ++ show pos) mbpos
|
msg ++ maybe "" (\pos -> " " ++ show pos) mbpos
|
||||||
|
|
||||||
--
|
--
|
||||||
|
|
|
@ -108,7 +108,7 @@ readDocx :: PandocMonad m
|
||||||
readDocx opts bytes
|
readDocx opts bytes
|
||||||
| Right archive <- toArchiveOrFail bytes
|
| Right archive <- toArchiveOrFail bytes
|
||||||
, Right (docx, parserWarnings) <- archiveToDocxWithWarnings archive = do
|
, Right (docx, parserWarnings) <- archiveToDocxWithWarnings archive = do
|
||||||
mapM_ P.warn parserWarnings
|
mapM_ P.addWarning parserWarnings
|
||||||
(meta, blks) <- docxToOutput opts docx
|
(meta, blks) <- docxToOutput opts docx
|
||||||
return $ Pandoc meta blks
|
return $ Pandoc meta blks
|
||||||
readDocx _ _ =
|
readDocx _ _ =
|
||||||
|
@ -334,7 +334,7 @@ blocksToInlinesWarn cmtId blks = do
|
||||||
notParaOrPlain (Plain _) = False
|
notParaOrPlain (Plain _) = False
|
||||||
notParaOrPlain _ = True
|
notParaOrPlain _ = True
|
||||||
when (not $ null $ filter notParaOrPlain blkList)
|
when (not $ null $ filter notParaOrPlain blkList)
|
||||||
((lift . lift) $ P.warn $ "Docx comment " ++ cmtId ++ " will not retain formatting")
|
((lift . lift) $ P.addWarning $ "Docx comment " ++ cmtId ++ " will not retain formatting")
|
||||||
return $ fromList $ blocksToInlines blkList
|
return $ fromList $ blocksToInlines blkList
|
||||||
|
|
||||||
parPartToInlines :: PandocMonad m => ParPart -> DocxContext m Inlines
|
parPartToInlines :: PandocMonad m => ParPart -> DocxContext m Inlines
|
||||||
|
|
|
@ -654,20 +654,20 @@ addNewRole roleString fields = do
|
||||||
|
|
||||||
-- warn about syntax we ignore
|
-- warn about syntax we ignore
|
||||||
flip mapM_ fields $ \(key, _) -> case key of
|
flip mapM_ fields $ \(key, _) -> case key of
|
||||||
"language" -> when (baseRole /= "code") $ lift $ P.warn $
|
"language" -> when (baseRole /= "code") $ lift $ P.addWarning $
|
||||||
"ignoring :language: field because the parent of role :" ++
|
"ignoring :language: field because the parent of role :" ++
|
||||||
role ++ ": is :" ++ baseRole ++ ": not :code:"
|
role ++ ": is :" ++ baseRole ++ ": not :code:"
|
||||||
"format" -> when (baseRole /= "raw") $ lift $ P.warn $
|
"format" -> when (baseRole /= "raw") $ lift $ P.addWarning $
|
||||||
"ignoring :format: field because the parent of role :" ++
|
"ignoring :format: field because the parent of role :" ++
|
||||||
role ++ ": is :" ++ baseRole ++ ": not :raw:"
|
role ++ ": is :" ++ baseRole ++ ": not :raw:"
|
||||||
_ -> lift $ P.warn $ "ignoring unknown field :" ++ key ++
|
_ -> lift $ P.addWarning $ "ignoring unknown field :" ++ key ++
|
||||||
": in definition of role :" ++ role ++ ": in"
|
": in definition of role :" ++ role ++ ": in"
|
||||||
when (parentRole == "raw" && countKeys "format" > 1) $
|
when (parentRole == "raw" && countKeys "format" > 1) $
|
||||||
lift $ P.warn $
|
lift $ P.addWarning $
|
||||||
"ignoring :format: fields after the first in the definition of role :"
|
"ignoring :format: fields after the first in the definition of role :"
|
||||||
++ role ++": in"
|
++ role ++": in"
|
||||||
when (parentRole == "code" && countKeys "language" > 1) $
|
when (parentRole == "code" && countKeys "language" > 1) $
|
||||||
lift $ P.warn $
|
lift $ P.addWarning $
|
||||||
"ignoring :language: fields after the first in the definition of role :"
|
"ignoring :language: fields after the first in the definition of role :"
|
||||||
++ role ++": in"
|
++ role ++": in"
|
||||||
|
|
||||||
|
|
|
@ -58,7 +58,7 @@ readTWiki :: PandocMonad m
|
||||||
-> m Pandoc
|
-> m Pandoc
|
||||||
readTWiki opts s = case readTWikiWithWarnings' opts s of
|
readTWiki opts s = case readTWikiWithWarnings' opts s of
|
||||||
Right (doc, warns) -> do
|
Right (doc, warns) -> do
|
||||||
mapM_ P.warn warns
|
mapM_ P.addWarning warns
|
||||||
return doc
|
return doc
|
||||||
Left e -> throwError e
|
Left e -> throwError e
|
||||||
|
|
||||||
|
|
|
@ -1182,7 +1182,7 @@ inlineToOpenXML' opts (Image attr alt (src, title)) = do
|
||||||
res <- (lift . lift) $ P.fetchItem' (writerMediaBag opts) (writerSourceURL opts) src
|
res <- (lift . lift) $ P.fetchItem' (writerMediaBag opts) (writerSourceURL opts) src
|
||||||
case res of
|
case res of
|
||||||
Left (_ :: E.SomeException) -> do
|
Left (_ :: E.SomeException) -> do
|
||||||
(lift . lift) $ P.warn ("Could not find image `" ++ src ++ "', skipping...")
|
(lift . lift) $ P.addWarning ("Could not find image `" ++ src ++ "', skipping...")
|
||||||
-- emit alt text
|
-- emit alt text
|
||||||
inlinesToOpenXML opts alt
|
inlinesToOpenXML opts alt
|
||||||
Right (img, mt) -> do
|
Right (img, mt) -> do
|
||||||
|
|
|
@ -398,7 +398,7 @@ pandocToEPUB opts doc@(Pandoc meta _) = do
|
||||||
let matchingGlob f = do
|
let matchingGlob f = do
|
||||||
xs <- lift $ P.glob f
|
xs <- lift $ P.glob f
|
||||||
when (null xs) $
|
when (null xs) $
|
||||||
lift $ P.warn $ f ++ " did not match any font files."
|
lift $ P.addWarning $ f ++ " did not match any font files."
|
||||||
return xs
|
return xs
|
||||||
let mkFontEntry f = mkEntry (takeFileName f) `fmap` (lift $ P.readFileLazy f)
|
let mkFontEntry f = mkEntry (takeFileName f) `fmap` (lift $ P.readFileLazy f)
|
||||||
fontFiles <- concat <$> mapM matchingGlob (writerEpubFonts opts')
|
fontFiles <- concat <$> mapM matchingGlob (writerEpubFonts opts')
|
||||||
|
@ -864,7 +864,7 @@ modifyMediaRef opts oldsrc = do
|
||||||
(new, mbEntry) <-
|
(new, mbEntry) <-
|
||||||
case res of
|
case res of
|
||||||
Left _ -> do
|
Left _ -> do
|
||||||
lift $ P.warn $ "Could not find media `" ++ oldsrc ++ "', skipping..."
|
lift $ P.addWarning $ "Could not find media `" ++ oldsrc ++ "', skipping..."
|
||||||
return (oldsrc, Nothing)
|
return (oldsrc, Nothing)
|
||||||
Right (img,mbMime) -> do
|
Right (img,mbMime) -> do
|
||||||
let new = "media/file" ++ show (length media) ++
|
let new = "media/file" ++ show (length media) ++
|
||||||
|
|
|
@ -537,13 +537,13 @@ imageICML opts style attr (src, _) = do
|
||||||
res <- lift $ P.fetchItem (writerSourceURL opts) src
|
res <- lift $ P.fetchItem (writerSourceURL opts) src
|
||||||
imgS <- case res of
|
imgS <- case res of
|
||||||
Left (_) -> do
|
Left (_) -> do
|
||||||
lift $ P.warn $ "Could not find image `" ++ src ++ "', skipping..."
|
lift $ P.addWarning $ "Could not find image `" ++ src ++ "', skipping..."
|
||||||
return def
|
return def
|
||||||
Right (img, _) -> do
|
Right (img, _) -> do
|
||||||
case imageSize img of
|
case imageSize img of
|
||||||
Right size -> return size
|
Right size -> return size
|
||||||
Left msg -> do
|
Left msg -> do
|
||||||
lift $ P.warn $ "Could not determine image size in `" ++
|
lift $ P.addWarning $ "Could not determine image size in `" ++
|
||||||
src ++ "': " ++ msg
|
src ++ "': " ++ msg
|
||||||
return def
|
return def
|
||||||
let (ow, oh) = sizeInPoints imgS
|
let (ow, oh) = sizeInPoints imgS
|
||||||
|
|
|
@ -20,7 +20,7 @@ texMathToInlines mt inp = do
|
||||||
case res of
|
case res of
|
||||||
Right (Just ils) -> return ils
|
Right (Just ils) -> return ils
|
||||||
Right (Nothing) -> do
|
Right (Nothing) -> do
|
||||||
warn $ "Could not render TeX math as unicode, rendering as raw TeX:\n" ++ inp
|
addWarning $ "Could not render TeX math as unicode, rendering as raw TeX:\n" ++ inp
|
||||||
return [mkFallback mt inp]
|
return [mkFallback mt inp]
|
||||||
Left il -> return [il]
|
Left il -> return [il]
|
||||||
|
|
||||||
|
@ -40,7 +40,7 @@ convertMath writer mt str = do
|
||||||
case writer dt <$> readTeX str of
|
case writer dt <$> readTeX str of
|
||||||
Right r -> return (Right r)
|
Right r -> return (Right r)
|
||||||
Left e -> do
|
Left e -> do
|
||||||
warn $ "Could not convert TeX math, rendering as raw TeX:\n" ++
|
addWarning $ "Could not convert TeX math, rendering as raw TeX:\n" ++
|
||||||
str ++ "\n" ++ e
|
str ++ "\n" ++ e
|
||||||
return (Left $ mkFallback mt str)
|
return (Left $ mkFallback mt str)
|
||||||
where dt = case mt of
|
where dt = case mt of
|
||||||
|
|
|
@ -147,13 +147,13 @@ transformPicMath opts (Image attr@(id', cls, _) lab (src,t)) = do
|
||||||
res <- lift $ P.fetchItem' (writerMediaBag opts) (writerSourceURL opts) src
|
res <- lift $ P.fetchItem' (writerMediaBag opts) (writerSourceURL opts) src
|
||||||
case res of
|
case res of
|
||||||
Left (_ :: E.SomeException) -> do
|
Left (_ :: E.SomeException) -> do
|
||||||
lift $ P.warn $ "Could not find image `" ++ src ++ "', skipping..."
|
lift $ P.addWarning $ "Could not find image `" ++ src ++ "', skipping..."
|
||||||
return $ Emph lab
|
return $ Emph lab
|
||||||
Right (img, mbMimeType) -> do
|
Right (img, mbMimeType) -> do
|
||||||
(ptX, ptY) <- case imageSize img of
|
(ptX, ptY) <- case imageSize img of
|
||||||
Right s -> return $ sizeInPoints s
|
Right s -> return $ sizeInPoints s
|
||||||
Left msg -> do
|
Left msg -> do
|
||||||
lift $ P.warn $ "Could not determine image size in `" ++
|
lift $ P.addWarning $ "Could not determine image size in `" ++
|
||||||
src ++ "': " ++ msg
|
src ++ "': " ++ msg
|
||||||
return (100, 100)
|
return (100, 100)
|
||||||
let dims =
|
let dims =
|
||||||
|
|
|
@ -28,7 +28,6 @@ Foundation, Inc., 59 Temple Place, Suite 330, Boston, MA 02111-1307 USA
|
||||||
Conversion of 'Pandoc' documents to RTF (rich text format).
|
Conversion of 'Pandoc' documents to RTF (rich text format).
|
||||||
-}
|
-}
|
||||||
module Text.Pandoc.Writers.RTF ( writeRTF
|
module Text.Pandoc.Writers.RTF ( writeRTF
|
||||||
, writeRTFWithEmbeddedImages
|
|
||||||
) where
|
) where
|
||||||
import Text.Pandoc.Definition
|
import Text.Pandoc.Definition
|
||||||
import Text.Pandoc.Options
|
import Text.Pandoc.Options
|
||||||
|
@ -37,6 +36,7 @@ import Text.Pandoc.Writers.Shared
|
||||||
import Text.Pandoc.Writers.Math
|
import Text.Pandoc.Writers.Math
|
||||||
import Text.Pandoc.Templates (renderTemplate')
|
import Text.Pandoc.Templates (renderTemplate')
|
||||||
import Text.Pandoc.Walk
|
import Text.Pandoc.Walk
|
||||||
|
import Text.Pandoc.Class (addWarning)
|
||||||
import Data.List ( isSuffixOf, intercalate )
|
import Data.List ( isSuffixOf, intercalate )
|
||||||
import Data.Char ( ord, chr, isDigit )
|
import Data.Char ( ord, chr, isDigit )
|
||||||
import qualified Data.ByteString as B
|
import qualified Data.ByteString as B
|
||||||
|
@ -64,7 +64,7 @@ rtfEmbedImage opts x@(Image attr _ (src,_)) = do
|
||||||
_ -> throwError $ PandocSomeError "Unknown file type"
|
_ -> throwError $ PandocSomeError "Unknown file type"
|
||||||
sizeSpec <- case imageSize imgdata of
|
sizeSpec <- case imageSize imgdata of
|
||||||
Left msg -> do
|
Left msg -> do
|
||||||
P.warn $ "Could not determine image size in `" ++
|
addWarning $ "Could not determine image size in `" ++
|
||||||
src ++ "': " ++ msg
|
src ++ "': " ++ msg
|
||||||
return ""
|
return ""
|
||||||
Right sz -> return $ "\\picw" ++ show xpx ++
|
Right sz -> return $ "\\picw" ++ show xpx ++
|
||||||
|
@ -76,23 +76,27 @@ rtfEmbedImage opts x@(Image attr _ (src,_)) = do
|
||||||
(xpt, ypt) = desiredSizeInPoints opts attr sz
|
(xpt, ypt) = desiredSizeInPoints opts attr sz
|
||||||
let raw = "{\\pict" ++ filetype ++ sizeSpec ++ "\\bin " ++
|
let raw = "{\\pict" ++ filetype ++ sizeSpec ++ "\\bin " ++
|
||||||
concat bytes ++ "}"
|
concat bytes ++ "}"
|
||||||
return $ if B.null imgdata
|
if B.null imgdata
|
||||||
then x
|
then do
|
||||||
else RawInline (Format "rtf") raw
|
addWarning $ "Image " ++ src ++ " contained no data, skipping."
|
||||||
_ -> return x
|
return x
|
||||||
|
else return $ RawInline (Format "rtf") raw
|
||||||
|
| otherwise -> do
|
||||||
|
addWarning $ "Image " ++ src ++ " is not a jpeg or png, skipping."
|
||||||
|
return x
|
||||||
|
Right (_, Nothing) -> do
|
||||||
|
addWarning $ "Could not determine image type for " ++ src ++ ", skipping."
|
||||||
|
return x
|
||||||
|
Left e -> do
|
||||||
|
addWarning $ "Could not fetch image " ++ src ++ "\n" ++ show e
|
||||||
|
return x
|
||||||
rtfEmbedImage _ x = return x
|
rtfEmbedImage _ x = return x
|
||||||
|
|
||||||
-- | Convert Pandoc to a string in rich text format, with
|
|
||||||
-- images embedded as encoded binary data. TODO get rid of this,
|
|
||||||
-- we don't need it now that we have writeRTF in PandocMonad.
|
|
||||||
writeRTFWithEmbeddedImages :: PandocMonad m
|
|
||||||
=> WriterOptions -> Pandoc -> m String
|
|
||||||
writeRTFWithEmbeddedImages options doc =
|
|
||||||
writeRTF options =<< walkM (rtfEmbedImage options) doc
|
|
||||||
|
|
||||||
-- | Convert Pandoc to a string in rich text format.
|
-- | Convert Pandoc to a string in rich text format.
|
||||||
writeRTF :: PandocMonad m => WriterOptions -> Pandoc -> m String
|
writeRTF :: PandocMonad m => WriterOptions -> Pandoc -> m String
|
||||||
writeRTF options (Pandoc meta@(Meta metamap) blocks) = do
|
writeRTF options doc = do
|
||||||
|
-- handle images
|
||||||
|
Pandoc meta@(Meta metamap) blocks <- walkM (rtfEmbedImage options) doc
|
||||||
let spacer = not $ all null $ docTitle meta : docDate meta : docAuthors meta
|
let spacer = not $ all null $ docTitle meta : docDate meta : docAuthors meta
|
||||||
let toPlain (MetaBlocks [Para ils]) = MetaInlines ils
|
let toPlain (MetaBlocks [Para ils]) = MetaInlines ils
|
||||||
toPlain x = x
|
toPlain x = x
|
||||||
|
|
Loading…
Reference in a new issue