diff options
Diffstat (limited to 'src')
-rw-r--r-- | src/markdown2pdf.hs | 5 |
1 files changed, 2 insertions, 3 deletions
diff --git a/src/markdown2pdf.hs b/src/markdown2pdf.hs index 0333b121f..d713ae263 100644 --- a/src/markdown2pdf.hs +++ b/src/markdown2pdf.hs @@ -3,7 +3,7 @@ module Main where import Data.List (isInfixOf, intercalate, isPrefixOf) import Data.Maybe (isNothing) -import Control.Monad (unless, guard, when) +import Control.Monad (unless, guard) import Control.Exception (tryJust, bracket) import System.IO (stderr) @@ -75,6 +75,7 @@ runLatex latexProgram file = step 3 case result of Left (Left err) -> return $ Left err Left (Right _) | n > 1 -> step (n-1 :: Int) + Right _ | n > 2 -> step (n-1 :: Int) Left (Right msg) -> return $ Left msg Right pdfFile -> return $ Right pdfFile @@ -201,8 +202,6 @@ main = bracket Left err -> exit err Right texFile -> do -- run pdflatex - when ("--toc" `elem` opts || "--table-of-contents" `elem` opts) $ - runLatex latexProgram texFile >> return () -- toc requires extra run latexRes <- runLatex latexProgram texFile case latexRes of Left err -> exit err |