Repository : ssh://darcs.haskell.org//srv/darcs/testsuite On branch : master
http://hackage.haskell.org/trac/ghc/changeset/521472f1e038f82d54f5068646763b1425260d9c >--------------------------------------------------------------- commit 521472f1e038f82d54f5068646763b1425260d9c Author: Simon Peyton Jones <simo...@microsoft.com> Date: Wed Oct 31 09:11:25 2012 +0000 Use 'error "uk"' rather than 'undefined' 'error' hsa a magical type with openTypeKind, whereas undefined doesn't >--------------------------------------------------------------- tests/indexed-types/should_compile/Simple14.hs | 6 +++--- tests/indexed-types/should_fail/T3330a.hs | 4 ++-- tests/typecheck/should_compile/T2683.hs | 4 ++-- 3 files changed, 7 insertions(+), 7 deletions(-) diff --git a/tests/indexed-types/should_compile/Simple14.hs b/tests/indexed-types/should_compile/Simple14.hs index 16158d9..dfffbc7 100644 --- a/tests/indexed-types/should_compile/Simple14.hs +++ b/tests/indexed-types/should_compile/Simple14.hs @@ -5,13 +5,13 @@ module Simple14 where data EQ_ x y = EQ_ eqE :: EQ_ x y -> (x~y => EQ_ z z) -> p -eqE = undefined +eqE = error "eqE" eqI :: EQ_ x x -eqI = undefined +eqI = error "eqI" ntI :: (forall p. EQ_ x y -> p) -> EQ_ x y -ntI = undefined +ntI = error "ntI" foo :: forall m n. EQ_ (Maybe m) (Maybe n) foo = ntI (`eqE` (eqI :: EQ_ m n)) diff --git a/tests/indexed-types/should_fail/T3330a.hs b/tests/indexed-types/should_fail/T3330a.hs index c13760c..e0b359a 100644 --- a/tests/indexed-types/should_fail/T3330a.hs +++ b/tests/indexed-types/should_fail/T3330a.hs @@ -19,9 +19,9 @@ children :: s ix -> (PF s) r ix -> [AnyF s] children p x = execWriter (hmapM p collect x) collect :: HFunctor (PF s) => s ix -> r ix -> Writer [AnyF s] (r ix) -collect = undefined +collect = error "collect" hmapM :: (forall ix. phi ix -> r ix -> m (r' ix)) -> phi ix -> f r ix -> m (f r' ix) -hmapM = undefined +hmapM = error "hmapM" diff --git a/tests/typecheck/should_compile/T2683.hs b/tests/typecheck/should_compile/T2683.hs index c36eaad..07fad17 100644 --- a/tests/typecheck/should_compile/T2683.hs +++ b/tests/typecheck/should_compile/T2683.hs @@ -9,10 +9,10 @@ class Transformer t a | t -> a where data EL a = forall l. EL (l a) unEL :: EL a -> (forall l. l a -> b) -> b -unEL = undefined +unEL = error "unEL" transform' :: (Transformer t a) => t -> EL a -> EL a -transform' = undefined +transform' = error "transform'" data MultiToggleS ts a = MultiToggleS ts _______________________________________________ Cvs-ghc mailing list Cvs-ghc@haskell.org http://www.haskell.org/mailman/listinfo/cvs-ghc