{-# LANGUAGE OverloadedStrings #-}
module Tests.Writers.FB2 (tests) where
import Test.Tasty
import Tests.Helpers
import Text.Pandoc
import Text.Pandoc.Arbitrary ()
import Text.Pandoc.Builder
fb2 :: String -> String
fb2 x = "\n" ++
"
Lorem ipsum cetera.
" ] , testGroup "inlines" [ "Emphasis" =: emph "emphasized" =?> fb2 "\x2022 first
\x2022 second
\x2022 third
" ]