purescript-typeable/test/Main.purs

72 lines
2.7 KiB
Haskell
Raw Normal View History

2021-01-06 05:04:30 +00:00
module Test.Main where
import Prelude
2021-04-22 12:08:28 +00:00
import Control.Monad.Error.Class (class MonadThrow)
2021-01-06 16:12:20 +00:00
import Data.Either (Either)
import Data.Typeable (class Tagged, TypeRep, eqTypeRep, makeTag, typeRep, typeRepFromVal)
2021-01-06 05:04:30 +00:00
import Effect (Effect)
2021-04-22 12:08:28 +00:00
import Effect.Aff (launchAff_)
import Effect.Exception (Error)
import Test.Person (Person, typeArrPerson, typePerson)
2021-04-22 12:08:28 +00:00
import Test.Spec (describe, it)
import Test.Spec.Assertions (shouldEqual)
import Test.Spec.Reporter.Console (consoleReporter)
import Test.Spec.Runner (runSpec)
foreign import clog :: forall a. a -> Effect Unit
2021-01-06 05:04:30 +00:00
2021-04-22 12:08:28 +00:00
assert :: forall m. MonadThrow Error m => Boolean -> m Unit
assert = shouldEqual true
2021-04-22 12:08:28 +00:00
deny :: forall m. MonadThrow Error m => Boolean -> m Unit
deny = shouldEqual false
2021-01-06 05:04:30 +00:00
main :: Effect Unit
main = do
launchAff_ $ runSpec [ consoleReporter ] do
2021-04-22 12:08:28 +00:00
describe "Typeable" do
it "can handle primitives" do
deny $ eqTypeRep (typeRep :: _ Int) (typeRep :: _ Char)
it "can handle unsaturated types" do
assert $ eqTypeRep (typeRep :: _ Array) (typeRep :: _ Array)
assert $ eqTypeRep (typeRep :: _ Optional) (typeRep :: _ Optional)
deny $ eqTypeRep (typeRep :: _ (Optional Int)) (typeRep :: _ (Optional Char))
2021-04-22 12:08:28 +00:00
it "can handle mixed arity" do
deny $ eqTypeRep (typeRep :: _ Array) (typeRep :: _ Person)
it "can handle user defined data types" do
assert $ eqTypeRep (typeRep :: _ Person) typePerson
assert $ eqTypeRep (typeRep :: _ Person) (typeRep :: _ Person)
2021-04-22 12:08:28 +00:00
it "can distinguish between distinct types with matching fields" do
deny $ eqTypeRep (typeRep :: _ Person) (typeRep :: _ Person2)
it "can handle nested types" do
assert $ eqTypeRep (typeRep :: _ (Either Int Person)) (typeRep :: _ (Either Int Person))
assert $ eqTypeRep (typeRep :: _ (Array Person)) typeArrPerson
deny $ eqTypeRep (typeRep :: _ (Array Person2)) typeArrPerson
it "can handle bare records" do
assert $ eqTypeRep typeRecord (typeRep :: _ { name :: String, age :: Int })
2021-04-22 12:08:28 +00:00
it "can generate type reps from values" do
assert $ eqTypeRep (typeRep :: _ (Optional Int)) (typeRepFromVal (Some 1))
deny $ eqTypeRep (typeRep :: _ (Optional Person)) (typeRepFromVal (Some 1))
where
typeRecord :: TypeRep { age :: Int, name :: String }
typeRecord = typeRep
-- -- A data type without a typeable instance
-- data Break
-- -- The following should not compile since Break does not have a typeable instance
-- typeRecordBreak :: TypeRep {break::Break, name::String}
-- typeRecordBreak = typeRep
2021-01-11 20:04:12 +00:00
newtype Person2 = Person2 { name :: String, location :: String }
instance tagPerson2 :: Tagged Person2 where
tag = makeTag unit
2021-01-06 06:16:16 +00:00
data Optional a = None | Some a
instance tagOptional :: Tagged Optional where
tag = makeTag unit