aboutsummaryrefslogtreecommitdiff
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2017-06-11 11:52:53 +0200
committerJohn MacFarlane <jgm@berkeley.edu>2017-06-11 11:52:53 +0200
commit0ab26ac9ebb0196691ec064820eac4e640f0d52c (patch)
tree684688a35415e8ed5cb496ac7cf45926fa7c3bdc
parent850105e8db3b81ce12915d2c36ae86d21a6fff4a (diff)
downloadpandoc-0ab26ac9ebb0196691ec064820eac4e640f0d52c.tar.gz
Command tests: small change to try to fix appveyor failures.
-rw-r--r--test/Tests/Command.hs7
1 files changed, 4 insertions, 3 deletions
diff --git a/test/Tests/Command.hs b/test/Tests/Command.hs
index 1f3694f60..316408c93 100644
--- a/test/Tests/Command.hs
+++ b/test/Tests/Command.hs
@@ -2,6 +2,7 @@ module Tests.Command (findPandoc, runTest, tests)
where
import Data.Algorithm.Diff
+import qualified Data.Text as T
import Data.List (isSuffixOf)
import Prelude hiding (readFile)
import System.Directory
@@ -13,7 +14,6 @@ import Test.Tasty.HUnit
import Tests.Helpers
import Text.Pandoc
import Text.Pandoc.Shared (trimr)
-import qualified Data.ByteString as BS
import qualified Text.Pandoc.UTF8 as UTF8
import System.IO.Unsafe (unsafePerformIO) -- TODO temporary
@@ -84,9 +84,10 @@ runCommandTest pandocpath (num, code) =
extractCommandTest :: FilePath -> FilePath -> TestTree
extractCommandTest pandocpath fp = unsafePerformIO $ do
- contents <- UTF8.toText <$> BS.readFile ("command" </> fp)
+ contents <- UTF8.readFile ("command" </> fp)
Pandoc _ blocks <- runIOorExplode (readMarkdown
- def{ readerExtensions = pandocExtensions } contents)
+ def{ readerExtensions = pandocExtensions }
+ (T.pack contents))
let codeblocks = map extractCode $ filter isCodeBlock $ blocks
let cases = map (runCommandTest pandocpath) $ zip [1..] codeblocks
return $ testGroup fp cases