[commit: ghc] master: Fix typos (0095cde)

git at git.haskell.org git at git.haskell.org
Sun Aug 5 20:14:16 UTC 2018


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

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

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

commit 0095cde3474cf487296b6e52bf75130b10827607
Author: Krzysztof Gogolewski <krz.gogolewski at gmail.com>
Date:   Sun Aug 5 22:13:34 2018 +0200

    Fix typos


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

0095cde3474cf487296b6e52bf75130b10827607
 compiler/iface/IfaceType.hs                      | 2 +-
 compiler/llvmGen/LlvmCodeGen/CodeGen.hs          | 4 ++--
 compiler/typecheck/TcPatSyn.hs                   | 4 ++--
 compiler/utils/GraphColor.hs                     | 2 +-
 testsuite/driver/runtests.py                     | 2 +-
 testsuite/tests/patsyn/should_fail/T14552.stderr | 2 +-
 6 files changed, 8 insertions(+), 8 deletions(-)

diff --git a/compiler/iface/IfaceType.hs b/compiler/iface/IfaceType.hs
index bd50b39..2fe3fe0 100644
--- a/compiler/iface/IfaceType.hs
+++ b/compiler/iface/IfaceType.hs
@@ -728,7 +728,7 @@ pprPrecIfaceType :: PprPrec -> IfaceType -> SDoc
 pprPrecIfaceType prec ty = eliminateRuntimeRep (ppr_ty prec) ty
 
 ppr_ty :: PprPrec -> IfaceType -> SDoc
-ppr_ty _         (IfaceFreeTyVar tyvar) = ppr tyvar  -- This is the main reson for IfaceFreeTyVar!
+ppr_ty _         (IfaceFreeTyVar tyvar) = ppr tyvar  -- This is the main reason for IfaceFreeTyVar!
 ppr_ty _         (IfaceTyVar tyvar)     = ppr tyvar  -- See Note [TcTyVars in IfaceType]
 ppr_ty ctxt_prec (IfaceTyConApp tc tys) = pprTyTcApp ctxt_prec tc tys
 ppr_ty ctxt_prec (IfaceTupleTy i p tys) = pprTuple ctxt_prec i p tys
diff --git a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
index f25cb79..dba1275 100644
--- a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
+++ b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
@@ -1534,8 +1534,8 @@ genMachOp_slow opt op [x, y] = case op of
         panicOp = panic $ "LLVM.CodeGen.genMachOp_slow: unary op encountered"
                        ++ "with two arguments! (" ++ show op ++ ")"
 
--- More then two expression, invalid!
-genMachOp_slow _ _ _ = panic "genMachOp: More then 2 expressions in MachOp!"
+-- More than two expression, invalid!
+genMachOp_slow _ _ _ = panic "genMachOp: More than 2 expressions in MachOp!"
 
 
 -- | Handle CmmLoad expression.
diff --git a/compiler/typecheck/TcPatSyn.hs b/compiler/typecheck/TcPatSyn.hs
index 71050b8..ed7a445 100644
--- a/compiler/typecheck/TcPatSyn.hs
+++ b/compiler/typecheck/TcPatSyn.hs
@@ -188,7 +188,7 @@ badUnivTvErr ex_tvs bad_tv
          , nest 2 (ppr_with_kind bad_tv)
          , hang (text "Existentially-bound variables:")
               2 (vcat (map ppr_with_kind ex_tvs))
-         , text "Probable fix: give the pattern synoym a type signature"
+         , text "Probable fix: give the pattern synonym a type signature"
          ]
   where
     ppr_with_kind tv = ppr tv <+> dcolon <+> ppr (tyVarKind tv)
@@ -1016,7 +1016,7 @@ tcPatToExpr name args pat = go pat
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
 For a bidirectional pattern synonym we need to produce an /expression/
 that matches the supplied /pattern/, given values for the arguments
-of the pattern synoymy.  For example
+of the pattern synonym.  For example
   pattern F x y = (Just x, [y])
 The 'builder' for F looks like
   $builderF x y = (Just x, [y])
diff --git a/compiler/utils/GraphColor.hs b/compiler/utils/GraphColor.hs
index 7affb92..34cbb29 100644
--- a/compiler/utils/GraphColor.hs
+++ b/compiler/utils/GraphColor.hs
@@ -116,7 +116,7 @@ colorGraph iterative spinCount colors triv spill graph0
 -- | Scan through the conflict graph separating out trivially colorable and
 --      potentially uncolorable (problem) nodes.
 --
---      Checking whether a node is trivially colorable or not is a resonably expensive operation,
+--      Checking whether a node is trivially colorable or not is a reasonably expensive operation,
 --      so after a triv node is found and removed from the graph it's no good to return to the 'start'
 --      of the graph and recheck a bunch of nodes that will probably still be non-trivially colorable.
 --
diff --git a/testsuite/driver/runtests.py b/testsuite/driver/runtests.py
index e9cce94..c6470c5 100644
--- a/testsuite/driver/runtests.py
+++ b/testsuite/driver/runtests.py
@@ -285,7 +285,7 @@ for name in config.only:
         framework_fail(name, '', 'test not found')
     else:
         # Let user fix .T file errors before reporting on unfound tests.
-        # The reson the test can not be found is likely because of those
+        # The reason the test can not be found is likely because of those
         # .T file errors.
         pass
 
diff --git a/testsuite/tests/patsyn/should_fail/T14552.stderr b/testsuite/tests/patsyn/should_fail/T14552.stderr
index 1ead644..1723b32 100644
--- a/testsuite/tests/patsyn/should_fail/T14552.stderr
+++ b/testsuite/tests/patsyn/should_fail/T14552.stderr
@@ -5,5 +5,5 @@ T14552.hs:22:9: error:
       Existentially-bound variables:
         k :: *
         w :: k --> *
-      Probable fix: give the pattern synoym a type signature
+      Probable fix: give the pattern synonym a type signature
     • In the declaration for pattern synonym ‘FOO’



More information about the ghc-commits mailing list