[commit: ghc] ghc-8.0: Fix T12512 (15df517)

git at git.haskell.org git at git.haskell.org
Sun Oct 2 18:53:58 UTC 2016


Repository : ssh://git@git.haskell.org/ghc

On branch  : ghc-8.0
Link       : http://ghc.haskell.org/trac/ghc/changeset/15df51703a45880a794e8d0f6327c57e368d3cb4/ghc

>---------------------------------------------------------------

commit 15df51703a45880a794e8d0f6327c57e368d3cb4
Author: Ben Gamari <ben at smart-cactus.org>
Date:   Sat Oct 1 23:19:09 2016 -0400

    Fix T12512


>---------------------------------------------------------------

15df51703a45880a794e8d0f6327c57e368d3cb4
 testsuite/tests/deriving/should_fail/T12512.hs     | 4 ----
 testsuite/tests/deriving/should_fail/T12512.stderr | 7 +------
 2 files changed, 1 insertion(+), 10 deletions(-)

diff --git a/testsuite/tests/deriving/should_fail/T12512.hs b/testsuite/tests/deriving/should_fail/T12512.hs
index 87c3d66..9b64422 100644
--- a/testsuite/tests/deriving/should_fail/T12512.hs
+++ b/testsuite/tests/deriving/should_fail/T12512.hs
@@ -1,7 +1,6 @@
 {-# LANGUAGE DataKinds #-}
 {-# LANGUAGE KindSignatures #-}
 {-# LANGUAGE StandaloneDeriving #-}
-{-# LANGUAGE UnboxedSums #-}
 {-# LANGUAGE UnboxedTuples #-}
 module T12512 where
 
@@ -9,6 +8,3 @@ import GHC.Exts
 
 class Wat1 (a :: TYPE 'UnboxedTupleRep)
 deriving instance Wat1 (# a, b #)
-
-class Wat2 (a :: TYPE 'UnboxedSumRep)
-deriving instance Wat2 (# a | b #)
diff --git a/testsuite/tests/deriving/should_fail/T12512.stderr b/testsuite/tests/deriving/should_fail/T12512.stderr
index 48f0eae..a62efc2 100644
--- a/testsuite/tests/deriving/should_fail/T12512.stderr
+++ b/testsuite/tests/deriving/should_fail/T12512.stderr
@@ -1,10 +1,5 @@
 
-T12512.hs:11:1: error:
+T12512.hs:10:1: error:
     • Can't make a derived instance of ‘Wat1 (# a, b #)’:
         The last argument of the instance cannot be an unboxed tuple
     • In the stand-alone deriving instance for ‘Wat1 (# a, b #)’
-
-T12512.hs:14:1: error:
-    • Can't make a derived instance of ‘Wat2 (# a | b #)’:
-        The last argument of the instance cannot be an unboxed sum
-    • In the stand-alone deriving instance for ‘Wat2 (# a | b #)’



More information about the ghc-commits mailing list