pandoc/test/Tests/Readers/Man.hs
2018-02-25 03:34:17 +03:00

16 lines
No EOL
365 B
Haskell

{-# LANGUAGE OverloadedStrings #-}
module Tests.Readers.Man (tests) where
import Data.Text (Text)
import qualified Data.Text as T
import Test.Tasty
import Tests.Helpers
import Text.Pandoc
import Text.Pandoc.Arbitrary ()
import Text.Pandoc.Builder
creole :: Text -> Pandoc
creole = purely $ readCreole def{ readerStandalone = True }
tests :: [TestTree]
tests = []