aboutsummaryrefslogtreecommitdiff
path: root/pandoc-lua-engine/test/Tests/Lua/Reader.hs
blob: b09a309d889c8d3f89b7f1dc9e02eb4090b75ecb (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
{-# LANGUAGE LambdaCase        #-}
{- |
Module      : Tests.Lua.Reader
Copyright   : © 2022-2024 Albert Krewinkel
License     : GPL-2.0-or-later
Maintainer  : Albert Krewinkel <[email protected]>

Tests for custom Lua readers.
-}
module Tests.Lua.Reader (tests) where

import Control.Arrow ((>>>))
import Data.Char (chr)
import Data.Default (Default (def))
import Text.Pandoc.Class (runIOorExplode)
import Text.Pandoc.Lua (loadCustom)
import Text.Pandoc.Readers (Reader (ByteStringReader))
import Text.Pandoc.Scripting (customReader)
import Test.Tasty (TestTree)
import Test.Tasty.HUnit ((@?=), testCase)

import qualified Data.ByteString.Lazy as BL
import qualified Data.Text as T
import qualified Text.Pandoc.Builder as B

tests :: [TestTree]
tests =
  [ testCase "read binary to code block" $ do
    input <- BL.readFile "bytestring.bin"
    doc <- runIOorExplode $
      loadCustom "bytestring-reader.lua" >>= (customReader >>> \case
        Just (ByteStringReader f) -> f def input
        _                         -> error "Expected a bytestring reader")
    let bytes = mconcat $ map (B.str . T.singleton . chr) [0..255]
    doc @?= B.doc (B.plain bytes)
  ]