[commit: ghc] master: Typos in comments [ci skip] (19c4203)

git at git.haskell.org git at git.haskell.org
Fri May 26 12:50:09 UTC 2017


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

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/19c4203f12a849e1d468d7c1de5cd6bfe75a4bc1/ghc

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

commit 19c4203f12a849e1d468d7c1de5cd6bfe75a4bc1
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri May 26 11:08:54 2017 +0200

    Typos in comments [ci skip]


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

19c4203f12a849e1d468d7c1de5cd6bfe75a4bc1
 compiler/llvmGen/Llvm/AbsSyn.hs  | 2 +-
 compiler/main/ErrUtils.hs        | 2 +-
 compiler/typecheck/TcBinds.hs    | 2 +-
 compiler/typecheck/TcErrors.hs   | 2 +-
 compiler/typecheck/TcPatSyn.hs   | 2 +-
 compiler/typecheck/TcSMonad.hs   | 4 ++--
 compiler/typecheck/TcSimplify.hs | 4 ++--
 compiler/typecheck/TcUnify.hs    | 6 +++---
 8 files changed, 12 insertions(+), 12 deletions(-)

diff --git a/compiler/llvmGen/Llvm/AbsSyn.hs b/compiler/llvmGen/Llvm/AbsSyn.hs
index 45d79f5..8f38c79 100644
--- a/compiler/llvmGen/Llvm/AbsSyn.hs
+++ b/compiler/llvmGen/Llvm/AbsSyn.hs
@@ -267,7 +267,7 @@ data LlvmExpression
 
   {- |
     Cast the variable from to the to type. This is an abstraction of three
-    cast operators in Llvm, inttoptr, prttoint and bitcast.
+    cast operators in Llvm, inttoptr, ptrtoint and bitcast.
        * cast: Cast type
        * from: Variable to cast
        * to:   type to cast to
diff --git a/compiler/main/ErrUtils.hs b/compiler/main/ErrUtils.hs
index 40f6648..64d23c7 100644
--- a/compiler/main/ErrUtils.hs
+++ b/compiler/main/ErrUtils.hs
@@ -153,7 +153,7 @@ data Severity
   | SevInteractive
 
   | SevDump
-    -- ^ Log messagse intended for compiler developers
+    -- ^ Log message intended for compiler developers
     -- No file/line/column stuff
 
   | SevInfo
diff --git a/compiler/typecheck/TcBinds.hs b/compiler/typecheck/TcBinds.hs
index 70e444e..ec8f235 100644
--- a/compiler/typecheck/TcBinds.hs
+++ b/compiler/typecheck/TcBinds.hs
@@ -1619,7 +1619,7 @@ decideGeneralisationPlan dflags lbinds closed sig_fn
     binds = map unLoc lbinds
 
     partial_sig_mrs :: [Bool]
-    -- One for each parital signature (so empty => no partial sigs)
+    -- One for each partial signature (so empty => no partial sigs)
     -- The Bool is True if the signature has no constraint context
     --      so we should apply the MR
     -- See Note [Partial type signatures and generalisation]
diff --git a/compiler/typecheck/TcErrors.hs b/compiler/typecheck/TcErrors.hs
index 6d422a4..324391f 100644
--- a/compiler/typecheck/TcErrors.hs
+++ b/compiler/typecheck/TcErrors.hs
@@ -2035,7 +2035,7 @@ Conclusion: if there's an insoluble occurs check (isInsolubleOccursCheck)
 then report it first.
 
 (NB: there are potentially-soluble ones, like (a ~ F a b), and we don't
-wnat to be as draconian with them.)
+want to be as draconian with them.)
 
 Note [Expanding type synonyms to make types similar]
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
diff --git a/compiler/typecheck/TcPatSyn.hs b/compiler/typecheck/TcPatSyn.hs
index dc2c4de..6d2426f 100644
--- a/compiler/typecheck/TcPatSyn.hs
+++ b/compiler/typecheck/TcPatSyn.hs
@@ -208,7 +208,7 @@ Consider
   pattern P x <- MkT x
 
 This should work.  But in the matcher we must match against MkT, and then
-instantiate its argument 'x', to get a functino of type (Int -> Int).
+instantiate its argument 'x', to get a function of type (Int -> Int).
 Equality is not enough!  Trac #13752 was an example.
 
 Note [Checking against a pattern signature]
diff --git a/compiler/typecheck/TcSMonad.hs b/compiler/typecheck/TcSMonad.hs
index 434553d..bb305ed 100644
--- a/compiler/typecheck/TcSMonad.hs
+++ b/compiler/typecheck/TcSMonad.hs
@@ -2837,7 +2837,7 @@ unflattenGivens :: IORef InertSet -> TcM ()
 -- NB: this is the /only/ way that a fsk (MetaDetails = FlatSkolTv)
 --     is filled in. Nothing else does so.
 --
--- It's here (rather than in TcFlatten) becuause the Right Places
+-- It's here (rather than in TcFlatten) because the Right Places
 -- to call it are in runTcSWithEvBinds/nestImplicTcS, where it
 -- is nicely paired with the creation an empty inert_fsks list.
 unflattenGivens inert_var
@@ -2885,7 +2885,7 @@ demoteUnfilledFmv fmv
 
 {- *********************************************************************
 *                                                                      *
-*                Instantaiation etc
+*                Instantiation etc.
 *                                                                      *
 ********************************************************************* -}
 
diff --git a/compiler/typecheck/TcSimplify.hs b/compiler/typecheck/TcSimplify.hs
index a611198..dcb146a 100644
--- a/compiler/typecheck/TcSimplify.hs
+++ b/compiler/typecheck/TcSimplify.hs
@@ -926,7 +926,7 @@ defaultTyVarsAndSimplify rhs_tclvl mono_tvs candidates
 decideQuantifiedTyVars
    :: TyCoVarSet        -- Monomorphic tyvars
    -> [(Name,TcType)]   -- Annotated theta and (name,tau) pairs
-   -> [TcIdSigInst]     -- Parital signatures
+   -> [TcIdSigInst]     -- Partial signatures
    -> [PredType]        -- Candidates, zonked
    -> TcM [TyVar]
 -- Fix what tyvars we are going to quantify over, and quantify them
@@ -1955,7 +1955,7 @@ floatEqualities skols no_given_eqs
   = return (emptyBag, wanteds)   -- Note [Float Equalities out of Implications]
 
   | otherwise
-  = do { -- First zonk: the inert set (from whence they came) are is fully
+  = do { -- First zonk: the inert set (from whence they came) is fully
          -- zonked, but unflattening may have filled in unification
          -- variables, and we /must/ see them.  Otherwise we may float
          -- constraints that mention the skolems!
diff --git a/compiler/typecheck/TcUnify.hs b/compiler/typecheck/TcUnify.hs
index 3f1d77a..f106268 100644
--- a/compiler/typecheck/TcUnify.hs
+++ b/compiler/typecheck/TcUnify.hs
@@ -687,7 +687,7 @@ So roughly:
       (i.e. skolemisation is the next thing we'd do)
  * and the ty_actual has no top-level polymorphism (but looking deeply)
 then we can revert to simple equality.  But we need to be careful.
-These examples are allfine:
+These examples are all fine:
 
  * (Char -> forall a. a->a) <= (forall a. Char -> a -> a)
       Polymorphism is buried in ty_actual
@@ -703,8 +703,8 @@ These examples are allfine:
      ty_expected isn't really polymorphic
 
 If we prematurely go to equality we'll reject a program we should
-accept (e.g. Grac #13752).  So the test (which is only to improve
-error messagse) is very conservative:
+accept (e.g. Trac #13752).  So the test (which is only to improve
+error message) is very conservative:
  * ty_actual is /definitely/ monomorphic
  * ty_expected is /definitely/ polymorphic
 -}



More information about the ghc-commits mailing list