From 857d35fce4e364039092a9da37b93b67bd566bb6 Mon Sep 17 00:00:00 2001
From: John MacFarlane <jgm@berkeley.edu>
Date: Tue, 7 Feb 2017 22:33:05 +0100
Subject: Refactored some files formerly in LaTeX reader.

* Export readFileFromDirs from Class.
* Export insertIncludedFile from Parsing.

Simplified code in LaTeX/RST readers.
---
 src/Text/Pandoc/Readers/LaTeX.hs | 23 ++---------------------
 src/Text/Pandoc/Readers/RST.hs   | 16 ++++------------
 2 files changed, 6 insertions(+), 33 deletions(-)

(limited to 'src/Text/Pandoc/Readers')

diff --git a/src/Text/Pandoc/Readers/LaTeX.hs b/src/Text/Pandoc/Readers/LaTeX.hs
index 0cbd3a814..99c1056c2 100644
--- a/src/Text/Pandoc/Readers/LaTeX.hs
+++ b/src/Text/Pandoc/Readers/LaTeX.hs
@@ -50,10 +50,8 @@ import Data.List (intercalate)
 import qualified Data.Map as M
 import Text.Pandoc.Highlighting (fromListingsLanguage)
 import Text.Pandoc.ImageSize (numUnit, showFl)
-import Text.Pandoc.Error
 import Control.Monad.Except (throwError)
-import Text.Pandoc.Class (PandocMonad, PandocPure, lookupEnv,
-                          warningWithPos, readFileFromDirs)
+import Text.Pandoc.Class (PandocMonad, PandocPure, lookupEnv, warningWithPos )
 
 -- | Parse LaTeX from string and return 'Pandoc' document.
 readLaTeX :: PandocMonad m
@@ -959,24 +957,7 @@ include = do
                           then map (maybeAddExtension ".sty") fs
                           else map (maybeAddExtension ".tex") fs
   dirs <- (splitBy (==':') . fromMaybe ".") <$> lookupEnv "TEXINPUTS"
-  mconcat <$> mapM (insertIncludedFile dirs) fs'
-
-insertIncludedFile :: PandocMonad m => [FilePath] -> FilePath -> LP m Blocks
-insertIncludedFile dirs f = do
-  oldPos <- getPosition
-  oldInput <- getInput
-  containers <- stateContainers <$> getState
-  when (f `elem` containers) $
-    throwError $ PandocParseError $ "Include file loop at " ++ show oldPos
-  updateState $ \s -> s{ stateContainers = f : stateContainers s }
-  contents <- readFileFromDirs dirs f
-  setPosition $ newPos f 1 1
-  setInput contents
-  bs <- blocks
-  setInput oldInput
-  setPosition oldPos
-  updateState $ \s -> s{ stateContainers = tail $ stateContainers s }
-  return bs
+  mconcat <$> mapM (insertIncludedFile blocks dirs) fs'
 
 ----
 
diff --git a/src/Text/Pandoc/Readers/RST.hs b/src/Text/Pandoc/Readers/RST.hs
index c9868c11f..85db52e02 100644
--- a/src/Text/Pandoc/Readers/RST.hs
+++ b/src/Text/Pandoc/Readers/RST.hs
@@ -37,7 +37,6 @@ import Text.Pandoc.Shared
 import Text.Pandoc.Parsing
 import Text.Pandoc.Options
 import Text.Pandoc.Error
-import qualified Text.Pandoc.UTF8 as UTF8
 import Control.Monad ( when, liftM, guard, mzero )
 import Data.List ( findIndex, intercalate, isInfixOf,
                    transpose, sort, deleteFirstsBy, isSuffixOf , nub, union)
@@ -49,8 +48,9 @@ import qualified Text.Pandoc.Builder as B
 import Data.Sequence (viewr, ViewR(..))
 import Data.Char (toLower, isHexDigit, isSpace)
 import Data.Monoid ((<>))
-import Control.Monad.Except (throwError, catchError)
-import Text.Pandoc.Class (PandocMonad, warning, readFileLazy, warningWithPos)
+import Control.Monad.Except (throwError)
+import Text.Pandoc.Class (PandocMonad, warning, readFileFromDirs,
+                          warningWithPos)
 
 -- | Parse reStructuredText string and return Pandoc document.
 readRST :: PandocMonad m
@@ -421,12 +421,7 @@ include = try $ do
   when (f `elem` containers) $
     throwError $ PandocParseError $ "Include file loop at " ++ show oldPos
   updateState $ \s -> s{ stateContainers = f : stateContainers s }
-  res <- readFileLazy' f
-  contents <- case res of
-                   Right x -> return x
-                   Left _e -> do
-                     warning $ "Could not read include file " ++ f ++ "."
-                     return ""
+  contents <- readFileFromDirs ["."] f
   let contentLines = lines contents
   let numLines = length contentLines
   let startLine' = case startLine of
@@ -470,9 +465,6 @@ include = try $ do
                                          tail $ stateContainers s }
                            return bs
 
-readFileLazy' :: PandocMonad m => FilePath -> m (Either PandocError String)
-readFileLazy' f = catchError ((Right . UTF8.toStringLazy) <$> readFileLazy f) $
-  \(e :: PandocError) -> return (Left e)
 
 --
 -- list blocks
-- 
cgit v1.2.3