[commit: testsuite] master: spelling (97ff37d)

Gabor Greif ggreif at gmail.com
Sat Feb 2 01:01:51 CET 2013


Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/97ff37de2bc40994b21a4c4011f587b0973d3090

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

commit 97ff37de2bc40994b21a4c4011f587b0973d3090
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri Feb 1 14:52:06 2013 +0100

    spelling

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

 tests/codeGen/should_run/cgrun055.hs               |    2 +-
 tests/gadt/gadt-escape1.hs                         |    2 +-
 .../haddockSimplUtilsBug.hs                        |    2 +-
 tests/simplCore/should_run/simplrun004.hs          |    2 +-
 tests/typecheck/should_compile/tc167.hs            |    2 +-
 tests/typecheck/should_fail/tcfail032.hs           |    2 +-
 tests/typecheck/should_fail/tcfail132.hs           |    2 +-
 tests/typecheck/should_fail/tcfail181.hs           |    2 +-
 8 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/tests/codeGen/should_run/cgrun055.hs b/tests/codeGen/should_run/cgrun055.hs
index 7376327..f824e1b 100644
--- a/tests/codeGen/should_run/cgrun055.hs
+++ b/tests/codeGen/should_run/cgrun055.hs
@@ -1,4 +1,4 @@
--- This program broke GHC 6.3, becuase dataToTag was called with
+-- This program broke GHC 6.3, because dataToTag was called with
 -- an unevaluated argument
 
 module Main where
diff --git a/tests/gadt/gadt-escape1.hs b/tests/gadt/gadt-escape1.hs
index d90d6a9..05579f9 100644
--- a/tests/gadt/gadt-escape1.hs
+++ b/tests/gadt/gadt-escape1.hs
@@ -10,7 +10,7 @@ data Hidden = forall t . Hidden (ExpGADT t) (ExpGADT t)
 hval = Hidden (ExpInt 0) (ExpInt 1)
 
 -- With the type sig this is ok, but without it maybe
--- should be rejected becuase the result type is wobbly
+-- should be rejected because the result type is wobbly
 --    weird1 :: ExpGADT Int
 --
 -- And indeed it is rejected by GHC 7.8 because OutsideIn
diff --git a/tests/haddock/should_compile_noflag_haddock/haddockSimplUtilsBug.hs b/tests/haddock/should_compile_noflag_haddock/haddockSimplUtilsBug.hs
index a62020f..2f5e9ca 100644
--- a/tests/haddock/should_compile_noflag_haddock/haddockSimplUtilsBug.hs
+++ b/tests/haddock/should_compile_noflag_haddock/haddockSimplUtilsBug.hs
@@ -4,7 +4,7 @@ postInlineUnconditionally
   = case Just "Hey" of
 	-- The point of examining occ_info here is that for *non-values* 
 	-- that occur outside a lambda, the call-site inliner won't have
-	-- a chance (becuase it doesn't know that the thing
+	-- a chance (because it doesn't know that the thing
 	-- only occurs once).   The pre-inliner won't have gotten
 	-- it either, if the thing occurs in more than one branch
 	-- So the main target is things like
diff --git a/tests/simplCore/should_run/simplrun004.hs b/tests/simplCore/should_run/simplrun004.hs
index 16e7566..e76274f 100644
--- a/tests/simplCore/should_run/simplrun004.hs
+++ b/tests/simplCore/should_run/simplrun004.hs
@@ -23,7 +23,7 @@ sucW = gen_sucW (\ g x -> map (+x) [fst g..snd g]) f (11,500000)
 
 main = print (sum $ sucW 11,sum $ sucW 12)
 
--- Becuase this version uses a case expression, the bug 
+-- Because this version uses a case expression, the bug 
 -- doesn't happen and execution is much faster
 gen_sucC grow c g = case c g of 
            check -> \ x -> grow g x >>= \ y -> do guard $ check y; return y
diff --git a/tests/typecheck/should_compile/tc167.hs b/tests/typecheck/should_compile/tc167.hs
index b317763..cadb1a7 100644
--- a/tests/typecheck/should_compile/tc167.hs
+++ b/tests/typecheck/should_compile/tc167.hs
@@ -17,7 +17,7 @@ f x = x
 -- You might think that (->) should have type (? -> ? -> *), and you'd be right
 -- But if we do that we get kind errors when saying
 --	instance Control.Arrow (->)
--- becuase the expected kind is (*->*->*).  The trouble is that the
+-- because the expected kind is (*->*->*).  The trouble is that the
 -- expected/actual stuff in the unifier does not go contra-variant, whereas
 -- the kind sub-typing does.  Sigh.  It really only matters if you use (->) in
 -- a prefix way, thus:  (->) Int# Int#.  And this is unusual.
diff --git a/tests/typecheck/should_fail/tcfail032.hs b/tests/typecheck/should_fail/tcfail032.hs
index 5950064..8c6bdd4 100644
--- a/tests/typecheck/should_fail/tcfail032.hs
+++ b/tests/typecheck/should_fail/tcfail032.hs
@@ -6,7 +6,7 @@
 
 It *is* an error, because x does not have the polytype 
 	forall a. Eq a => a -> Int
-becuase it is monomorphic, but the error message isn't very illuminating.
+because it is monomorphic, but the error message isn't very illuminating.
 -}
 
 module ShouldFail where
diff --git a/tests/typecheck/should_fail/tcfail132.hs b/tests/typecheck/should_fail/tcfail132.hs
index cc933dc..dd8d644 100644
--- a/tests/typecheck/should_fail/tcfail132.hs
+++ b/tests/typecheck/should_fail/tcfail132.hs
@@ -4,7 +4,7 @@
 --    Kind error: Expecting kind `k_a1JA -> k_a1JE -> k_a1JI -> *',
 --	          but `DUnit t' has kind `k_a1JA -> k_a1JE -> *'
 --
--- as we couldn't tidy kinds, becuase they didn't have OccNames.
+-- as we couldn't tidy kinds, because they didn't have OccNames.
 -- This test recalls the bad error message.
 
 module ShouldFail where
diff --git a/tests/typecheck/should_fail/tcfail181.hs b/tests/typecheck/should_fail/tcfail181.hs
index 01d0659..ca96a2c 100644
--- a/tests/typecheck/should_fail/tcfail181.hs
+++ b/tests/typecheck/should_fail/tcfail181.hs
@@ -4,7 +4,7 @@
 --	     (Monad GHC.Prim.Any1, Monad m) =>
 --	     t -> Something (m Bool) e
 --
--- The stupid 'GHC.Prim.Any1' arose becuase of type ambiguity
+-- The stupid 'GHC.Prim.Any1' arose because of type ambiguity
 -- which should be reported, and wasn't.
 
 module ShouldFail where





More information about the ghc-commits mailing list