[commit: ghc] ghc-7.8: Add a test for d3af980 (#5682) (1b152a6)
git at git.haskell.org
git at git.haskell.org
Thu Feb 20 12:13:42 UTC 2014
Repository : ssh://git@git.haskell.org/ghc
On branch : ghc-7.8
Link : http://ghc.haskell.org/trac/ghc/changeset/1b152a6237ce67559797379b0e77451f621dbe3e/ghc
>---------------------------------------------------------------
commit 1b152a6237ce67559797379b0e77451f621dbe3e
Author: Austin Seipp <austin at well-typed.com>
Date: Thu Feb 20 06:12:06 2014 -0600
Add a test for d3af980 (#5682)
Signed-off-by: Austin Seipp <austin at well-typed.com>
(cherry picked from commit 5a576754d745171422d13cd1dba69dd874714cf1)
>---------------------------------------------------------------
1b152a6237ce67559797379b0e77451f621dbe3e
testsuite/tests/parser/should_compile/T5682.hs | 3 ++-
1 file changed, 2 insertions(+), 1 deletion(-)
diff --git a/testsuite/tests/parser/should_compile/T5682.hs b/testsuite/tests/parser/should_compile/T5682.hs
index bfd6752..cdfe46f 100644
--- a/testsuite/tests/parser/should_compile/T5682.hs
+++ b/testsuite/tests/parser/should_compile/T5682.hs
@@ -1,4 +1,4 @@
-{-# LANGUAGE DataKinds, DeriveDataTypeable, StandaloneDeriving, TypeOperators #-}
+{-# LANGUAGE DataKinds, PolyKinds, DeriveDataTypeable, StandaloneDeriving, TypeOperators #-}
module T5682 where
@@ -10,3 +10,4 @@ data Foo = Bool :+: Bool
type X = True ':+: False
deriving instance Typeable '(:+:)
+deriving instance Typeable '(,,)
More information about the ghc-commits
mailing list