1
1
mirror of https://github.com/anoma/juvix.git synced 2024-12-19 12:51:39 +03:00
juvix/test/Typecheck/Positive.hs

223 lines
6.1 KiB
Haskell
Raw Normal View History

module Typecheck.Positive where
import Base
2023-01-17 11:41:07 +03:00
import Compilation.Positive qualified as Compilation
import Typecheck.Negative qualified as N
data PosTest = PosTest
2022-04-08 13:46:37 +03:00
{ _name :: String,
2023-01-17 11:41:07 +03:00
_dir :: Path Abs Dir,
_file :: Path Abs File
}
2022-12-20 15:05:40 +03:00
root :: Path Abs Dir
root = relToProject $(mkRelDir "tests/positive")
2023-01-17 11:41:07 +03:00
posTest :: String -> Path Rel Dir -> Path Rel File -> PosTest
posTest _name rdir rfile =
let _dir = root <//> rdir
_file = _dir <//> rfile
in PosTest {..}
testDescr :: PosTest -> TestDescr
testDescr PosTest {..} =
2023-01-17 11:41:07 +03:00
TestDescr
{ _testName = _name,
_testRoot = _dir,
_testAssertion = Single $ do
entryPoint <- defaultEntryPointCwdIO _file
(void . runIO' entryPoint) upToInternalTyped
2023-01-17 11:41:07 +03:00
}
--------------------------------------------------------------------------------
-- Testing --no-positivity flag with all related negative tests
--------------------------------------------------------------------------------
2022-12-20 15:05:40 +03:00
rootNegTests :: Path Abs Dir
rootNegTests = relToProject $(mkRelDir "tests/negative/")
testNoPositivityFlag :: N.NegTest -> TestDescr
testNoPositivityFlag N.NegTest {..} =
2022-12-20 15:05:40 +03:00
let tRoot = rootNegTests <//> _relDir
file' = tRoot <//> _file
in TestDescr
{ _testName = _name,
_testRoot = tRoot,
_testAssertion = Single $ do
entryPoint <-
set entryPointNoPositivity True
<$> defaultEntryPointCwdIO file'
(void . runIO' entryPoint) upToInternal
}
negPositivityTests :: [N.NegTest]
negPositivityTests = N.negPositivityTests
testWellDefinedInductiveDefs :: [PosTest]
testWellDefinedInductiveDefs =
[ posTest
"Rose tree definition is well-defined"
$(mkRelDir "Internal/Positivity")
$(mkRelFile "RoseTree.juvix")
]
testPositivityKeyword :: [PosTest]
testPositivityKeyword =
2023-01-17 11:41:07 +03:00
[ posTest
"Mark T0 data type as strictly positive"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal/Positivity")
$(mkRelFile "E5.juvix")
]
positivityTestGroup :: TestTree
positivityTestGroup =
testGroup
"Positive tests for the positivity condition"
[ testGroup
"Bypass positivity checking using --non-positivity flag on negative tests"
(map (mkTest . testNoPositivityFlag) negPositivityTests),
testGroup
"Usages of the positive keyword"
(map (mkTest . testDescr) testPositivityKeyword),
testGroup
"Well-defined inductive definitions"
(map (mkTest . testDescr) testWellDefinedInductiveDefs)
]
--------------------------------------------------------------------------------
allTests :: TestTree
allTests =
testGroup
"Typecheck positive tests"
[ testGroup
"General typechecking tests"
(map (mkTest . testDescr) tests),
positivityTestGroup
]
2023-01-17 11:41:07 +03:00
compilationTest :: Compilation.PosTest -> PosTest
compilationTest Compilation.PosTest {..} = PosTest {..}
tests :: [PosTest]
tests =
2023-01-17 11:41:07 +03:00
[ posTest
"Simple"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "Simple.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Literal String matches any type"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "LiteralString.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Box type"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "Box.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Literal Int matches any type"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "LiteralInt.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Axiom"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "Axiom.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Inductive"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "Inductive.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Operators"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "Operators.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Holes in type signature"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "HoleInSignature.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Polymorphism and higher rank functions"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "Polymorphism.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Polymorphism and higher rank functions with explicit holes"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "PolymorphismHoles.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Implicit arguments"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "Implicit.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Simple type alias"
2022-12-20 15:05:40 +03:00
$(mkRelDir ".")
$(mkRelFile "TypeAlias.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Refine hole in type signature"
2022-12-20 15:05:40 +03:00
$(mkRelDir "272")
$(mkRelFile "M.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Pattern match a hole type"
2022-12-20 15:05:40 +03:00
$(mkRelDir "265")
$(mkRelFile "M.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Pattern match type synonym"
2022-12-20 15:05:40 +03:00
$(mkRelDir "issue1466")
$(mkRelFile "M.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Import a builtin multiple times"
2022-12-20 15:05:40 +03:00
$(mkRelDir "BuiltinsMultiImport")
$(mkRelFile "Input.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"Basic lambda functions"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "Lambda.juvix"),
2023-01-17 11:41:07 +03:00
posTest
2022-09-26 20:14:17 +03:00
"Simple mutual inference"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
$(mkRelFile "Mutual.juvix"),
2023-01-17 11:41:07 +03:00
posTest
"open import a builtin multiple times"
2022-12-20 15:05:40 +03:00
$(mkRelDir "BuiltinsMultiOpenImport")
$(mkRelFile "Input.juvix"),
2023-01-17 11:41:07 +03:00
posTest
2022-10-27 13:17:03 +03:00
"As Patterns"
2022-12-20 15:05:40 +03:00
$(mkRelDir "Internal")
2023-01-09 20:56:28 +03:00
$(mkRelFile "AsPattern.juvix"),
2023-01-17 11:41:07 +03:00
posTest
2023-01-09 20:56:28 +03:00
"Issue 1693 (Inference and higher order functions)"
$(mkRelDir "issue1693")
2023-01-10 19:31:15 +03:00
$(mkRelFile "M.juvix"),
2023-01-17 11:41:07 +03:00
posTest
2023-01-10 19:31:15 +03:00
"Issue 1704 (Type synonyms)"
$(mkRelDir "Internal")
$(mkRelFile "Synonyms.juvix"),
posTest
"Issue 1731 Trace builtin for debugging"
$(mkRelDir "issue1731")
$(mkRelFile "builtinTrace.juvix"),
posTest
"Issue 1731 Fail builtin for debugging"
$(mkRelDir "issue1731")
$(mkRelFile "builtinFail.juvix"),
posTest
"Case expressions"
$(mkRelDir "Internal")
$(mkRelFile "Case.juvix"),
posTest
"Let shadowing"
$(mkRelDir ".")
$(mkRelFile "LetShadow.juvix"),
posTest
"Type synonym inside let"
$(mkRelDir "issue1879")
$(mkRelFile "LetSynonym.juvix"),
posTest
"Mutual inference inside let"
$(mkRelDir ".")
$(mkRelFile "MutualLet.juvix"),
posTest
"Nested pattern match with type variables"
$(mkRelDir ".")
$(mkRelFile "NestedPatterns.juvix")
]
<> [ compilationTest t | t <- Compilation.tests
2023-01-17 11:41:07 +03:00
]