[commit: ghc] master: A few typos [ci skip] (750a25f)

git at git.haskell.org git at git.haskell.org
Fri Jun 2 09:09:10 UTC 2017


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

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

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

commit 750a25f47b626e6495cc6f951eca071429744767
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri Jun 2 11:02:13 2017 +0200

    A few typos [ci skip]


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

750a25f47b626e6495cc6f951eca071429744767
 compiler/prelude/TysWiredIn.hs                   | 2 +-
 compiler/rename/RnTypes.hs                       | 2 +-
 compiler/typecheck/TcRnTypes.hs                  | 2 +-
 testsuite/tests/programs/andy_cherry/GenUtils.hs | 4 ++--
 4 files changed, 5 insertions(+), 5 deletions(-)

diff --git a/compiler/prelude/TysWiredIn.hs b/compiler/prelude/TysWiredIn.hs
index b683564..71ff0e1 100644
--- a/compiler/prelude/TysWiredIn.hs
+++ b/compiler/prelude/TysWiredIn.hs
@@ -1080,7 +1080,7 @@ runtimeRepTy = mkTyConTy runtimeRepTyCon
 
 liftedTypeKindTyCon, starKindTyCon, unicodeStarKindTyCon :: TyCon
 
--- Type syononyms; see Note [TYPE and RuntimeRep] in TysPrim
+-- Type synonyms; see Note [TYPE and RuntimeRep] in TysPrim
 -- type Type = tYPE 'LiftedRep
 -- type *    = tYPE 'LiftedRep
 -- type *    = tYPE 'LiftedRep  -- Unicode variant
diff --git a/compiler/rename/RnTypes.hs b/compiler/rename/RnTypes.hs
index 492862b..7571684 100644
--- a/compiler/rename/RnTypes.hs
+++ b/compiler/rename/RnTypes.hs
@@ -721,7 +721,7 @@ checkWildCard _ Nothing
   = return ()
 
 checkAnonWildCard :: RnTyKiEnv -> HsWildCardInfo RdrName -> RnM ()
--- Report an error if an anonymoous wildcard is illegal here
+-- Report an error if an anonymous wildcard is illegal here
 checkAnonWildCard env wc
   = checkWildCard env mb_bad
   where
diff --git a/compiler/typecheck/TcRnTypes.hs b/compiler/typecheck/TcRnTypes.hs
index e018d5d..651e735 100644
--- a/compiler/typecheck/TcRnTypes.hs
+++ b/compiler/typecheck/TcRnTypes.hs
@@ -879,7 +879,7 @@ type TcIdSet     = IdSet
 
 type TcIdBinderStack = [TcIdBinder]
    -- This is a stack of locally-bound ids, innermost on top
-   -- Used ony in error reporting (relevantBindings in TcError)
+   -- Used only in error reporting (relevantBindings in TcError)
    -- We can't use the tcl_env type environment, because it doesn't
    --   keep track of the nesting order
 
diff --git a/testsuite/tests/programs/andy_cherry/GenUtils.hs b/testsuite/tests/programs/andy_cherry/GenUtils.hs
index 8ff6757..2a0a9606f 100644
--- a/testsuite/tests/programs/andy_cherry/GenUtils.hs
+++ b/testsuite/tests/programs/andy_cherry/GenUtils.hs
@@ -189,8 +189,8 @@ mapAccumL f s (b:bs) = (c:cs,s'')
 
 
 
--- Now some utilties involving arrays.
--- Here is a version of @elem@ that uses partual application
+-- Now some utilities involving arrays.
+-- Here is a version of @elem@ that uses partial application
 -- to optimise lookup.
 
 arrElem :: (Ix a) => [a] -> a -> Bool



More information about the ghc-commits mailing list