diff options
author | John MacFarlane <fiddlosopher@gmail.com> | 2012-01-20 19:39:18 -0800 |
---|---|---|
committer | John MacFarlane <fiddlosopher@gmail.com> | 2012-01-20 19:39:18 -0800 |
commit | ce3653e39d3e3a57748c4922189eb9610d568051 (patch) | |
tree | a96f47864a063e8fd2a92a2ebff9df647b183d21 /src | |
parent | f519f0a1ad51a1757a00f4afffd26ce7196430c1 (diff) | |
download | pandoc-ce3653e39d3e3a57748c4922189eb9610d568051.tar.gz |
pandoc: Output to pdf now works.
Diffstat (limited to 'src')
-rw-r--r-- | src/Text/Pandoc/Templates.hs | 1 | ||||
-rw-r--r-- | src/pandoc.hs | 35 |
2 files changed, 21 insertions, 15 deletions
diff --git a/src/Text/Pandoc/Templates.hs b/src/Text/Pandoc/Templates.hs index a03be4f17..c3cacd809 100644 --- a/src/Text/Pandoc/Templates.hs +++ b/src/Text/Pandoc/Templates.hs @@ -85,6 +85,7 @@ getDefaultTemplate _ "native" = return $ Right "" getDefaultTemplate _ "json" = return $ Right "" getDefaultTemplate _ "docx" = return $ Right "" getDefaultTemplate user "odt" = getDefaultTemplate user "opendocument" +getDefaultTemplate user "pdf" = getDefaultTemplate user "latex" getDefaultTemplate user "epub" = getDefaultTemplate user "html" getDefaultTemplate user "beamer" = getDefaultTemplate user "latex" getDefaultTemplate user writer = do diff --git a/src/pandoc.hs b/src/pandoc.hs index a6db9c4e1..0eae9cdc2 100644 --- a/src/pandoc.hs +++ b/src/pandoc.hs @@ -30,7 +30,7 @@ writers. -} module Main where import Text.Pandoc -import Text.Pandoc.PDF (tex2pdf) +import Text.Pandoc.PDF (tex2pdf, TeXProgram(..)) import Text.Pandoc.Shared ( tabFilter, ObfuscationMethod (..), readDataFile, headerShift, findDataFile, normalize ) import Text.Pandoc.SelfContained ( makeSelfContained ) @@ -83,7 +83,7 @@ wrapWords indent c = wrap' (c - indent) (c - indent) else ", " ++ x ++ wrap' cols (remaining - (length x + 2)) xs nonTextFormats :: [String] -nonTextFormats = ["odt","docx","epub"] +nonTextFormats = ["odt","docx","epub","pdf"] -- | Data structure for command line options. data Opt = Opt @@ -709,6 +709,7 @@ defaultWriterName x = ".epub" -> "epub" ".org" -> "org" ".asciidoc" -> "asciidoc" + ".pdf" -> "pdf" ['.',y] | y `elem` ['1'..'9'] -> "man" _ -> "html" @@ -965,20 +966,24 @@ main = do case lookup writerName' writers of Nothing | writerName' == "epub" -> - writeEPUB epubStylesheet writerOptions doc2 - >>= B.writeFile (encodeString outputFile) + writeEPUB epubStylesheet writerOptions doc2 >>= writeBinary | writerName' == "odt" -> - writeODT referenceODT writerOptions doc2 - >>= B.writeFile (encodeString outputFile) + writeODT referenceODT writerOptions doc2 >>= writeBinary | writerName' == "docx" -> - writeDocx referenceDocx writerOptions doc2 - >>= B.writeFile (encodeString outputFile) + writeDocx referenceDocx writerOptions doc2 >>= writeBinary + | writerName' == "pdf" -> + do res <- tex2pdf PDFLaTeX $ writeLaTeX writerOptions doc2 + case res of + Right pdf -> writeBinary pdf + Left err' -> B.hPutStr stderr err' >> B.hPutStr stderr nl | otherwise -> error $ "Unknown writer: " ++ writerName' + where writeBinary = B.writeFile (encodeString outputFile) + nl = B.singleton 10 Just r -> writerFn outputFile =<< postProcess result - where writerFn "-" = UTF8.putStr - writerFn f = UTF8.writeFile f - result = r writerOptions doc2 ++ ['\n' | not standalone'] - htmlFormats = ["html","html+lhs","s5","slidy","dzslides"] - postProcess = if selfContained && writerName' `elem` htmlFormats - then makeSelfContained datadir - else return + where writerFn "-" = UTF8.putStr + writerFn f = UTF8.writeFile f + result = r writerOptions doc2 ++ ['\n' | not standalone'] + htmlFormats = ["html","html+lhs","s5","slidy","dzslides"] + postProcess = if selfContained && writerName' `elem` htmlFormats + then makeSelfContained datadir + else return |