aboutsummaryrefslogtreecommitdiff
path: root/test/Tests/Readers/Man.hs
blob: 5dc91544b00a2b1bf4a3523ced4225ff2d3cab4e (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
{-# 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 = []