[commit: testsuite] master: Update spec001 for new Typeable, and disable AMP warning (2cca7e2)

git at git.haskell.org git at git.haskell.org
Mon Sep 30 13:01:13 CEST 2013


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

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/2cca7e27ad1393087b9f188a493927a07f0bcdb3/testsuite

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

commit 2cca7e27ad1393087b9f188a493927a07f0bcdb3
Author: Reid Barton <rwbarton at gmail.com>
Date:   Sun Sep 29 18:42:35 2013 -0400

    Update spec001 for new Typeable, and disable AMP warning
    
    I'd like to just "import Prelude hiding (..., join)", but the
    patch to make that turn off the warning hasn't been merged yet.


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

2cca7e27ad1393087b9f188a493927a07f0bcdb3
 tests/simplCore/should_compile/spec001.hs |    4 ++--
 1 file changed, 2 insertions(+), 2 deletions(-)

diff --git a/tests/simplCore/should_compile/spec001.hs b/tests/simplCore/should_compile/spec001.hs
index 0abfd6a..0afdaf4 100644
--- a/tests/simplCore/should_compile/spec001.hs
+++ b/tests/simplCore/should_compile/spec001.hs
@@ -1,5 +1,6 @@
 {-# LANGUAGE CPP, UnboxedTuples, MagicHash, StandaloneDeriving, DeriveDataTypeable #-}
 {-# OPTIONS_GHC -O #-}
+{-# OPTIONS_GHC -fno-warn-amp #-}
 
 -- In GHC 6.4, compiling this module gave a Core Lint failure following the
 -- specialier, because a function was floated out that had a RULE that
@@ -136,8 +137,7 @@ comparePS (PS off1 len1 fp1) (PS off2 len2 fp2)
 instance Show PackedString where
     showsPrec p ps r = showsPrec p (unpack ps) r
 
-#include "Typeable.h"
-INSTANCE_TYPEABLE0(PackedString,packedStringTc,"PackedString")
+deriving instance Typeable PackedString
 
 -- -----------------------------------------------------------------------------
 -- Constructor functions




More information about the ghc-commits mailing list