summaryrefslogtreecommitdiff
path: root/testsuite/tests/typecheck
diff options
context:
space:
mode:
authorMatthew Pickering <matthewtpickering@gmail.com>2021-12-08 16:56:15 +0000
committerMarge Bot <ben+marge-bot@smart-cactus.org>2021-12-22 14:47:40 -0500
commit3ed909118126a93f03ef17fed52eaf602b91ae1b (patch)
tree669ce30095f26b440cab35daf006b102a4c7c48f /testsuite/tests/typecheck
parent09b6cb45505c2c32ddaffcdb930fb3f7873b2cfc (diff)
downloadhaskell-3ed909118126a93f03ef17fed52eaf602b91ae1b.tar.gz
testsuite: Remove reqlib modifier
The reqlib modifer was supposed to indicate that a test needed a certain library in order to work. If the library happened to be installed then the test would run as normal. However, CI has never run these tests as the packages have not been installed and we don't want out tests to depend on things which might get externally broken by updating the compiler. The new strategy is to run these tests in head.hackage, where the tests have been cabalised as well as possible. Some tests couldn't be transferred into the normal style testsuite but it's better than never running any of the reqlib tests. https://gitlab.haskell.org/ghc/head.hackage/-/merge_requests/169 A few submodules also had reqlib tests and have been updated to remove it. Closes #16264 #20032 #17764 #16561
Diffstat (limited to 'testsuite/tests/typecheck')
-rw-r--r--testsuite/tests/typecheck/should_compile/T12926.hs36
-rw-r--r--testsuite/tests/typecheck/should_compile/all.T3
-rw-r--r--testsuite/tests/typecheck/should_compile/tc191.hs29
-rw-r--r--testsuite/tests/typecheck/should_compile/tc220.hs26
4 files changed, 0 insertions, 94 deletions
diff --git a/testsuite/tests/typecheck/should_compile/T12926.hs b/testsuite/tests/typecheck/should_compile/T12926.hs
deleted file mode 100644
index a642e67053..0000000000
--- a/testsuite/tests/typecheck/should_compile/T12926.hs
+++ /dev/null
@@ -1,36 +0,0 @@
-{-# LANGUAGE TypeFamilies #-}
-{-# LANGUAGE MultiParamTypeClasses #-}
-
-module A where
-
-import GHC.Base
-import qualified Data.Vector.Unboxed.Base
-import qualified Data.Vector.Generic.Base
-import Data.Vector.Generic.Mutable
-import qualified Data.Vector.Generic.Mutable.Base
-import Data.Vector.Generic (fromList)
-
-data A = A Int Int Int
-
-instance Data.Vector.Unboxed.Base.Unbox A
-
-newtype instance Data.Vector.Unboxed.Base.MVector s_a4iX A
- = MV_A (Data.Vector.Unboxed.Base.MVector s_a4iX (Int, Int, Int))
-
-instance MVector Data.Vector.Unboxed.Base.MVector A where
- basicLength (MV_A v) =
- basicLength v
- basicUnsafeSlice idx len (MV_A v) =
- MV_A (basicUnsafeSlice idx len v)
- basicUnsafeNew len =
- MV_A `liftM` (basicUnsafeNew len)
- basicUnsafeWrite (MV_A v) idx val_a4iW =
- basicUnsafeWrite v idx ((\ (A a_a4iT b_a4iU c_a4iV) -> (a_a4iT, b_a4iU, c_a4iV)) val_a4iW)
-
-newtype instance Data.Vector.Unboxed.Base.Vector A =
- V_A (Data.Vector.Unboxed.Base.Vector (Int, Int, Int))
-
-instance Data.Vector.Generic.Base.Vector Data.Vector.Unboxed.Base.Vector A where
-
-mkA :: Data.Vector.Unboxed.Base.Vector A
-mkA = fromList []
diff --git a/testsuite/tests/typecheck/should_compile/all.T b/testsuite/tests/typecheck/should_compile/all.T
index 74fa4f0da8..a3c89c0ab0 100644
--- a/testsuite/tests/typecheck/should_compile/all.T
+++ b/testsuite/tests/typecheck/should_compile/all.T
@@ -196,7 +196,6 @@ test('tc187', normal, compile, [''])
test('tc188', normal, compile, [''])
test('tc189', normal, compile, [''])
test('tc190', normal, compile, [''])
-test('tc191', reqlib('syb'), compile, [''])
test('tc192', normal, compile, [''])
test('tc193', normal, compile, [''])
test('tc194', normal, compile, [''])
@@ -228,7 +227,6 @@ test('tc216', normal, compile, [''])
test('tc217', normal, compile, [''])
test('tc218', normal, compile, [''])
test('tc219', normal, compile, [''])
-test('tc220', [reqlib('syb')], compile, [''])
test('tc221', normal, compile, [''])
test('tc222', normal, compile, [''])
test('tc223', normal, compile, [''])
@@ -711,7 +709,6 @@ test('T17343', exit_code(1), compile_and_run, [''])
test('T17566', [extra_files(['T17566a.hs'])], makefile_test, [])
test('T12760', unless(compiler_debugged(), skip), compile, ['-O'])
test('T13142', normal, compile, ['-O2'])
-test('T12926', reqlib('vector'), compile, ['-O2'])
test('T17710', normal, compile, [''])
test('T17792', normal, compile, [''])
test('T17024', normal, compile, [''])
diff --git a/testsuite/tests/typecheck/should_compile/tc191.hs b/testsuite/tests/typecheck/should_compile/tc191.hs
deleted file mode 100644
index c7a7c3e4c6..0000000000
--- a/testsuite/tests/typecheck/should_compile/tc191.hs
+++ /dev/null
@@ -1,29 +0,0 @@
-{-# LANGUAGE RankNTypes #-}
-
--- This only typechecks if forall-hoisting works ok when
--- importing from an interface file. The type of Twins.gzipWithQ
--- is this:
--- type GenericQ r = forall a. Data a => a -> r
--- gzipWithQ :: GenericQ (GenericQ r) -> GenericQ (GenericQ [r])
--- It's kept this way in the interface file for brevity and documentation,
--- but when the type synonym is expanded, the foralls need expanding
-
-module Foo where
-
-import Data.Generics.Basics
-import Data.Generics.Aliases
-import Data.Generics.Twins(gzipWithQ)
-
--- | Generic equality: an alternative to \deriving Eq\
-geq :: Data a => a -> a -> Bool
-geq x y = geq' x y
- where
--- This type signature no longer works, because it is
--- insufficiently polymorphic.
--- geq' :: forall a b. (Data a, Data b) => a -> b -> Bool
- geq' :: GenericQ (GenericQ Bool)
- geq' x y = (toConstr x == toConstr y)
- && and (gzipWithQ geq' x y)
-
-
-
diff --git a/testsuite/tests/typecheck/should_compile/tc220.hs b/testsuite/tests/typecheck/should_compile/tc220.hs
deleted file mode 100644
index 7c87742ba6..0000000000
--- a/testsuite/tests/typecheck/should_compile/tc220.hs
+++ /dev/null
@@ -1,26 +0,0 @@
-{-# LANGUAGE DeriveDataTypeable #-}
-
--- See #1033
-
-module Pointful' where
-
-import Data.Generics
-import Control.Monad.State
-
-data HsExp = HsWildCard deriving( Typeable, Data )
-data HsName = HsName deriving( Typeable, Data )
-
--- rename :: () -> HsExp -> State (HsName, [HsName]) HsExp
--- Type sig commented out
-rename1 = \_ -> everywhereM (mkM (\e -> case e of HsWildCard -> return e))
-
-rename2 _ = everywhereM (mkM (\e -> case e of HsWildCard -> return e))
-
-uncomb1 :: State (HsName, [HsName]) HsExp
-uncomb1 = rename1 () undefined
-
-uncomb2 :: State (HsName, [HsName]) HsExp
-uncomb2 = rename2 () undefined
-
-
-