[commit: ghc] master: Some typos in comments (edd5764)
git at git.haskell.org
git at git.haskell.org
Wed Jun 11 18:23:37 UTC 2014
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/edd5764509c7df65e3f5409888cbacf58435d11e/ghc
>---------------------------------------------------------------
commit edd5764509c7df65e3f5409888cbacf58435d11e
Author: Gabor Greif <ggreif at gmail.com>
Date: Wed Jun 11 01:37:01 2014 +0200
Some typos in comments
>---------------------------------------------------------------
edd5764509c7df65e3f5409888cbacf58435d11e
compiler/basicTypes/OccName.lhs | 2 +-
compiler/coreSyn/CoreTidy.lhs | 4 ++--
compiler/llvmGen/LlvmCodeGen/CodeGen.hs | 2 +-
compiler/main/PprTyThing.hs | 2 +-
compiler/nativeGen/AsmCodeGen.lhs | 2 +-
5 files changed, 6 insertions(+), 6 deletions(-)
diff --git a/compiler/basicTypes/OccName.lhs b/compiler/basicTypes/OccName.lhs
index 087298f..1248432 100644
--- a/compiler/basicTypes/OccName.lhs
+++ b/compiler/basicTypes/OccName.lhs
@@ -128,7 +128,7 @@ import Data.Data
%* *
%************************************************************************
-FastStringEnv can't be in FastString becuase the env depends on UniqFM
+FastStringEnv can't be in FastString because the env depends on UniqFM
\begin{code}
type FastStringEnv a = UniqFM a -- Keyed by FastString
diff --git a/compiler/coreSyn/CoreTidy.lhs b/compiler/coreSyn/CoreTidy.lhs
index af1e12c..4754aa5 100644
--- a/compiler/coreSyn/CoreTidy.lhs
+++ b/compiler/coreSyn/CoreTidy.lhs
@@ -256,11 +256,11 @@ Consider
False -> 2#
in ...)
-The z# binding is ok becuase the RHS is ok-for-speculation,
+The z# binding is ok because the RHS is ok-for-speculation,
but Lint will complain unless it can *see* that. So we
preserve the evaluated-ness on 'y' in tidyBndr.
-(Another alterantive would be to tidy unboxed lets into cases,
+(Another alternative would be to tidy unboxed lets into cases,
but that seems more indirect and surprising.)
diff --git a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
index 342b94f..5175535 100644
--- a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
+++ b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
@@ -804,7 +804,7 @@ genSwitch cond maybe_ids = do
let pairs = [ (ix, id) | (ix,Just id) <- zip [0..] maybe_ids ]
let labels = map (\(ix, b) -> (mkIntLit ty ix, blockIdToLlvm b)) pairs
- -- out of range is undefied, so lets just branch to first label
+ -- out of range is undefined, so let's just branch to first label
let (_, defLbl) = head labels
let s1 = Switch vc defLbl labels
diff --git a/compiler/main/PprTyThing.hs b/compiler/main/PprTyThing.hs
index d88b137..d993ab8 100644
--- a/compiler/main/PprTyThing.hs
+++ b/compiler/main/PprTyThing.hs
@@ -82,7 +82,7 @@ See #7730, #8776 for details -}
-- | Pretty-prints a 'FamInst' (type/data family instance) with its defining location.
pprFamInst :: FamInst -> SDoc
-- * For data instances we go via pprTyThing of the represntational TyCon,
--- becuase there is already much cleverness associated with printing
+-- because there is already much cleverness associated with printing
-- data type declarations that I don't want to duplicate
-- * For type instances we print directly here; there is no TyCon
-- to give to pprTyThing
diff --git a/compiler/nativeGen/AsmCodeGen.lhs b/compiler/nativeGen/AsmCodeGen.lhs
index 82193b4..e53bb11 100644
--- a/compiler/nativeGen/AsmCodeGen.lhs
+++ b/compiler/nativeGen/AsmCodeGen.lhs
@@ -606,7 +606,7 @@ makeImportsDoc dflags imports
then text ".section .note.GNU-stack,\"\", at progbits"
else empty)
$$
- -- And just because every other compiler does, lets stick in
+ -- And just because every other compiler does, let's stick in
-- an identifier directive: .ident "GHC x.y.z"
(if platformHasIdentDirective platform
then let compilerIdent = text "GHC" <+> text cProjectVersion
More information about the ghc-commits
mailing list