diff options
author | John MacFarlane <jgm@berkeley.edu> | 2017-10-27 20:28:29 -0700 |
---|---|---|
committer | John MacFarlane <jgm@berkeley.edu> | 2017-10-27 20:28:29 -0700 |
commit | ff16db1aa306113132cc6cfaa70791a0db75e0a5 (patch) | |
tree | b5a016232c62645a1276c30eb4b69356662c060e /test/Tests/Lua.hs | |
parent | bf54a6335a0d2ae3fdf03e60a84448476f651d59 (diff) | |
download | pandoc-ff16db1aa306113132cc6cfaa70791a0db75e0a5.tar.gz |
Automatic reformating by stylish-haskell.
Diffstat (limited to 'test/Tests/Lua.hs')
-rw-r--r-- | test/Tests/Lua.hs | 16 |
1 files changed, 8 insertions, 8 deletions
diff --git a/test/Tests/Lua.hs b/test/Tests/Lua.hs index ba6196ccb..f9f0e9753 100644 --- a/test/Tests/Lua.hs +++ b/test/Tests/Lua.hs @@ -1,15 +1,15 @@ -{-# Language OverloadedStrings #-} +{-# LANGUAGE OverloadedStrings #-} module Tests.Lua ( tests ) where import Control.Monad (when) import System.FilePath ((</>)) import Test.Tasty (TestTree, localOption) import Test.Tasty.HUnit (Assertion, assertEqual, testCase) -import Test.Tasty.QuickCheck (ioProperty, testProperty, QuickCheckTests(..)) +import Test.Tasty.QuickCheck (QuickCheckTests (..), ioProperty, testProperty) import Text.Pandoc.Arbitrary () -import Text.Pandoc.Builder ( (<>), bulletList, doc, doubleQuoted, emph - , linebreak, rawBlock, singleQuoted, para, plain - , space, str, strong) +import Text.Pandoc.Builder (bulletList, doc, doubleQuoted, emph, linebreak, + para, plain, rawBlock, singleQuoted, space, str, + strong, (<>)) import Text.Pandoc.Class (runIOorExplode) import Text.Pandoc.Definition (Block, Inline, Meta, Pandoc) import Text.Pandoc.Lua @@ -84,7 +84,7 @@ assertFilterConversion msg filterPath docIn docExpected = do docEither <- runIOorExplode $ runLuaFilter (Just "../data") ("lua" </> filterPath) [] docIn case docEither of - Left _ -> fail "lua filter failed" + Left _ -> fail "lua filter failed" Right docRes -> assertEqual msg docExpected docRes roundtripEqual :: (Eq a, FromLuaStack a, ToLuaStack a) => a -> IO Bool @@ -102,5 +102,5 @@ roundtripEqual x = (x ==) <$> roundtripped error ("not exactly one additional element on the stack: " ++ show size) res <- peekEither (-1) case res of - Left _ -> error "could not read from stack" - Right y -> return y + Left _ -> error "could not read from stack" + Right y -> return y |