[commit: ghc] master: Typos in comments (6f40060)

git at git.haskell.org git at git.haskell.org
Wed Mar 18 01:34:27 UTC 2015


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

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

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

commit 6f4006034af1b63da75ef34ced70b26325ac86f4
Author: Gabor Greif <ggreif at gmail.com>
Date:   Wed Mar 18 02:25:13 2015 +0100

    Typos in comments


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

6f4006034af1b63da75ef34ced70b26325ac86f4
 compiler/basicTypes/Id.hs          | 2 +-
 compiler/coreSyn/CoreSyn.hs        | 2 +-
 compiler/coreSyn/CoreUnfold.hs     | 2 +-
 compiler/typecheck/TcTyClsDecls.hs | 2 +-
 compiler/typecheck/TcValidity.hs   | 2 +-
 compiler/types/InstEnv.hs          | 2 +-
 libraries/base/Foreign/C/Types.hs  | 4 ++--
 libraries/base/GHC/Generics.hs     | 2 +-
 8 files changed, 9 insertions(+), 9 deletions(-)

diff --git a/compiler/basicTypes/Id.hs b/compiler/basicTypes/Id.hs
index 14e789b..2a97445 100644
--- a/compiler/basicTypes/Id.hs
+++ b/compiler/basicTypes/Id.hs
@@ -449,7 +449,7 @@ isImplicitId id
         PrimOpId {}      -> True
         DataConWorkId {} -> True
         DataConWrapId {} -> True
-                -- These are are implied by their type or class decl;
+                -- These are implied by their type or class decl;
                 -- remember that all type and class decls appear in the interface file.
                 -- The dfun id is not an implicit Id; it must *not* be omitted, because
                 -- it carries version info for the instance decl
diff --git a/compiler/coreSyn/CoreSyn.hs b/compiler/coreSyn/CoreSyn.hs
index 86939bd..b744ea2 100644
--- a/compiler/coreSyn/CoreSyn.hs
+++ b/compiler/coreSyn/CoreSyn.hs
@@ -711,7 +711,7 @@ but CoreFVs, Subst, PprCore, CoreTidy also inspect the representation.
 
 -- | Gathers a collection of 'CoreRule's. Maps (the name of) an 'Id' to its rules
 type RuleBase = NameEnv [CoreRule]
-        -- The rules are are unordered;
+        -- The rules are unordered;
         -- we sort out any overlaps on lookup
 
 -- | A 'CoreRule' is:
diff --git a/compiler/coreSyn/CoreUnfold.hs b/compiler/coreSyn/CoreUnfold.hs
index 1dbd5ed..92160c7 100644
--- a/compiler/coreSyn/CoreUnfold.hs
+++ b/compiler/coreSyn/CoreUnfold.hs
@@ -981,7 +981,7 @@ StrictAnal.addStrictnessInfoToTopId
 callSiteInline :: DynFlags
                -> Id                    -- The Id
                -> Bool                  -- True <=> unfolding is active
-               -> Bool                  -- True if there are are no arguments at all (incl type args)
+               -> Bool                  -- True if there are no arguments at all (incl type args)
                -> [ArgSummary]          -- One for each value arg; True if it is interesting
                -> CallCtxt              -- True <=> continuation is interesting
                -> Maybe CoreExpr        -- Unfolding, if any
diff --git a/compiler/typecheck/TcTyClsDecls.hs b/compiler/typecheck/TcTyClsDecls.hs
index 6eb23b0..9c9481f 100644
--- a/compiler/typecheck/TcTyClsDecls.hs
+++ b/compiler/typecheck/TcTyClsDecls.hs
@@ -458,7 +458,7 @@ kcLTyClDecl (L loc decl)
 kcTyClDecl :: TyClDecl Name -> TcM ()
 -- This function is used solely for its side effect on kind variables
 -- NB kind signatures on the type variables and
---    result kind signature have aready been dealt with
+--    result kind signature have already been dealt with
 --    by getInitialKind, so we can ignore them here.
 
 kcTyClDecl (DataDecl { tcdLName = L _ name, tcdTyVars = hs_tvs, tcdDataDefn = defn })
diff --git a/compiler/typecheck/TcValidity.hs b/compiler/typecheck/TcValidity.hs
index 3d01f50..293f7cf 100644
--- a/compiler/typecheck/TcValidity.hs
+++ b/compiler/typecheck/TcValidity.hs
@@ -227,7 +227,7 @@ to a Type, performing kind checking, and then check various things that should
 be true about it.  We don't want to perform these checks at the same time
 as the initial translation because (a) they are unnecessary for interface-file
 types and (b) when checking a mutually recursive group of type and class decls,
-we can't "look" at the tycons/classes yet.  Also, the checks are are rather
+we can't "look" at the tycons/classes yet.  Also, the checks are rather
 diverse, and used to really mess up the other code.
 
 One thing we check for is 'rank'.
diff --git a/compiler/types/InstEnv.hs b/compiler/types/InstEnv.hs
index da34cf8..8d1c855 100644
--- a/compiler/types/InstEnv.hs
+++ b/compiler/types/InstEnv.hs
@@ -981,7 +981,7 @@ not incoherent, but we still want this to compile. Hence the
 "all-but-one-logic".
 
 The implementation is in insert_overlapping, where we remove matching
-incoherent instances as long as there are are others.
+incoherent instances as long as there are others.
 
 
 
diff --git a/libraries/base/Foreign/C/Types.hs b/libraries/base/Foreign/C/Types.hs
index 2b9939c..cc0eb1b 100644
--- a/libraries/base/Foreign/C/Types.hs
+++ b/libraries/base/Foreign/C/Types.hs
@@ -24,7 +24,7 @@ module Foreign.C.Types
           -- $ctypes
 
           -- ** Integral types
-          -- | These types are are represented as @newtype at s of
+          -- | These types are represented as @newtype at s of
           -- types in "Data.Int" and "Data.Word", and are instances of
           -- 'Prelude.Eq', 'Prelude.Ord', 'Prelude.Num', 'Prelude.Read',
           -- 'Prelude.Show', 'Prelude.Enum', 'Typeable', 'Storable',
@@ -53,7 +53,7 @@ module Foreign.C.Types
         --
 
           -- ** Floating types
-          -- | These types are are represented as @newtype at s of
+          -- | These types are represented as @newtype at s of
           -- 'Prelude.Float' and 'Prelude.Double', and are instances of
           -- 'Prelude.Eq', 'Prelude.Ord', 'Prelude.Num', 'Prelude.Read',
           -- 'Prelude.Show', 'Prelude.Enum', 'Typeable', 'Storable',
diff --git a/libraries/base/GHC/Generics.hs b/libraries/base/GHC/Generics.hs
index 3970005..0b4ebc6 100644
--- a/libraries/base/GHC/Generics.hs
+++ b/libraries/base/GHC/Generics.hs
@@ -29,7 +29,7 @@ module GHC.Generics  (
 --
 -- |
 --
--- Datatype-generic functions are are based on the idea of converting values of
+-- Datatype-generic functions are based on the idea of converting values of
 -- a datatype @T@ into corresponding values of a (nearly) isomorphic type @'Rep' T at .
 -- The type @'Rep' T@ is
 -- built from a limited set of type constructors, all provided by this module. A



More information about the ghc-commits mailing list