[Git][ghc/ghc][wip/mp-backports-batch-2] testsuite: Drop inapplicable tests

Ben Gamari (@bgamari) gitlab at gitlab.haskell.org
Fri Feb 10 06:26:38 UTC 2023



Ben Gamari pushed to branch wip/mp-backports-batch-2 at Glasgow Haskell Compiler / GHC


Commits:
f63da175 by Ben Gamari at 2023-02-10T01:25:53-05:00
testsuite: Drop inapplicable tests

These rely on TypeAbstractions, which is not implemented in 9.6.1.

- - - - -


5 changed files:

- − testsuite/tests/gadt/T19847a.hs
- − testsuite/tests/gadt/T19847a.stderr
- testsuite/tests/gadt/all.T
- − testsuite/tests/typecheck/should_compile/T21501.hs
- testsuite/tests/typecheck/should_compile/all.T


Changes:

=====================================
testsuite/tests/gadt/T19847a.hs deleted
=====================================
@@ -1,14 +0,0 @@
-{-# LANGUAGE LambdaCase, GADTs, ScopedTypeVariables, TypeAbstractions #-}
-
-module T19847a where
-
-data T a b c where
-  MkT :: forall c y x b. (x~y, c~[x], Ord x) => x -> y -> T (x,y) b c
-
-f :: forall b c. (T (Int,Int) b c -> Bool) -> (b,c)
-f = error "urk"
-
-h = f (\case { MkT @_ @_ @_ @Int p q -> True })
--- Check that the @Int argument can affect
--- the type at which `f` is instantiated
--- So h :: forall c. (Int,c)


=====================================
testsuite/tests/gadt/T19847a.stderr deleted
=====================================
@@ -1,12 +0,0 @@
-TYPE SIGNATURES
-  f :: forall b c. (T (Int, Int) b c -> Bool) -> (b, c)
-  h :: forall {c}. (Int, c)
-TYPE CONSTRUCTORS
-  data type T{4} :: forall {k}. * -> k -> * -> *
-    roles nominal nominal phantom nominal
-DATA CONSTRUCTORS
-  MkT :: forall {k} c y x (b :: k).
-         (x ~ y, c ~ [x], Ord x) =>
-         x -> y -> T (x, y) b c
-Dependent modules: []
-Dependent packages: [base-4.18.0.0]


=====================================
testsuite/tests/gadt/all.T
=====================================
@@ -127,4 +127,3 @@ test('T20485', normal, compile, [''])
 test('T20485a', normal, compile, [''])
 test('T22235', normal, compile, [''])
 test('T19847', normal, compile, [''])
-test('T19847a', normal, compile, ['-ddump-types'])


=====================================
testsuite/tests/typecheck/should_compile/T21501.hs deleted
=====================================
@@ -1,24 +0,0 @@
-{-# LANGUAGE MonoLocalBinds, PatternSynonyms, ViewPatterns, TypeAbstractions #-}
-
-module T21501 where
-
-import Data.Kind
-import Type.Reflection
-
-pattern TypeApp ::
-  forall {k1} {k2} (f :: k1 -> k2) (result :: k2).
-  Typeable f =>
-  forall (arg :: k1).
-  result ~ f arg =>
-  TypeRep arg ->
-  TypeRep result
-pattern TypeApp arg_rep <- App (eqTypeRep (typeRep @f) -> Just HRefl) arg_rep
-
-f :: TypeRep (a :: Type) -> String
-f (TypeApp @[] rep) = show rep
-
-{- Expected type: TypeRep k (a::k)
-   Instantiate at k10 k20 (f0 :: k10 -> k20) (result0 :: k20)
-   Unify (TypeRep k (a::k) ~ TypeRep k20 (result :: k20)
-   Unify f0 ~ []
--}


=====================================
testsuite/tests/typecheck/should_compile/all.T
=====================================
@@ -858,4 +858,3 @@ test('T22516', normal, compile, [''])
 test('T22647', normal, compile, [''])
 test('T19577', normal, compile, [''])
 test('T22383', normal, compile, [''])
-test('T21501', normal, compile, [''])



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/f63da175da1f4196d9beab6571998fdd444835d4

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/f63da175da1f4196d9beab6571998fdd444835d4
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20230210/c574daff/attachment-0001.html>


More information about the ghc-commits mailing list