about summary refs log tree commit diff
path: root/users/grfn/xanthous/test/Xanthous/OrphansSpec.hs
blob: 0d800e8a91de9971abe4b5155f11e7b3f786f4fc (plain) (blame)
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
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
{-# LANGUAGE BlockArguments #-}
{-# LANGUAGE OverloadedLists #-}
--------------------------------------------------------------------------------
module Xanthous.OrphansSpec where
--------------------------------------------------------------------------------
import           Test.Prelude
--------------------------------------------------------------------------------
import           Text.Mustache
import           Text.Megaparsec (errorBundlePretty)
import           Graphics.Vty.Attributes
import qualified Data.Aeson as JSON
import           Data.Interval (Interval, (<=..<=), (<=..<), (<..<=))
import           Data.Aeson ( ToJSON(toJSON), object, Value(Array) )
import           Data.Aeson.Types (fromJSON)
import           Data.IntegerInterval (Extended(Finite))
--------------------------------------------------------------------------------
import           Xanthous.Orphans
--------------------------------------------------------------------------------

main :: IO ()
main = defaultMain test

test :: TestTree
test = testGroup "Xanthous.Orphans"
  [ localOption (QuickCheckTests 50)
  . localOption (QuickCheckMaxSize 10)
  $ testGroup "Template"
    [ testProperty "ppTemplate / compileMustacheText " \tpl ->
        let src = ppTemplate tpl
            res :: Either String Template
            res = over _Left errorBundlePretty
                $ compileMustacheText (templateActual tpl) src
            expected = templateCache tpl ^?! at (templateActual tpl)
        in
          counterexample (unpack src)
          $ Right expected === do
            (Template actual cache) <- res
            maybe (Left "Template not found") Right $ cache ^? at actual
    , testProperty "JSON round trip" $ \(tpl :: Template) ->
        counterexample (unpack $ ppTemplate tpl)
        $ JSON.decode (JSON.encode tpl) === Just tpl
    ]
  , testGroup "Attr"
    [ jsonRoundTrip @Attr ]
  , testGroup "Extended"
    [ jsonRoundTrip @(Extended Int) ]
  , testGroup "Interval"
    [ testGroup "JSON"
      [ jsonRoundTrip @(Interval Int)
      , testCase "parses a single value as a length-1 interval" $
          getSuccess (fromJSON $ toJSON (1 :: Int))
          @?= Just (Finite (1 :: Int) <=..<= Finite 1)
      , testCase "parses a pair of values as a single-ended interval" $
          getSuccess (fromJSON $ toJSON ([1, 2] :: [Int]))
          @?= Just (Finite (1 :: Int) <=..< Finite (2 :: Int))
      , testCase "parses the full included/excluded syntax" $
          getSuccess (fromJSON $ Array [ object [ "Excluded" JSON..= (1 :: Int) ]
                                       , object [ "Included" JSON..= (4 :: Int) ]
                                       ])
          @?= Just (Finite (1 :: Int) <..<= Finite (4 :: Int))
      , testCase "parses open/closed as aliases" $
          getSuccess (fromJSON $ Array [ object [ "Open" JSON..= (1 :: Int) ]
                                       , object [ "Closed" JSON..= (4 :: Int) ]
                                       ])
          @?= Just (Finite (1 :: Int) <..<= Finite (4 :: Int))
      ]
    ]
  ]
  where
    getSuccess :: JSON.Result a -> Maybe a
    getSuccess (JSON.Error _) = Nothing
    getSuccess (JSON.Success r) = Just r