[commit: ghc] master: Typos in docs and comments (c78fedd)

git at git.haskell.org git at git.haskell.org
Thu Jan 7 11:54:46 UTC 2016


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

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

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

commit c78fedde7055490ca6f6210ada797190f3c35d87
Author: Gabor Greif <ggreif at gmail.com>
Date:   Thu Jan 7 11:48:16 2016 +0100

    Typos in docs and comments


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

c78fedde7055490ca6f6210ada797190f3c35d87
 compiler/basicTypes/IdInfo.hs                       | 2 +-
 compiler/basicTypes/OccName.hs                      | 2 +-
 compiler/parser/Parser.y                            | 4 ++--
 compiler/rename/RnSource.hs                         | 2 +-
 compiler/simplCore/SimplUtils.hs                    | 4 ++--
 compiler/typecheck/TcInteract.hs                    | 2 +-
 docs/users_guide/glasgow_exts.rst                   | 2 +-
 mk/config.mk.in                                     | 2 +-
 mk/warnings.mk                                      | 8 ++++----
 testsuite/tests/typecheck/should_compile/PolyRec.hs | 2 +-
 10 files changed, 15 insertions(+), 15 deletions(-)

diff --git a/compiler/basicTypes/IdInfo.hs b/compiler/basicTypes/IdInfo.hs
index 450644d..db32f05 100644
--- a/compiler/basicTypes/IdInfo.hs
+++ b/compiler/basicTypes/IdInfo.hs
@@ -146,7 +146,7 @@ data IdDetails
                                 -- e.g. $trModule, or $tcT
 
   | PatSynId                    -- ^ A top-level Id to support pattern synonyms;
-                                -- the builder or matcher for the patern synonym
+                                -- the builder or matcher for the pattern synonym
 
 data RecSelParent = RecSelData TyCon | RecSelPatSyn PatSyn deriving Eq
   -- Either `TyCon` or `PatSyn` depending
diff --git a/compiler/basicTypes/OccName.hs b/compiler/basicTypes/OccName.hs
index 9f162d5..ad19f1f 100644
--- a/compiler/basicTypes/OccName.hs
+++ b/compiler/basicTypes/OccName.hs
@@ -549,7 +549,7 @@ a user-written type or function name
    $f...        Dict-fun identifiers (from inst decls)
    $dmop        Default method for 'op'
    $pnC         n'th superclass selector for class C
-   $wf          Worker for functtoin 'f'
+   $wf          Worker for function 'f'
    $sf..        Specialised version of f
    T:C          Tycon for dictionary for class C
    D:C          Data constructor for dictionary for class C
diff --git a/compiler/parser/Parser.y b/compiler/parser/Parser.y
index 4732956..380fd3c 100644
--- a/compiler/parser/Parser.y
+++ b/compiler/parser/Parser.y
@@ -1773,9 +1773,9 @@ varids0 :: { Located [Located RdrName] }
 Note [Parsing ~]
 ~~~~~~~~~~~~~~~~
 
-Due to parsing conflicts between lazyness annotations in data type
+Due to parsing conflicts between laziness annotations in data type
 declarations (see strict_mark) and equality types ~'s are always
-parsed as lazyness annotations, and turned into HsEqTy's in the
+parsed as laziness annotations, and turned into HsEqTy's in the
 correct places using RdrHsSyn.splitTilde.
 
 Since strict_mark is parsed as part of atype which is part of type,
diff --git a/compiler/rename/RnSource.hs b/compiler/rename/RnSource.hs
index 0dd5d7d..bfb2527 100644
--- a/compiler/rename/RnSource.hs
+++ b/compiler/rename/RnSource.hs
@@ -667,7 +667,7 @@ rnFamInstDecl doc mb_cls tycon (HsIB { hsib_body = pats }) payload rnPayload
                      (L loc _ : ps) -> combineSrcSpans loc (getLoc (last ps))
 
        ; pat_kity_vars_with_dups <- extractHsTysRdrTyVarsDups pats
-             -- Use the "...Dups" form becuase it's needed
+             -- Use the "...Dups" form because it's needed
              -- below to report unsed binder on the LHS
        ; var_names <- mapM (newTyVarNameRn mb_cls . L loc . unLoc) $
                       freeKiTyVarsAllVars $
diff --git a/compiler/simplCore/SimplUtils.hs b/compiler/simplCore/SimplUtils.hs
index 09fd1e4..846d1cc 100644
--- a/compiler/simplCore/SimplUtils.hs
+++ b/compiler/simplCore/SimplUtils.hs
@@ -1023,7 +1023,7 @@ preInlineUnconditionally :: DynFlags -> SimplEnv -> TopLevelFlag -> InId -> InEx
 -- Precondition: rhs satisfies the let/app invariant
 -- See Note [CoreSyn let/app invariant] in CoreSyn
 -- Reason: we don't want to inline single uses, or discard dead bindings,
---         for unlifted, side-effect-full bindings
+--         for unlifted, side-effect-ful bindings
 preInlineUnconditionally dflags env top_lvl bndr rhs
   | not active                               = False
   | isStableUnfolding (idUnfolding bndr)     = False -- Note [Stable unfoldings and preInlineUnconditionally]
@@ -1136,7 +1136,7 @@ postInlineUnconditionally
 -- Precondition: rhs satisfies the let/app invariant
 -- See Note [CoreSyn let/app invariant] in CoreSyn
 -- Reason: we don't want to inline single uses, or discard dead bindings,
---         for unlifted, side-effect-full bindings
+--         for unlifted, side-effect-ful bindings
 postInlineUnconditionally dflags env top_lvl bndr occ_info rhs unfolding
   | not active                  = False
   | isWeakLoopBreaker occ_info  = False -- If it's a loop-breaker of any kind, don't inline
diff --git a/compiler/typecheck/TcInteract.hs b/compiler/typecheck/TcInteract.hs
index 78bf845..6d85671 100644
--- a/compiler/typecheck/TcInteract.hs
+++ b/compiler/typecheck/TcInteract.hs
@@ -593,7 +593,7 @@ we keep?  More subtle than you might think!
         8% performance improvement in nofib cryptarithm2, compared to
         just rolling the dice.  I didn't investigate why.
 
-  * Constaints coming from the same level (i.e. same implication)
+  * Constraints coming from the same level (i.e. same implication)
 
        - Always get rid of InstSC ones if possible, since they are less
          useful for solving.  If both are InstSC, choose the one with
diff --git a/docs/users_guide/glasgow_exts.rst b/docs/users_guide/glasgow_exts.rst
index 5808d52..836b188 100644
--- a/docs/users_guide/glasgow_exts.rst
+++ b/docs/users_guide/glasgow_exts.rst
@@ -8770,7 +8770,7 @@ monomorphic type (one with no foralls). For example,
 
 The definition of ``foo`` is rejected because one would have to
 instantiate ``id``\'s type with ``b := (forall s. ST s a) -> a``, and
-that is not allowed. Instanting polymorpic type variables with
+that is not allowed. Instantiating polymorphic type variables with
 polymorphic types is called *impredicative polymorphism*.
 
 GHC has extremely flaky support for *impredicative polymorphism*,
diff --git a/mk/config.mk.in b/mk/config.mk.in
index e1259e5..9fff715 100644
--- a/mk/config.mk.in
+++ b/mk/config.mk.in
@@ -440,7 +440,7 @@ SRC_HC_OPTS_STAGE0 =
 SRC_HC_OPTS_STAGE1 =
 SRC_HC_OPTS_STAGE2 =
 
-# Warning supression flags. See mk/warnings.mk.
+# Warning suppression flags. See mk/warnings.mk.
 SRC_CC_WARNING_OPTS =
 SRC_HC_WARNING_OPTS =
 
diff --git a/mk/warnings.mk b/mk/warnings.mk
index cf22042..abbee68 100644
--- a/mk/warnings.mk
+++ b/mk/warnings.mk
@@ -123,10 +123,10 @@ GhcBootLibExtraHcOpts += -fno-warn-deprecated-flags
 #   * Most .cabal files specify -Wall. But not all, and not all building we
 #   do relies on .cabal files. So we have to add -Wall ourselves somewhere.
 #
-#   * Some .cabal also specify warning supression flags. Because -Wall
-#   overrides any warning supression flags that come before it, we have to
-#   make sure -Wall comes before any warning supression flags. So we add it
+#   * Some .cabal also specify warning suppression flags. Because -Wall
+#   overrides any warning suppression flags that come before it, we have to
+#   make sure -Wall comes before any warning suppression flags. So we add it
 #   to SRC_HC_OPTS.
 #
-#   * Similarly, our own warning supression should come after the -Wall from
+#   * Similarly, our own warning suppression should come after the -Wall from
 #   the .cabal files, so we do *not* add them to SRC_HC_OPTS.
diff --git a/testsuite/tests/typecheck/should_compile/PolyRec.hs b/testsuite/tests/typecheck/should_compile/PolyRec.hs
index ddb9115..6ca859b 100644
--- a/testsuite/tests/typecheck/should_compile/PolyRec.hs
+++ b/testsuite/tests/typecheck/should_compile/PolyRec.hs
@@ -24,6 +24,6 @@ f (Y x) = g maybeToInt x
 -- g :: Functor f => (f Int -> b) -> f (Y Maybe) -> b
 g h x = h $ fmap f x
 
--- 'test' checks that g's type is polymophic enough
+-- 'test' checks that g's type is polymorphic enough
 test :: Functor f => (f Int -> b) -> f (Y Maybe) -> b
 test = g



More information about the ghc-commits mailing list