diff options
author | Alexander Krotov <ilabdsf@gmail.com> | 2019-04-28 03:21:14 +0300 |
---|---|---|
committer | Alexander Krotov <ilabdsf@gmail.com> | 2019-04-28 03:21:14 +0300 |
commit | 2b2d9baaa8341755a2c6219470639ec7c5d99551 (patch) | |
tree | 0fa500912f59cddaadb813d340e799afe2e323f1 /test/Tests | |
parent | 66dd2008b060d285d5e07ace8a89b17c63132022 (diff) | |
download | pandoc-2b2d9baaa8341755a2c6219470639ec7c5d99551.tar.gz |
Muse writer tests: compare Text without converting to [Char]
Diffstat (limited to 'test/Tests')
-rw-r--r-- | test/Tests/Writers/Muse.hs | 12 |
1 files changed, 6 insertions, 6 deletions
diff --git a/test/Tests/Writers/Muse.hs b/test/Tests/Writers/Muse.hs index 834422a59..8dacaf89d 100644 --- a/test/Tests/Writers/Muse.hs +++ b/test/Tests/Writers/Muse.hs @@ -2,8 +2,8 @@ {-# LANGUAGE OverloadedStrings #-} module Tests.Writers.Muse (tests) where -import Prelude -import Data.Text (unpack) +import Prelude hiding (unlines) +import Data.Text (Text, unlines) import Test.Tasty import Tests.Helpers import Text.Pandoc @@ -15,15 +15,15 @@ defopts = def{ writerWrapText = WrapPreserve, writerExtensions = extensionsFromList [Ext_amuse, Ext_auto_identifiers] } -muse :: (ToPandoc a) => a -> String +muse :: (ToPandoc a) => a -> Text muse = museWithOpts defopts -museWithOpts :: (ToPandoc a) => WriterOptions -> a -> String -museWithOpts opts = unpack . purely (writeMuse opts) . toPandoc +museWithOpts :: (ToPandoc a) => WriterOptions -> a -> Text +museWithOpts opts = purely (writeMuse opts) . toPandoc infix 4 =: (=:) :: (ToString a, ToPandoc a) - => String -> (a, String) -> TestTree + => String -> (a, Text) -> TestTree (=:) = test muse noteLocationTestDoc :: Blocks |