[commit: ghc] master: Typos in comments only [ci skip] (5238842)

git at git.haskell.org git at git.haskell.org
Mon Nov 28 09:43:16 UTC 2016


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

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/52388421c5649431ce128cb08fb1329727023464/ghc

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

commit 52388421c5649431ce128cb08fb1329727023464
Author: Gabor Greif <ggreif at gmail.com>
Date:   Mon Nov 28 10:40:13 2016 +0100

    Typos in comments only [ci skip]


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

52388421c5649431ce128cb08fb1329727023464
 compiler/main/Plugins.hs       | 4 ++--
 compiler/typecheck/TcSMonad.hs | 2 +-
 compiler/types/TyCoRep.hs      | 2 +-
 compiler/utils/Digraph.hs      | 6 +++---
 rts/StgCRun.c                  | 2 +-
 5 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/main/Plugins.hs b/compiler/main/Plugins.hs
index 6a8c761..74403ed 100644
--- a/compiler/main/Plugins.hs
+++ b/compiler/main/Plugins.hs
@@ -17,7 +17,7 @@ type CommandLineOption = String
 -- | 'Plugin' is the core compiler plugin data type. Try to avoid
 -- constructing one of these directly, and just modify some fields of
 -- 'defaultPlugin' instead: this is to try and preserve source-code
--- compatability when we add fields to this.
+-- compatibility when we add fields to this.
 --
 -- Nonetheless, this API is preliminary and highly likely to change in
 -- the future.
@@ -32,7 +32,7 @@ data Plugin = Plugin {
     -- behaviour of the constraint solver.
   }
 
--- | Default plugin: does nothing at all! For compatability reasons
+-- | Default plugin: does nothing at all! For compatibility reasons
 -- you should base all your plugin definitions on this default value.
 defaultPlugin :: Plugin
 defaultPlugin = Plugin {
diff --git a/compiler/typecheck/TcSMonad.hs b/compiler/typecheck/TcSMonad.hs
index aa7a6e1..cff667e 100644
--- a/compiler/typecheck/TcSMonad.hs
+++ b/compiler/typecheck/TcSMonad.hs
@@ -1111,7 +1111,7 @@ But (a) I have been unable to come up with an example of this
     (b) see Trac #12660 for how adding the derived shadows
         of a Given led to an infinite loop.
     (c) It's unlikely that rewriting derived Givens will lead
-        to a unification becuse Givens don't mention touchable
+        to a unification because Givens don't mention touchable
         unification variables
 
 For (b) there may be other ways to solve the loop, but simply
diff --git a/compiler/types/TyCoRep.hs b/compiler/types/TyCoRep.hs
index 488b669..6680ca8 100644
--- a/compiler/types/TyCoRep.hs
+++ b/compiler/types/TyCoRep.hs
@@ -2440,7 +2440,7 @@ pprTyVars tvs = sep (map pprTyVar tvs)
 
 pprTyVar :: TyVar -> SDoc
 -- Print a type variable binder with its kind (but not if *)
--- Here we do not go via IfaceType, becuase the duplication with
+-- Here we do not go via IfaceType, because the duplication with
 -- pprIfaceTvBndr is minimal, and the loss of uniques etc in
 -- debug printing is disastrous
 pprTyVar tv
diff --git a/compiler/utils/Digraph.hs b/compiler/utils/Digraph.hs
index 93906b2..53173ba 100644
--- a/compiler/utils/Digraph.hs
+++ b/compiler/utils/Digraph.hs
@@ -16,7 +16,7 @@ module Digraph(
 
         findCycle,
 
-        -- For backwards compatability with the simpler version of Digraph
+        -- For backwards compatibility with the simpler version of Digraph
         stronglyConnCompFromEdgedVerticesOrd,
         stronglyConnCompFromEdgedVerticesOrdR,
         stronglyConnCompFromEdgedVerticesUniq,
@@ -286,7 +286,7 @@ decodeSccs Graph { gr_int_graph = graph, gr_vertex_to_node = vertex_fn } forest
     mentions_itself v = v `elem` (graph ! v)
 
 
--- The following two versions are provided for backwards compatability:
+-- The following two versions are provided for backwards compatibility:
 -- See Note [Deterministic SCC]
 -- See Note [reduceNodesIntoVertices implementations]
 stronglyConnCompFromEdgedVerticesOrd
@@ -297,7 +297,7 @@ stronglyConnCompFromEdgedVerticesOrd
   = map (fmap get_node) . stronglyConnCompFromEdgedVerticesOrdR
   where get_node (n, _, _) = n
 
--- The following two versions are provided for backwards compatability:
+-- The following two versions are provided for backwards compatibility:
 -- See Note [Deterministic SCC]
 -- See Note [reduceNodesIntoVertices implementations]
 stronglyConnCompFromEdgedVerticesUniq
diff --git a/rts/StgCRun.c b/rts/StgCRun.c
index c110f51..0610dd3 100644
--- a/rts/StgCRun.c
+++ b/rts/StgCRun.c
@@ -141,7 +141,7 @@ StgWord8 *win32AllocStack(void)
  * we only jump to other STG procedures, so we maintain the 16n - word_size
  * alignment for these jumps.
  *
- * This gives us binary compatability with LLVM and GCC as well as dealing
+ * This gives us binary compatibility with LLVM and GCC as well as dealing
  * with the FFI. Previously we just maintianed a 16n byte alignment for
  * procedure entry and calls, which led to bugs (see #4211 and #5250).
  *



More information about the ghc-commits mailing list