[commit: ghc] master: Typos in comments [skip ci] (4aae191)
git at git.haskell.org
git at git.haskell.org
Mon Feb 6 16:11:23 UTC 2017
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/4aae1918e68c71f14f52d9c96b51b2876744bac8/ghc
>---------------------------------------------------------------
commit 4aae1918e68c71f14f52d9c96b51b2876744bac8
Author: Gabor Greif <ggreif at gmail.com>
Date: Mon Feb 6 17:09:18 2017 +0100
Typos in comments [skip ci]
>---------------------------------------------------------------
4aae1918e68c71f14f52d9c96b51b2876744bac8
compiler/deSugar/Check.hs | 2 +-
compiler/simplCore/SimplCore.hs | 2 +-
compiler/typecheck/TcRnMonad.hs | 2 +-
compiler/types/FamInstEnv.hs | 4 ++--
libraries/integer-gmp/src/GHC/Integer.hs | 2 +-
libraries/integer-gmp/src/GHC/Integer/GMP/Internals.hs | 2 +-
6 files changed, 7 insertions(+), 7 deletions(-)
diff --git a/compiler/deSugar/Check.hs b/compiler/deSugar/Check.hs
index 720c2c9..3bf52ce 100644
--- a/compiler/deSugar/Check.hs
+++ b/compiler/deSugar/Check.hs
@@ -953,7 +953,7 @@ pmPatType (PmGrd { pm_grd_pv = pv })
-- fresh variables of the appropriate type for arguments)
mkOneConFull :: Id -> ConLike -> DsM (ValAbs, ComplexEq, Bag EvVar)
-- * x :: T tys, where T is an algebraic data type
--- NB: in the case of a data familiy, T is the *representation* TyCon
+-- NB: in the case of a data family, T is the *representation* TyCon
-- e.g. data instance T (a,b) = T1 a b
-- leads to
-- data TPair a b = T1 a b -- The "representation" type
diff --git a/compiler/simplCore/SimplCore.hs b/compiler/simplCore/SimplCore.hs
index 23faac8..3c6c311 100644
--- a/compiler/simplCore/SimplCore.hs
+++ b/compiler/simplCore/SimplCore.hs
@@ -331,7 +331,7 @@ getCoreToDo dflags
CoreLiberateCase,
simpl_phase 0 ["post-liberate-case"] max_iter
]), -- Run the simplifier after LiberateCase to vastly
- -- reduce the possiblility of shadowing
+ -- reduce the possibility of shadowing
-- Reason: see Note [Shadowing] in SpecConstr.hs
runWhen spec_constr CoreDoSpecConstr,
diff --git a/compiler/typecheck/TcRnMonad.hs b/compiler/typecheck/TcRnMonad.hs
index a0600b1..33cb4d1 100644
--- a/compiler/typecheck/TcRnMonad.hs
+++ b/compiler/typecheck/TcRnMonad.hs
@@ -1755,7 +1755,7 @@ getIfModule = do { env <- getLclEnv; return (if_mod env) }
--------------------
failIfM :: MsgDoc -> IfL a
-- The Iface monad doesn't have a place to accumulate errors, so we
--- just fall over fast if one happens; it "shouldnt happen".
+-- just fall over fast if one happens; it "shouldn't happen".
-- We use IfL here so that we can get context info out of the local env
failIfM msg
= do { env <- getLclEnv
diff --git a/compiler/types/FamInstEnv.hs b/compiler/types/FamInstEnv.hs
index d4fc902..e605f7b 100644
--- a/compiler/types/FamInstEnv.hs
+++ b/compiler/types/FamInstEnv.hs
@@ -1219,7 +1219,7 @@ topNormaliseType_maybe env ty
where
stepper = unwrapNewTypeStepper `composeSteppers` tyFamStepper
- tyFamStepper rec_nts tc tys -- Try to step a type/data familiy
+ tyFamStepper rec_nts tc tys -- Try to step a type/data family
= let (args_co, ntys) = normaliseTcArgs env Representational tc tys in
-- NB: It's OK to use normaliseTcArgs here instead of
-- normalise_tc_args (which takes the LiftingContext described
@@ -1276,7 +1276,7 @@ pmTopNormaliseType_maybe env typ
= NS_Done
tyFamStepper :: NormaliseStepper ([Type] -> [Type], [DataCon] -> [DataCon])
- tyFamStepper rec_nts tc tys -- Try to step a type/data familiy
+ tyFamStepper rec_nts tc tys -- Try to step a type/data family
= let (_args_co, ntys) = normaliseTcArgs env Representational tc tys in
-- NB: It's OK to use normaliseTcArgs here instead of
-- normalise_tc_args (which takes the LiftingContext described
diff --git a/libraries/integer-gmp/src/GHC/Integer.hs b/libraries/integer-gmp/src/GHC/Integer.hs
index ffd708b..ab45887 100644
--- a/libraries/integer-gmp/src/GHC/Integer.hs
+++ b/libraries/integer-gmp/src/GHC/Integer.hs
@@ -49,7 +49,7 @@ module GHC.Integer (
eqInteger, neqInteger, leInteger, gtInteger, ltInteger, geInteger,
compareInteger,
- -- ** 'Int#'-boolean valued versions of comparision predicates
+ -- ** 'Int#'-boolean valued versions of comparison predicates
--
-- | These operations return @0#@ and @1#@ instead of 'False' and
-- 'True' respectively. See
diff --git a/libraries/integer-gmp/src/GHC/Integer/GMP/Internals.hs b/libraries/integer-gmp/src/GHC/Integer/GMP/Internals.hs
index 0ad6848..0d8d572 100644
--- a/libraries/integer-gmp/src/GHC/Integer/GMP/Internals.hs
+++ b/libraries/integer-gmp/src/GHC/Integer/GMP/Internals.hs
@@ -112,7 +112,7 @@ module GHC.Integer.GMP.Internals
, orBigNat
, bitBigNat
- -- ** 'BigNat' comparision predicates
+ -- ** 'BigNat' comparison predicates
, isZeroBigNat
, isNullBigNat#
More information about the ghc-commits
mailing list