summaryrefslogtreecommitdiff
path: root/testsuite/tests/codeGen/should_fail
diff options
context:
space:
mode:
Diffstat (limited to 'testsuite/tests/codeGen/should_fail')
-rw-r--r--testsuite/tests/codeGen/should_fail/T13233.hs22
-rw-r--r--testsuite/tests/codeGen/should_fail/T13233.stderr22
-rw-r--r--testsuite/tests/codeGen/should_fail/T13233_elab.hs25
-rw-r--r--testsuite/tests/codeGen/should_fail/T13233_elab.stderr14
-rw-r--r--testsuite/tests/codeGen/should_fail/all.T3
5 files changed, 1 insertions, 85 deletions
diff --git a/testsuite/tests/codeGen/should_fail/T13233.hs b/testsuite/tests/codeGen/should_fail/T13233.hs
deleted file mode 100644
index c4c0480a75..0000000000
--- a/testsuite/tests/codeGen/should_fail/T13233.hs
+++ /dev/null
@@ -1,22 +0,0 @@
-{-# LANGUAGE ScopedTypeVariables #-}
-{-# LANGUAGE PolyKinds #-}
-{-# LANGUAGE UnboxedTuples #-}
-{-# LANGUAGE RankNTypes #-}
-{-# LANGUAGE MagicHash #-}
-module Bug where
-
-import GHC.Exts ( TYPE, RuntimeRep )
-
-class Foo (a :: TYPE rep) where
- bar :: forall rep2 (b :: TYPE rep2). (a -> a -> b) -> a -> a -> b
-
-baz :: forall rep (a :: TYPE rep). Foo a => a -> a -> (# a, a #)
-baz = bar (#,#)
-
-obscure :: (forall (rep1 :: RuntimeRep) (rep2 :: RuntimeRep)
- (a :: TYPE rep1) (b :: TYPE rep2).
- a -> b -> (# a, b #)) -> ()
-obscure _ = ()
-
-quux :: ()
-quux = obscure (#,#)
diff --git a/testsuite/tests/codeGen/should_fail/T13233.stderr b/testsuite/tests/codeGen/should_fail/T13233.stderr
deleted file mode 100644
index a00ccd536a..0000000000
--- a/testsuite/tests/codeGen/should_fail/T13233.stderr
+++ /dev/null
@@ -1,22 +0,0 @@
-
-T13233.hs:14:11: error:
- Cannot use function with representation-polymorphic arguments:
- (#,#) :: a -> a -> (# a, a #)
- (Note that representation-polymorphic primops,
- such as 'coerce' and unboxed tuples, are eta-expanded
- internally because they must occur fully saturated.
- Use -fprint-typechecker-elaboration to display the full expression.)
- Representation-polymorphic arguments:
- a :: TYPE rep
- a :: TYPE rep
-
-T13233.hs:22:16: error:
- Cannot use function with representation-polymorphic arguments:
- (#,#) :: a -> b -> (# a, b #)
- (Note that representation-polymorphic primops,
- such as 'coerce' and unboxed tuples, are eta-expanded
- internally because they must occur fully saturated.
- Use -fprint-typechecker-elaboration to display the full expression.)
- Representation-polymorphic arguments:
- a :: TYPE rep1
- b :: TYPE rep2
diff --git a/testsuite/tests/codeGen/should_fail/T13233_elab.hs b/testsuite/tests/codeGen/should_fail/T13233_elab.hs
deleted file mode 100644
index 96adc5ff9a..0000000000
--- a/testsuite/tests/codeGen/should_fail/T13233_elab.hs
+++ /dev/null
@@ -1,25 +0,0 @@
--- Same as T13233, but we compile with -fprint-typechecker-elaboration.
--- The error message should show an eta-expanded call to (#,#).
--- See comments at https://gitlab.haskell.org/ghc/ghc/merge_requests/2540
-{-# LANGUAGE ScopedTypeVariables #-}
-{-# LANGUAGE PolyKinds #-}
-{-# LANGUAGE UnboxedTuples #-}
-{-# LANGUAGE RankNTypes #-}
-{-# LANGUAGE MagicHash #-}
-module Bug where
-
-import GHC.Exts ( TYPE, RuntimeRep )
-
-class Foo (a :: TYPE rep) where
- bar :: forall rep2 (b :: TYPE rep2). (a -> a -> b) -> a -> a -> b
-
-baz :: forall rep (a :: TYPE rep). Foo a => a -> a -> (# a, a #)
-baz = bar (#,#)
-
-obscure :: (forall (rep1 :: RuntimeRep) (rep2 :: RuntimeRep)
- (a :: TYPE rep1) (b :: TYPE rep2).
- a -> b -> (# a, b #)) -> ()
-obscure _ = ()
-
-quux :: ()
-quux = obscure (#,#)
diff --git a/testsuite/tests/codeGen/should_fail/T13233_elab.stderr b/testsuite/tests/codeGen/should_fail/T13233_elab.stderr
deleted file mode 100644
index 6242873514..0000000000
--- a/testsuite/tests/codeGen/should_fail/T13233_elab.stderr
+++ /dev/null
@@ -1,14 +0,0 @@
-
-T13233_elab.hs:17:11: error:
- Cannot use function with representation-polymorphic arguments:
- (#,#) @rep @rep @a @a :: a -> a -> (# a, a #)
- Representation-polymorphic arguments:
- a :: TYPE rep
- a :: TYPE rep
-
-T13233_elab.hs:25:16: error:
- Cannot use function with representation-polymorphic arguments:
- (#,#) @rep1 @rep2 @a @b :: a -> b -> (# a, b #)
- Representation-polymorphic arguments:
- a :: TYPE rep1
- b :: TYPE rep2
diff --git a/testsuite/tests/codeGen/should_fail/all.T b/testsuite/tests/codeGen/should_fail/all.T
index 970c1577ca..67015e46a8 100644
--- a/testsuite/tests/codeGen/should_fail/all.T
+++ b/testsuite/tests/codeGen/should_fail/all.T
@@ -3,5 +3,4 @@
# Only the LLVM code generator consistently forces the alignment of
# memcpy operations
test('T8131', [cmm_src, only_ways(llvm_ways)], compile_fail, ['-no-hs-main'])
-test('T13233', normal, compile_fail, [''])
-test('T13233_elab', normal, compile_fail, ['-fprint-typechecker-elaboration'])
+