diff options
Diffstat (limited to 'tests/Tests/Writers/TEI.hs')
-rw-r--r-- | tests/Tests/Writers/TEI.hs | 43 |
1 files changed, 0 insertions, 43 deletions
diff --git a/tests/Tests/Writers/TEI.hs b/tests/Tests/Writers/TEI.hs deleted file mode 100644 index 703f565bb..000000000 --- a/tests/Tests/Writers/TEI.hs +++ /dev/null @@ -1,43 +0,0 @@ -{-# LANGUAGE OverloadedStrings #-} -module Tests.Writers.TEI (tests) where - -import Test.Framework -import Text.Pandoc.Builder -import Text.Pandoc -import Tests.Helpers -import Text.Pandoc.Arbitrary() - -{- - "my test" =: X =?> Y - -is shorthand for - - test html "my test" $ X =?> Y - -which is in turn shorthand for - - test html "my test" (X,Y) --} - -infix 4 =: -(=:) :: (ToString a, ToPandoc a) - => String -> (a, String) -> Test -(=:) = test (purely (writeTEI def) . toPandoc) - -tests :: [Test] -tests = [ testGroup "block elements" - ["para" =: para "Lorem ipsum cetera." - =?> "<p>Lorem ipsum cetera.</p>" - ] - , testGroup "inlines" - [ - "Emphasis" =: emph ("emphasized") - =?> "<p><hi rendition=\"simple:italic\">emphasized</hi></p>" - ,"SingleQuoted" =: singleQuoted (text "quoted material") - =?> "<p><quote>quoted material</quote></p>" - ,"DoubleQuoted" =: doubleQuoted (text "quoted material") - =?> "<p><quote>quoted material</quote></p>" - ,"NestedQuoted" =: doubleQuoted (singleQuoted (text "quoted material")) - =?> "<p><quote><quote>quoted material</quote></quote></p>" - ] - ] |