Skip to content
Snippets Groups Projects
Commit 34f71cfa authored by Matt Walker's avatar Matt Walker
Browse files

Add falsify to ghc-tests.cabal

parent 2d7511e0
No related branches found
No related tags found
No related merge requests found
Pipeline #89894 failed
Pipeline: head.hackage

#89895

    ......@@ -53,8 +53,9 @@ test-suite ghc-tests
    bytestring,
    time,
    deepseq,
    falsify,
    mtl
    main-is: Main.hs
    other-modules: Chan001
    , MVar001
    ......
    {-# LANGUAGE GADTs #-}
    module PBT.Expr where
    import Data.Text (Text)
    import Test.Falsify
    data Id a where
    F :: Text -> Id (a -> b)
    V :: Text -> Id a
    data Binder a where
    Wild :: Id a -> Binder a
    data Expr a where
    Var :: Id a -> Expr a
    Lit :: a -> Expr a
    App :: Expr (a -> b) -> Expr a -> Expr b
    Lam :: Binder a -> Expr b -> Expr (a -> b)
    0% Loading or .
    You are about to add 0 people to the discussion. Proceed with caution.
    Finish editing this message first!
    Please register or to comment