[commit: ghc] master: Typos in changelog and comments (99fe579)

git at git.haskell.org git at git.haskell.org
Tue Mar 7 07:35:54 UTC 2017


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

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

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

commit 99fe579d8f952512ca00ba81683dd51a45a86245
Author: Gabor Greif <ggreif at gmail.com>
Date:   Mon Mar 6 17:53:29 2017 +0100

    Typos in changelog and comments


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

99fe579d8f952512ca00ba81683dd51a45a86245
 compiler/deSugar/Desugar.hs                               | 2 +-
 compiler/simplCore/SetLevels.hs                           | 2 +-
 compiler/specialise/SpecConstr.hs                         | 2 +-
 compiler/typecheck/TcInteract.hs                          | 2 +-
 compiler/typecheck/TcTyDecls.hs                           | 2 +-
 configure.ac                                              | 2 +-
 libraries/base/Data/Data.hs                               | 2 +-
 libraries/base/GHC/IO/Buffer.hs                           | 2 +-
 libraries/base/changelog.md                               | 2 +-
 testsuite/tests/indexed-types/should_fail/T2239.hs        | 2 +-
 testsuite/tests/typecheck/should_fail/tcfail179.hs        | 2 +-
 testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs | 2 +-
 12 files changed, 12 insertions(+), 12 deletions(-)

diff --git a/compiler/deSugar/Desugar.hs b/compiler/deSugar/Desugar.hs
index d5931d1..1458b91 100644
--- a/compiler/deSugar/Desugar.hs
+++ b/compiler/deSugar/Desugar.hs
@@ -525,7 +525,7 @@ by 'competesWith'
 Class methods have a built-in RULE to select the method from the dictionary,
 so you can't change the phase on this.  That makes id very dubious to
 match on class methods in RULE lhs's.   See Trac #10595.   I'm not happy
-about this. For exmaple in Control.Arrow we have
+about this. For example in Control.Arrow we have
 
 {-# RULES "compose/arr"   forall f g .
                           (arr f) . (arr g) = arr (f . g) #-}
diff --git a/compiler/simplCore/SetLevels.hs b/compiler/simplCore/SetLevels.hs
index 2976895..8822019 100644
--- a/compiler/simplCore/SetLevels.hs
+++ b/compiler/simplCore/SetLevels.hs
@@ -1104,7 +1104,7 @@ lvlBind env (AnnRec pairs)
                 -- Both are checked by Lint
     is_fun   = all isFunction rhss
     is_bot   = False  -- It's odd to have an unconditionally divergent
-                      -- funtion in a Rec, and we don't much care what
+                      -- function in a Rec, and we don't much care what
                       -- happens to it.  False is simple!
 
     do_rhs env (bndr,rhs) = lvlFloatRhs abs_vars dest_lvl env Recursive
diff --git a/compiler/specialise/SpecConstr.hs b/compiler/specialise/SpecConstr.hs
index c2470bd..7162841 100644
--- a/compiler/specialise/SpecConstr.hs
+++ b/compiler/specialise/SpecConstr.hs
@@ -777,7 +777,7 @@ But it is much better to specialise f for the case where the argument
 is of form (I# x); then we build the box only when returning y, which
 is on the cold path.
 
-Another exmaple:
+Another example:
 
    f x = ...(g x)....
 
diff --git a/compiler/typecheck/TcInteract.hs b/compiler/typecheck/TcInteract.hs
index e1ad484..c710fd5 100644
--- a/compiler/typecheck/TcInteract.hs
+++ b/compiler/typecheck/TcInteract.hs
@@ -2475,7 +2475,7 @@ doTyLit kc t = do { kc_clas <- tcLookupClass kc
 {- Note [Typeable (T a b c)]
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~
 For type applications we always decompose using binary application,
-via doTyApp, until we get to a *kind* instantiation.  Exmaple
+via doTyApp, until we get to a *kind* instantiation.  Example
    Proxy :: forall k. k -> *
 
 To solve Typeable (Proxy (* -> *) Maybe) we
diff --git a/compiler/typecheck/TcTyDecls.hs b/compiler/typecheck/TcTyDecls.hs
index c518101..2933890 100644
--- a/compiler/typecheck/TcTyDecls.hs
+++ b/compiler/typecheck/TcTyDecls.hs
@@ -243,7 +243,7 @@ one approach is to instantiate all of C's superclasses, transitively.
 We can only do so if that set is finite.
 
 This potential loop occurs only through superclasses.  This, for
-exmaple, is fine
+example, is fine
   class C a where
     op :: C b => a -> b -> b
 even though C's full definition uses C.
diff --git a/configure.ac b/configure.ac
index ba5836d..949c3d0 100644
--- a/configure.ac
+++ b/configure.ac
@@ -442,7 +442,7 @@ fi
 # name (this is a known problem in the case of the Android NDK, which has
 # slightly odd triples).
 #
-# It may be better to just do away with the GHC triples all together. This would
+# It may be better to just do away with the GHC triples altogether. This would
 # all be taken care of for us if we configured the subprojects using
 # AC_CONFIG_DIR, but unfortunately Cabal needs to be the one to do the
 # configuration.
diff --git a/libraries/base/Data/Data.hs b/libraries/base/Data/Data.hs
index 8233f98..1b55f59 100644
--- a/libraries/base/Data/Data.hs
+++ b/libraries/base/Data/Data.hs
@@ -687,7 +687,7 @@ readConstr dt str =
 
 ------------------------------------------------------------------------------
 --
---      Convenience funtions: algebraic data types
+--      Convenience functions: algebraic data types
 --
 ------------------------------------------------------------------------------
 
diff --git a/libraries/base/GHC/IO/Buffer.hs b/libraries/base/GHC/IO/Buffer.hs
index b2d4cd1..50de06e 100644
--- a/libraries/base/GHC/IO/Buffer.hs
+++ b/libraries/base/GHC/IO/Buffer.hs
@@ -173,7 +173,7 @@ charSize = 4
 --
 -- The "live" elements of the buffer are those between the 'bufL' and
 -- 'bufR' offsets.  In an empty buffer, 'bufL' is equal to 'bufR', but
--- they might not be zero: for exmaple, the buffer might correspond to
+-- they might not be zero: for example, the buffer might correspond to
 -- a memory-mapped file and in which case 'bufL' will point to the
 -- next location to be written, which is not necessarily the beginning
 -- of the file.
diff --git a/libraries/base/changelog.md b/libraries/base/changelog.md
index f39e149..2c9d029 100644
--- a/libraries/base/changelog.md
+++ b/libraries/base/changelog.md
@@ -74,7 +74,7 @@
     non-exhaustive pattern-match warnings (#8779)
 
   * Change the implementations of `maximumBy` and `minimumBy` from
-    `Data.Foldable` to use `fold11` instead of `foldr1`. This makes them run
+    `Data.Foldable` to use `foldl1` instead of `foldr1`. This makes them run
     in constant space when applied to lists. (#10830)
 
 ## 4.9.0.0  *May 2016*
diff --git a/testsuite/tests/indexed-types/should_fail/T2239.hs b/testsuite/tests/indexed-types/should_fail/T2239.hs
index 52a8296..0d675b1 100644
--- a/testsuite/tests/indexed-types/should_fail/T2239.hs
+++ b/testsuite/tests/indexed-types/should_fail/T2239.hs
@@ -51,7 +51,7 @@ complexFD = id :: (forall b. MyEq b Bool => b->b)
 complexTF = id :: (forall b. b~Bool => b->b)
                -> (forall c. c~Bool => c->c)
 
-{- For exmaple, here is how the subsumption check works for complexTF
+{- For example, here is how the subsumption check works for complexTF
    when type-checking the expression
       (id :: (forall b. b~Bool => b->b) -> (forall c. c~Bool => c->c))
 
diff --git a/testsuite/tests/typecheck/should_fail/tcfail179.hs b/testsuite/tests/typecheck/should_fail/tcfail179.hs
index a270cbf..f2e026e 100644
--- a/testsuite/tests/typecheck/should_fail/tcfail179.hs
+++ b/testsuite/tests/typecheck/should_fail/tcfail179.hs
@@ -1,6 +1,6 @@
 {-# LANGUAGE ExistentialQuantification #-}
 
--- Exmaples from Doaitse Swierestra and Brandon Moore
+-- Examples from Doaitse Swierstra and Brandon Moore
 -- GHC users mailing list, April 07, title "Release plans"
 
 -- This one should fail, but Hugs passes it
diff --git a/testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs b/testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs
index 62dac43..83b147e 100644
--- a/testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs
+++ b/testsuite/tests/typecheck/should_run/T1735_Help/Basics.hs
@@ -371,7 +371,7 @@ readConstr dt str =
 
 ------------------------------------------------------------------------------
 --
--- Convenience funtions: algebraic data types
+-- Convenience functions: algebraic data types
 --
 ------------------------------------------------------------------------------
 



More information about the ghc-commits mailing list