[commit: ghc] master: Typoes in comments (c70a720)

git at git.haskell.org git at git.haskell.org
Sat Jul 12 16:00:31 UTC 2014


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

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

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

commit c70a720104cb91799b4a938e598ec8ed92a265e1
Author: Gabor Greif <ggreif at gmail.com>
Date:   Sat Jul 12 11:36:02 2014 +0200

    Typoes in comments


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

c70a720104cb91799b4a938e598ec8ed92a265e1
 compiler/typecheck/TcExpr.lhs | 6 +++---
 1 file changed, 3 insertions(+), 3 deletions(-)

diff --git a/compiler/typecheck/TcExpr.lhs b/compiler/typecheck/TcExpr.lhs
index 48c4cbf..36276e5 100644
--- a/compiler/typecheck/TcExpr.lhs
+++ b/compiler/typecheck/TcExpr.lhs
@@ -202,7 +202,7 @@ tcExpr (HsIPVar x) res_ty
        ; ip_var <- emitWanted origin (mkClassPred ipClass [ip_name, ip_ty])
        ; tcWrapResult (fromDict ipClass ip_name ip_ty (HsVar ip_var)) ip_ty res_ty }
   where
-  -- Coerces a dictionry for `IP "x" t` into `t`.
+  -- Coerces a dictionary for `IP "x" t` into `t`.
   fromDict ipClass x ty =
     case unwrapNewTyCon_maybe (classTyCon ipClass) of
       Just (_,_,ax) -> HsWrap $ mkWpCast $ mkTcUnbranchedAxInstCo Representational ax [x,ty]
@@ -807,7 +807,7 @@ tcExpr (PArrSeq _ _) _
 
 \begin{code}
 tcExpr (HsSpliceE is_ty splice)  res_ty
-  = ASSERT( is_ty )   -- Untyped splices are expanced by the renamer
+  = ASSERT( is_ty )   -- Untyped splices are expanded by the renamer
    tcSpliceExpr splice res_ty
 
 tcExpr (HsBracket brack)         res_ty = tcTypedBracket   brack res_ty
@@ -966,7 +966,7 @@ tcInferFun fun
 
          -- Zonk the function type carefully, to expose any polymorphism
          -- E.g. (( \(x::forall a. a->a). blah ) e)
-         -- We can see the rank-2 type of the lambda in time to genrealise e
+         -- We can see the rank-2 type of the lambda in time to generalise e
        ; fun_ty' <- zonkTcType fun_ty
 
        ; (wrap, rho) <- deeplyInstantiate AppOrigin fun_ty'



More information about the ghc-commits mailing list