[commit: ghc] master: Typos in comments (98db754)

git at git.haskell.org git at git.haskell.org
Thu Jan 16 19:36:54 UTC 2014


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

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

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

commit 98db754a3209a48c79273b5752d006086c75f6ae
Author: Krzysztof Gogolewski <krz.gogolewski at gmail.com>
Date:   Thu Jan 16 20:22:11 2014 +0100

    Typos in comments


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

98db754a3209a48c79273b5752d006086c75f6ae
 compiler/stranal/WwLib.lhs                         |    4 ++--
 compiler/typecheck/TcDeriv.lhs                     |    2 +-
 compiler/typecheck/TcInteract.lhs                  |    4 ++--
 compiler/typecheck/TcRnTypes.lhs                   |    4 ++--
 testsuite/tests/indexed-types/should_compile/all.T |    2 +-
 5 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/stranal/WwLib.lhs b/compiler/stranal/WwLib.lhs
index 1f568b7..8cfc0c9 100644
--- a/compiler/stranal/WwLib.lhs
+++ b/compiler/stranal/WwLib.lhs
@@ -465,7 +465,7 @@ mkWWstr_one dflags arg
   , Just (data_con, inst_tys, inst_con_arg_tys, co)
              <- deepSplitProductType_maybe (idType arg)
   , cs `equalLength` inst_con_arg_tys
-      -- See Note [mkWWstr and unsafeCore]
+      -- See Note [mkWWstr and unsafeCoerce]
   =  do { (uniq1:uniqs) <- getUniquesM
         ; let   unpk_args      = zipWith mk_ww_local uniqs inst_con_arg_tys
                 unpk_args_w_ds = zipWithEqual "mkWWstr" set_worker_arg_info unpk_args cs
@@ -625,7 +625,7 @@ Here CPR will tell you that `foo` returns a () constructor for sure, but trying
 to create a worker/wrapper for type `a` obviously fails.
 (This was a real example until ee8e792  in libraries/base.)
 
-It does not seem feasilbe to avoid all such cases already in the analyser (and
+It does not seem feasible to avoid all such cases already in the analyser (and
 after all, the analysis is not really wrong), so we simply do nothing here in
 mkWWcpr. But we still want to emit warning with -DDEBUG, to hopefully catch
 other cases where something went avoidably wrong.
diff --git a/compiler/typecheck/TcDeriv.lhs b/compiler/typecheck/TcDeriv.lhs
index a369a60..dababa1 100644
--- a/compiler/typecheck/TcDeriv.lhs
+++ b/compiler/typecheck/TcDeriv.lhs
@@ -1620,7 +1620,7 @@ Note [Recursive newtypes]
 Newtype deriving works fine, even if the newtype is recursive.
 e.g.    newtype S1 = S1 [T1 ()]
         newtype T1 a = T1 (StateT S1 IO a ) deriving( Monad )
-Remember, too, that type families are curretly (conservatively) given
+Remember, too, that type families are currently (conservatively) given
 a recursive flag, so this also allows newtype deriving to work
 for type famillies.
 
diff --git a/compiler/typecheck/TcInteract.lhs b/compiler/typecheck/TcInteract.lhs
index 866902e..377cd2d 100644
--- a/compiler/typecheck/TcInteract.lhs
+++ b/compiler/typecheck/TcInteract.lhs
@@ -1979,7 +1979,7 @@ getCoercibleInst loc ty1 ty2 = do
     -- Coercible NT a                            (see case 4 in [Coercible Instances])
     | Just (tc,tyArgs) <- splitTyConApp_maybe ty1,
       Just (concTy, ntCo) <- instNewTyConTF_maybe famenv tc tyArgs,
-      dataConsInScope rdr_env tc -- Do noot look at all tyConsOfTyCon
+      dataConsInScope rdr_env tc -- Do not look at all tyConsOfTyCon
     = do markDataConsAsUsed rdr_env tc
          ct_ev <- requestCoercible loc concTy ty2
          local_var <- mkSysLocalM (fsLit "coev") $ mkCoerciblePred concTy ty2
@@ -1991,7 +1991,7 @@ getCoercibleInst loc ty1 ty2 = do
     -- Coercible a NT                            (see case 4 in [Coercible Instances])
     | Just (tc,tyArgs) <- splitTyConApp_maybe ty2,
       Just (concTy, ntCo) <- instNewTyConTF_maybe famenv tc tyArgs,
-      dataConsInScope rdr_env tc -- Do noot look at all tyConsOfTyCon
+      dataConsInScope rdr_env tc -- Do not look at all tyConsOfTyCon
     = do markDataConsAsUsed rdr_env tc
          ct_ev <- requestCoercible loc ty1 concTy
          local_var <- mkSysLocalM (fsLit "coev") $ mkCoerciblePred ty1 concTy
diff --git a/compiler/typecheck/TcRnTypes.lhs b/compiler/typecheck/TcRnTypes.lhs
index 052403c..5a8fb13 100644
--- a/compiler/typecheck/TcRnTypes.lhs
+++ b/compiler/typecheck/TcRnTypes.lhs
@@ -656,7 +656,7 @@ data PromotionErr
   | FamDataConPE     -- Data constructor for a data family
                      -- See Note [AFamDataCon: not promoting data family constructors] in TcRnDriver
 
-  | RecDataConPE     -- Data constructor in a reuursive loop
+  | RecDataConPE     -- Data constructor in a recursive loop
                      -- See Note [ARecDataCon: recusion and promoting data constructors] in TcTyClsDecls
   | NoDataKinds      -- -XDataKinds not enabled
 
@@ -781,7 +781,7 @@ data ImportAvails
           -- Used
           --
           --   (a) to help construct the usage information in the interface
-          --       file; if we import somethign we need to recompile if the
+          --       file; if we import something we need to recompile if the
           --       export version changes
           --
           --   (b) to specify what child modules to initialise
diff --git a/testsuite/tests/indexed-types/should_compile/all.T b/testsuite/tests/indexed-types/should_compile/all.T
index 3b69ec9..1b2ffa8 100644
--- a/testsuite/tests/indexed-types/should_compile/all.T
+++ b/testsuite/tests/indexed-types/should_compile/all.T
@@ -226,7 +226,7 @@ test('T8011',
      run_command,
      ['$MAKE -s --no-print-directory T8011'])
 
-# Marshalling of assocatiated types
+# Marshalling of associated types
 test('T8500',
      normal,
      run_command,



More information about the ghc-commits mailing list