summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
-rw-r--r--compiler/coreSyn/CoreLint.hs2
-rw-r--r--compiler/coreSyn/CoreUnfold.hs4
-rw-r--r--compiler/llvmGen/LlvmCodeGen/CodeGen.hs2
-rw-r--r--compiler/main/DynFlags.hs2
-rw-r--r--compiler/parser/Parser.y2
-rw-r--r--compiler/specialise/Specialise.hs2
-rw-r--r--compiler/typecheck/TcSplice.hs2
-rw-r--r--compiler/utils/Outputable.hs2
-rw-r--r--libraries/base/GHC/Event/EPoll.hsc2
-rw-r--r--libraries/base/cbits/primFloat.c2
-rw-r--r--libraries/template-haskell/Language/Haskell/TH/Syntax.hs2
-rw-r--r--testsuite/tests/programs/galois_raytrace/Data.hs2
-rw-r--r--testsuite/tests/programs/galois_raytrace/Eval.hs2
-rw-r--r--testsuite/tests/rename/should_fail/T9177.hs2
-rw-r--r--testsuite/tests/simplCore/should_compile/spec001.hs2
15 files changed, 16 insertions, 16 deletions
diff --git a/compiler/coreSyn/CoreLint.hs b/compiler/coreSyn/CoreLint.hs
index b00e1ac141..5bf2d4f1d2 100644
--- a/compiler/coreSyn/CoreLint.hs
+++ b/compiler/coreSyn/CoreLint.hs
@@ -522,7 +522,7 @@ lintIdUnfolding bndr bndr_ty (CoreUnfolding { uf_tmpl = rhs, uf_src = src })
= do { ty <- lintCoreExpr rhs
; checkTys bndr_ty ty (mkRhsMsg bndr (ptext (sLit "unfolding")) ty) }
lintIdUnfolding _ _ _
- = return () -- Do not Lint unstable unfoldings, becuase that leads
+ = return () -- Do not Lint unstable unfoldings, because that leads
-- to exponential behaviour; c.f. CoreFVs.idUnfoldingVars
{-
diff --git a/compiler/coreSyn/CoreUnfold.hs b/compiler/coreSyn/CoreUnfold.hs
index 3a54b2773e..91dbed9ecb 100644
--- a/compiler/coreSyn/CoreUnfold.hs
+++ b/compiler/coreSyn/CoreUnfold.hs
@@ -715,7 +715,7 @@ of extra incentive we give a discount of 10*(1 + n_val_args).
Simon M tried a MUCH bigger discount: (10 * (10 + n_val_args)),
and said it was an "unambiguous win", but its terribly dangerous
-because a fuction with many many case branches, each finishing with
+because a function with many many case branches, each finishing with
a constructor, can have an arbitrarily large discount. This led to
terrible code bloat: see Trac #6099.
@@ -1003,7 +1003,7 @@ nonTriv _ = True
data CallCtxt
= BoringCtxt
| RhsCtxt -- Rhs of a let-binding; see Note [RHS of lets]
- | DiscArgCtxt -- Argument of a fuction with non-zero arg discount
+ | DiscArgCtxt -- Argument of a function with non-zero arg discount
| RuleArgCtxt -- We are somewhere in the argument of a function with rules
| ValAppCtxt -- We're applied to at least one value arg
diff --git a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
index 517da53cab..9896c4040a 100644
--- a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
+++ b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
@@ -297,7 +297,7 @@ genCall (PrimTarget (MO_U_Mul2 w)) [dstH, dstL] [lhs, rhs] = do
-- MO_U_QuotRem2 is another case we handle by widening the registers to double
-- the width and use normal LLVM instructions (similarly to the MO_U_Mul2). The
--- main difference here is that we need to conmbine two words into one register
+-- main difference here is that we need to combine two words into one register
-- and then use both 'udiv' and 'urem' instructions to compute the result.
genCall (PrimTarget (MO_U_QuotRem2 w)) [dstQ, dstR] [lhsH, lhsL, rhs] = run $ do
let width = widthToLlvmInt w
diff --git a/compiler/main/DynFlags.hs b/compiler/main/DynFlags.hs
index 35e5dc5fc5..c94c6d9567 100644
--- a/compiler/main/DynFlags.hs
+++ b/compiler/main/DynFlags.hs
@@ -1562,7 +1562,7 @@ defaultDynFlags mySettings =
ufCreationThreshold = 750,
ufUseThreshold = 60,
ufFunAppDiscount = 60,
- -- Be fairly keen to inline a fuction if that means
+ -- Be fairly keen to inline a function if that means
-- we'll be able to pick the right method from a dictionary
ufDictDiscount = 30,
ufKeenessFactor = 1.5,
diff --git a/compiler/parser/Parser.y b/compiler/parser/Parser.y
index 7518951ac1..1cfe491461 100644
--- a/compiler/parser/Parser.y
+++ b/compiler/parser/Parser.y
@@ -2826,7 +2826,7 @@ oqtycon_no_varcon :: { Located RdrName } -- Type constructor which cannot be mi
{- Note [Type constructors in export list]
~~~~~~~~~~~~~~~~~~~~~
Mixing type constructors and variable constructors in export lists introduces
-ambiguity in grammar: e.g. (*) may be both a type constuctor and a function.
+ambiguity in grammar: e.g. (*) may be both a type constructor and a function.
-XExplicitNamespaces allows to disambiguate by explicitly prefixing type
constructors with 'type' keyword.
diff --git a/compiler/specialise/Specialise.hs b/compiler/specialise/Specialise.hs
index fe9cba6291..6f22ed466c 100644
--- a/compiler/specialise/Specialise.hs
+++ b/compiler/specialise/Specialise.hs
@@ -1190,7 +1190,7 @@ specCalls mb_mod env rules_for_me calls_for_me fn rhs
= ASSERT( call_ts `lengthIs` n_tyvars && call_ds `lengthIs` n_dicts )
-- Suppose f's defn is f = /\ a b c -> \ d1 d2 -> rhs
- -- Supppose the call is for f [Just t1, Nothing, Just t3] [dx1, dx2]
+ -- Suppose the call is for f [Just t1, Nothing, Just t3] [dx1, dx2]
-- Construct the new binding
-- f1 = SUBST[a->t1,c->t3, d1->d1', d2->d2'] (/\ b -> rhs)
diff --git a/compiler/typecheck/TcSplice.hs b/compiler/typecheck/TcSplice.hs
index 4a414a2d43..faebecd525 100644
--- a/compiler/typecheck/TcSplice.hs
+++ b/compiler/typecheck/TcSplice.hs
@@ -703,7 +703,7 @@ runMeta' show_code ppr_hs run_and_convert expr
{-
Note [Exceptions in TH]
~~~~~~~~~~~~~~~~~~~~~~~
-Supppose we have something like this
+Suppose we have something like this
$( f 4 )
where
f :: Int -> Q [Dec]
diff --git a/compiler/utils/Outputable.hs b/compiler/utils/Outputable.hs
index 2bed1d1e4f..86ac85e31f 100644
--- a/compiler/utils/Outputable.hs
+++ b/compiler/utils/Outputable.hs
@@ -160,7 +160,7 @@ data PrintUnqualified = QueryQualify {
-- | given an /original/ name, this function tells you which module
-- name it should be qualified with when printing for the user, if
-- any. For example, given @Control.Exception.catch@, which is in scope
--- as @Exception.catch@, this fuction will return @Just "Exception"@.
+-- as @Exception.catch@, this function will return @Just "Exception"@.
-- Note that the return value is a ModuleName, not a Module, because
-- in source code, names are qualified by ModuleNames.
type QueryQualifyName = Module -> OccName -> QualifyName
diff --git a/libraries/base/GHC/Event/EPoll.hsc b/libraries/base/GHC/Event/EPoll.hsc
index b8861c41f1..2cffb00931 100644
--- a/libraries/base/GHC/Event/EPoll.hsc
+++ b/libraries/base/GHC/Event/EPoll.hsc
@@ -115,7 +115,7 @@ poll ep mtimeout f = do
let events = epollEvents ep
fd = epollFd ep
- -- Will return zero if the system call was interupted, in which case
+ -- Will return zero if the system call was interrupted, in which case
-- we just return (and try again later.)
n <- A.unsafeLoad events $ \es cap -> case mtimeout of
Just timeout -> epollWait fd es cap $ fromTimeout timeout
diff --git a/libraries/base/cbits/primFloat.c b/libraries/base/cbits/primFloat.c
index 7ac03202f9..4bee4d0ded 100644
--- a/libraries/base/cbits/primFloat.c
+++ b/libraries/base/cbits/primFloat.c
@@ -108,7 +108,7 @@ union stg_ieee754_dbl
* Predicates for testing for extreme IEEE fp values.
*/
-/* In case you don't suppport IEEE, you'll just get dummy defs.. */
+/* In case you don't support IEEE, you'll just get dummy defs.. */
#ifdef IEEE_FLOATING_POINT
HsInt
diff --git a/libraries/template-haskell/Language/Haskell/TH/Syntax.hs b/libraries/template-haskell/Language/Haskell/TH/Syntax.hs
index e21bb1c6b3..04a15ac6c6 100644
--- a/libraries/template-haskell/Language/Haskell/TH/Syntax.hs
+++ b/libraries/template-haskell/Language/Haskell/TH/Syntax.hs
@@ -1229,7 +1229,7 @@ data Lit = CharL Char
-- We could add Int, Float, Double etc, as we do in HsLit,
-- but that could complicate the
- -- suppposedly-simple TH.Syntax literal type
+ -- supposedly-simple TH.Syntax literal type
-- | Pattern in Haskell given in @{}@
data Pat
diff --git a/testsuite/tests/programs/galois_raytrace/Data.hs b/testsuite/tests/programs/galois_raytrace/Data.hs
index a92eb9bf23..f02aabe7bf 100644
--- a/testsuite/tests/programs/galois_raytrace/Data.hs
+++ b/testsuite/tests/programs/galois_raytrace/Data.hs
@@ -125,7 +125,7 @@ lookupEnv (Env e) n = lookup n e
-- All primitive operators
--
-- There is no Op_apply, Op_false, Op_true and Op_if
--- (because they appear explcitly in the rules).
+-- (because they appear explicitly in the rules).
data GMLOp
= Op_acos
diff --git a/testsuite/tests/programs/galois_raytrace/Eval.hs b/testsuite/tests/programs/galois_raytrace/Eval.hs
index 58dc1f3688..5939d4750b 100644
--- a/testsuite/tests/programs/galois_raytrace/Eval.hs
+++ b/testsuite/tests/programs/galois_raytrace/Eval.hs
@@ -248,7 +248,7 @@ doPrimOp primOp op args
types = getPrimOpType primOp
--- Render is somewhat funny, becauase it can only get called at top level.
+-- Render is somewhat funny, because it can only get called at top level.
-- All other operations are purely functional.
doAllOp :: PrimOp -> GMLOp -> Stack -> IO Stack
diff --git a/testsuite/tests/rename/should_fail/T9177.hs b/testsuite/tests/rename/should_fail/T9177.hs
index 9d9c482027..553dbc7b53 100644
--- a/testsuite/tests/rename/should_fail/T9177.hs
+++ b/testsuite/tests/rename/should_fail/T9177.hs
@@ -8,7 +8,7 @@ type Foo2 = (integerr)
-- These two out-of-scope errors aren't caught until
-- the type checker, so they aren't reported at all
--- becuase the renamer aborts compilation
+-- because the renamer aborts compilation
foo3 = bar
foo4 = Fun
diff --git a/testsuite/tests/simplCore/should_compile/spec001.hs b/testsuite/tests/simplCore/should_compile/spec001.hs
index 5a6fb039f4..9af452cca1 100644
--- a/testsuite/tests/simplCore/should_compile/spec001.hs
+++ b/testsuite/tests/simplCore/should_compile/spec001.hs
@@ -3,7 +3,7 @@
-- In GHC 6.4, compiling this module gave a Core Lint failure following the
-- specialier, because a function was floated out that had a RULE that
--- mentioned another fuction (unpack, in fact). but the latter wasn't
+-- mentioned another function (unpack, in fact). but the latter wasn't
-- floated because we didn't take the RULES into account properly; result,
-- variable out of scope.