[commit: ghc] wip/ttypeable: testsuite/TypeRep: Add test for #12409 (4c17891)

git at git.haskell.org git at git.haskell.org
Sun Jan 29 20:20:01 UTC 2017


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

On branch  : wip/ttypeable
Link       : http://ghc.haskell.org/trac/ghc/changeset/4c178916f5b4a608e321b39256f44955d98a337a/ghc

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

commit 4c178916f5b4a608e321b39256f44955d98a337a
Author: Ben Gamari <ben at smart-cactus.org>
Date:   Tue Jul 19 10:57:48 2016 +0200

    testsuite/TypeRep: Add test for #12409


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

4c178916f5b4a608e321b39256f44955d98a337a
 testsuite/tests/typecheck/should_run/TypeRep.hs | 12 +++++++++++-
 1 file changed, 11 insertions(+), 1 deletion(-)

diff --git a/testsuite/tests/typecheck/should_run/TypeRep.hs b/testsuite/tests/typecheck/should_run/TypeRep.hs
index 5fbf909..002e4fb 100644
--- a/testsuite/tests/typecheck/should_run/TypeRep.hs
+++ b/testsuite/tests/typecheck/should_run/TypeRep.hs
@@ -1,5 +1,9 @@
 {-# LANGUAGE DataKinds #-}
+{-# LANGUAGE KindSignatures #-}
+{-# LANGUAGE ConstraintKinds #-}
 {-# LANGUAGE TypeInType #-}
+{-# LANGUAGE UnboxedTuples #-}
+{-# LANGUAGE MagicHash #-}
 {-# LANGUAGE TypeApplications #-}
 {-# LANGUAGE ScopedTypeVariables #-}
 {-# LANGUAGE AllowAmbiguousTypes #-}
@@ -30,6 +34,12 @@ main = do
   print $ rep @Bool
   print $ rep @Ordering
   print $ rep @(Int -> Int)
+  print $ rep @((Eq Int, Eq String) :: Constraint)
+
+  -- Unboxed things (#12049)
+  print $ rep @Int#
+  print $ rep @(##)
+  print $ rep @(# Int#, Int #)
 
   -- Various instantiations of a kind-polymorphic type
   print $ rep @(Proxy (Eq Int))
@@ -45,4 +55,4 @@ main = do
   print $ rep @(Proxy 'LiftedRep)
 
   -- Something lifted and primitive
-  print $ rep @RealWorld
+  print $ rep @RealWorld  -- #12132



More information about the ghc-commits mailing list