Repository : ssh://darcs.haskell.org//srv/darcs/testsuite On branch : master
http://hackage.haskell.org/trac/ghc/changeset/0d28d100fdceaa87ea421dc748ddd1bf99cc0f70 >--------------------------------------------------------------- commit 0d28d100fdceaa87ea421dc748ddd1bf99cc0f70 Author: Jose Pedro Magalhaes <[email protected]> Date: Fri Nov 11 14:03:20 2011 +0000 Import Constraint to use it >--------------------------------------------------------------- tests/typecheck/should_run/tcrun043.hs | 2 ++ tests/typecheck/should_run/tcrun044.hs | 1 + 2 files changed, 3 insertions(+), 0 deletions(-) diff --git a/tests/typecheck/should_run/tcrun043.hs b/tests/typecheck/should_run/tcrun043.hs index 152dba3..4a745cf 100644 --- a/tests/typecheck/should_run/tcrun043.hs +++ b/tests/typecheck/should_run/tcrun043.hs @@ -1,5 +1,7 @@ {-# LANGUAGE GADTs, TypeFamilies, ConstraintKinds #-} +import GHC.Prim ( Constraint ) + type Showish = Show f :: (Showish a) => a -> String diff --git a/tests/typecheck/should_run/tcrun044.hs b/tests/typecheck/should_run/tcrun044.hs index f39505e..029c4f9 100644 --- a/tests/typecheck/should_run/tcrun044.hs +++ b/tests/typecheck/should_run/tcrun044.hs @@ -1,6 +1,7 @@ {-# LANGUAGE TypeFamilies, ConstraintKinds #-} import qualified Data.Set as S +import GHC.Prim ( Constraint ) class RMonad m where type RMonadCtxt m a :: Constraint _______________________________________________ Cvs-ghc mailing list [email protected] http://www.haskell.org/mailman/listinfo/cvs-ghc
