[commit: ghc] master: Typos in comments [ci skip] (99adcc8)

git at git.haskell.org git at git.haskell.org
Thu Jul 6 08:50:06 UTC 2017


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

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/99adcc8804e91161b35ff1d0e5f718d18fcaa66a/ghc

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

commit 99adcc8804e91161b35ff1d0e5f718d18fcaa66a
Author: Gabor Greif <ggreif at gmail.com>
Date:   Thu Jul 6 10:48:52 2017 +0200

    Typos in comments [ci skip]


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

99adcc8804e91161b35ff1d0e5f718d18fcaa66a
 compiler/hsSyn/HsImpExp.hs     | 2 +-
 compiler/main/HscMain.hs       | 2 +-
 compiler/typecheck/TcHsType.hs | 2 +-
 docs/users_guide/ffi-chap.rst  | 2 +-
 includes/stg/Ticky.h           | 2 +-
 rts/Apply.cmm                  | 2 +-
 rts/PrimOps.cmm                | 2 +-
 utils/hpc/HpcFlags.hs          | 2 +-
 8 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/hsSyn/HsImpExp.hs b/compiler/hsSyn/HsImpExp.hs
index 57f74e3..79ff287 100644
--- a/compiler/hsSyn/HsImpExp.hs
+++ b/compiler/hsSyn/HsImpExp.hs
@@ -139,7 +139,7 @@ instance (OutputableBndrId pass) => Outputable (ImportDecl pass) where
 ************************************************************************
 -}
 
--- | A name in an import or export specfication which may have adornments. Used
+-- | A name in an import or export specification which may have adornments. Used
 -- primarily for accurate pretty printing of ParsedSource, and API Annotation
 -- placement.
 data IEWrappedName name
diff --git a/compiler/main/HscMain.hs b/compiler/main/HscMain.hs
index b8bd76b..0f0ea4d 100644
--- a/compiler/main/HscMain.hs
+++ b/compiler/main/HscMain.hs
@@ -1119,7 +1119,7 @@ markUnsafeInfer tcg_env whyUnsafe = do
              mkPlainWarnMsg dflags (warnUnsafeOnLoc dflags) (whyUnsafe' dflags))
 
     liftIO $ writeIORef (tcg_safeInfer tcg_env) (False, whyUnsafe)
-    -- NOTE: Only wipe trust when not in an explicity safe haskell mode. Other
+    -- NOTE: Only wipe trust when not in an explicitly safe haskell mode. Other
     -- times inference may be on but we are in Trustworthy mode -- so we want
     -- to record safe-inference failed but not wipe the trust dependencies.
     case safeHaskell dflags == Sf_None of
diff --git a/compiler/typecheck/TcHsType.hs b/compiler/typecheck/TcHsType.hs
index 9653685..3766c6b 100644
--- a/compiler/typecheck/TcHsType.hs
+++ b/compiler/typecheck/TcHsType.hs
@@ -1845,7 +1845,7 @@ tcHsPartialSigType ctxt sig_ty
 
         ; explicit_tvs <- mapM zonkTyCoVarKind explicit_tvs
         ; let all_tvs = implicit_tvs ++ explicit_tvs
-                        -- The implicit_tvs alraedy have zonked kinds
+                        -- The implicit_tvs already have zonked kinds
 
         ; theta   <- mapM zonkTcType theta
         ; tau     <- zonkTcType tau
diff --git a/docs/users_guide/ffi-chap.rst b/docs/users_guide/ffi-chap.rst
index 616df29..bd5ca3d 100644
--- a/docs/users_guide/ffi-chap.rst
+++ b/docs/users_guide/ffi-chap.rst
@@ -34,7 +34,7 @@ The FFI addendum stipulates that an implementation is free to implement an
 arbitrary thread and may be subject to concurrent garbage collection). This
 greatly constrains library authors since it implies that it is never safe to
 pass any heap object reference to a foreign function, even if invoked with an
-``unsafe`` call. For instance, it is often desireable to pass an unpinned
+``unsafe`` call. For instance, it is often desirable to pass an unpinned
 ``ByteArray#``\s directly to native code to avoid making an
 otherwise-unnecessary copy. However, this can only be done safely under
 ``unsafe`` call semantics as otherwise the array may be moved by the garbage
diff --git a/includes/stg/Ticky.h b/includes/stg/Ticky.h
index 5e2c372..2341dba 100644
--- a/includes/stg/Ticky.h
+++ b/includes/stg/Ticky.h
@@ -30,7 +30,7 @@ extern W_ ticky_entry_ctrs[];
 extern W_ top_ct[];
 #endif
 
-/* The rest are not explicity declared in rts/Ticky.c.  Instead
+/* The rest are not explicitly declared in rts/Ticky.c.  Instead
    we use the same trick as in the former StgTicky.h: recycle the 
    same declarations for both extern decls (which are included everywhere)
    and initializations (which only happen once) 
diff --git a/rts/Apply.cmm b/rts/Apply.cmm
index 36a9859..64f0a9b 100644
--- a/rts/Apply.cmm
+++ b/rts/Apply.cmm
@@ -462,7 +462,7 @@ middle of an ST action multiple times, resulting in duplication of effects.
 In short, the construction of an AP_STACK allows us to suspend a computation
 which should not be duplicated. When running with lazy blackholing, we can then
 enter this AP_STACK multiple times, duplicating the computation with potentially
-disasterous consequences.
+disastrous consequences.
 
 For instance, consider the case of a simple ST program which computes a sum
 using in─place mutation,
diff --git a/rts/PrimOps.cmm b/rts/PrimOps.cmm
index 006c9de..3d4bea4 100644
--- a/rts/PrimOps.cmm
+++ b/rts/PrimOps.cmm
@@ -148,7 +148,7 @@ stg_isByteArrayPinnedzh ( gcptr ba )
     W_ bd, flags;
     bd = Bdescr(ba);
     // Pinned byte arrays live in blocks with the BF_PINNED flag set.
-    // We also consider BF_LARGE objects to be unmoveable. See #13894.
+    // We also consider BF_LARGE objects to be immovable. See #13894.
     // See the comment in Storage.c:allocatePinned.
     flags = TO_W_(bdescr_flags(bd));
     return (flags & (BF_PINNED | BF_LARGE) != 0);
diff --git a/utils/hpc/HpcFlags.hs b/utils/hpc/HpcFlags.hs
index dd1d9f7..2d78375 100644
--- a/utils/hpc/HpcFlags.hs
+++ b/utils/hpc/HpcFlags.hs
@@ -194,7 +194,7 @@ data Plugin = Plugin { name           :: String
 -- filterModules takes a list of candidate modules,
 -- and
 --  * excludes the excluded modules
---  * includes the rest if there are no explicity included modules
+--  * includes the rest if there are no explicitly included modules
 --  * otherwise, accepts just the included modules.
 
 allowModule :: Flags -> String -> Bool



More information about the ghc-commits mailing list