[commit: ghc] master: Typos in manual and comments [ci skip] (7a38783)

git at git.haskell.org git at git.haskell.org
Fri Mar 17 10:25:15 UTC 2017


Repository : ssh://git@git.haskell.org/ghc

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/7a38783b72f86afda14ada2155e63491ced2e7de/ghc

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

commit 7a38783b72f86afda14ada2155e63491ced2e7de
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri Mar 17 10:20:42 2017 +0100

    Typos in manual and comments [ci skip]


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

7a38783b72f86afda14ada2155e63491ced2e7de
 compiler/coreSyn/CoreSubst.hs              | 4 ++--
 compiler/simplCore/SimplEnv.hs             | 2 +-
 compiler/typecheck/TcGenFunctor.hs         | 2 +-
 compiler/vectorise/Vectorise/Utils/Base.hs | 4 ++--
 docs/users_guide/glasgow_exts.rst          | 2 +-
 rts/Adjustor.c                             | 2 +-
 6 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/coreSyn/CoreSubst.hs b/compiler/coreSyn/CoreSubst.hs
index 590d870..f2485f3 100644
--- a/compiler/coreSyn/CoreSubst.hs
+++ b/compiler/coreSyn/CoreSubst.hs
@@ -1188,7 +1188,7 @@ simple_out_bind_pair env in_bndr mb_out_bndr out_rhs
 
 {- Note [Exported Ids and trivial RHSs]
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
-We obviously do no want to unconditinally inline an Id that is exported.
+We obviously do not want to unconditionally inline an Id that is exported.
 In SimplUtils, Note [Top level and postInlineUnconditionally], we
 explain why we don't inline /any/ top-level things unconditionally, even
 trivial ones.  But we do here!  Why?  In the simple optimiser
@@ -1197,7 +1197,7 @@ trivial ones.  But we do here!  Why?  In the simple optimiser
   * We do no call-site inlining
 
 Those differences obviate the reasons for not inlining a trivial rhs,
-and increase the benefit for doing so.  So we unconditaionlly inline trivial
+and increase the benefit for doing so.  So we unconditionally inline trivial
 rhss here.
 -}
 
diff --git a/compiler/simplCore/SimplEnv.hs b/compiler/simplCore/SimplEnv.hs
index 1379646..a1a973e 100644
--- a/compiler/simplCore/SimplEnv.hs
+++ b/compiler/simplCore/SimplEnv.hs
@@ -249,7 +249,7 @@ occurrences of 'wild-id' (with wildCardKey).  The easy
 way to do that is to start of with a representative
 Id in the in-scope set
 
-There can be be *occurrences* of wild-id.  For example,
+There can be *occurrences* of wild-id.  For example,
 MkCore.mkCoreApp transforms
    e (a /# b)   -->   case (a /# b) of wild { DEFAULT -> e wild }
 This is ok provided 'wild' isn't free in 'e', and that's the delicate
diff --git a/compiler/typecheck/TcGenFunctor.hs b/compiler/typecheck/TcGenFunctor.hs
index 49129bf..e7bf394 100644
--- a/compiler/typecheck/TcGenFunctor.hs
+++ b/compiler/typecheck/TcGenFunctor.hs
@@ -860,7 +860,7 @@ constructor has the same type as the last type parameter:
 
 Only E1's argument is an occurrence of a universally quantified type variable
 that is syntactically equivalent to the last type parameter, so only E1's
-argument will be be folded over in a derived Foldable instance.
+argument will be folded over in a derived Foldable instance.
 
 See Trac #10447 for the original discussion on this feature. Also see
 https://ghc.haskell.org/trac/ghc/wiki/Commentary/Compiler/DeriveFunctor
diff --git a/compiler/vectorise/Vectorise/Utils/Base.hs b/compiler/vectorise/Vectorise/Utils/Base.hs
index 071fab9..4227109 100644
--- a/compiler/vectorise/Vectorise/Utils/Base.hs
+++ b/compiler/vectorise/Vectorise/Utils/Base.hs
@@ -222,7 +222,7 @@ pdataReprTyCon ty
 --
 pdataReprTyConExact :: TyCon -> VM TyCon
 pdataReprTyConExact tycon
-  = do {   -- look up the representation tycon; if there is a match at all, it will be be exact
+  = do {   -- look up the representation tycon; if there is a match at all, it will be exact
        ;   -- (i.e.,' _tys' will be distinct type variables)
        ; (ptycon, _tys) <- pdataReprTyCon (tycon `mkTyConApp` mkTyVarTys (tyConTyVars tycon))
        ; return ptycon
@@ -235,7 +235,7 @@ pdataReprTyConExact tycon
 --
 pdatasReprTyConExact :: TyCon -> VM TyCon
 pdatasReprTyConExact tycon
-  = do {   -- look up the representation tycon; if there is a match at all, it will be be exact
+  = do {   -- look up the representation tycon; if there is a match at all, it will be exact
        ; (FamInstMatch { fim_instance = ptycon }) <- pdatasReprTyCon (tycon `mkTyConApp` mkTyVarTys (tyConTyVars tycon))
        ; return $ dataFamInstRepTyCon ptycon
        }
diff --git a/docs/users_guide/glasgow_exts.rst b/docs/users_guide/glasgow_exts.rst
index 0e8e956..8893a23 100644
--- a/docs/users_guide/glasgow_exts.rst
+++ b/docs/users_guide/glasgow_exts.rst
@@ -6309,7 +6309,7 @@ Overloaded lists
     ``IsList`` class).
 
 GHC supports *overloading of the list notation*. Let us recap the
-notation for constructing lists. In Haskell, the list notation can be be
+notation for constructing lists. In Haskell, the list notation can be
 used in the following seven ways:
 
 ::
diff --git a/rts/Adjustor.c b/rts/Adjustor.c
index 9f5a000..c7dcc8c 100644
--- a/rts/Adjustor.c
+++ b/rts/Adjustor.c
@@ -718,7 +718,7 @@ createAdjustor(int cconv, StgStablePtr hptr,
      To do this, we extend the *caller's* stack frame by 2 words and shift
      the output registers used for argument passing (%o0 - %o5, we are a *leaf*
      procedure because of the tail-jump) by 2 positions. This makes room in
-     %o0 and %o1 for the additinal arguments, namely  hptr and a dummy (used
+     %o0 and %o1 for the additional arguments, namely  hptr and a dummy (used
      for destination addr of jump on SPARC, return address on x86, ...). This
      shouldn't cause any problems for a C-like caller: alloca is implemented
      similarly, and local variables should be accessed via %fp, not %sp. In a



More information about the ghc-commits mailing list