{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE OverlappingInstances #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE TypeSynonymInstances #-}


module Air.Spec where

import Air.Data.PlainShow
import Test.Hspec (shouldBe, Expectation)

(===) :: (PlainShow a, Eq a) => a -> a -> Expectation
x === y = (PlainShowWrapper x) `shouldBe` (PlainShowWrapper y)
infixr 0 ===