[commit: ghc] master: Squash some typos (a187310)
Gabor Greif
ggreif at gmail.com
Fri Feb 15 22:27:38 CET 2013
Repository : ssh://darcs.haskell.org//srv/darcs/ghc
On branch : master
http://hackage.haskell.org/trac/ghc/changeset/a1873105a9517a48d316febb27fdb99625172619
>---------------------------------------------------------------
commit a1873105a9517a48d316febb27fdb99625172619
Author: Gabor Greif <ggreif at gmail.com>
Date: Fri Feb 15 22:26:51 2013 +0100
Squash some typos
>---------------------------------------------------------------
compiler/iface/TcIface.lhs | 2 +-
compiler/typecheck/TcHsSyn.lhs | 2 +-
compiler/typecheck/TcPat.lhs | 2 +-
compiler/typecheck/TcRnDriver.lhs | 2 +-
4 files changed, 4 insertions(+), 4 deletions(-)
diff --git a/compiler/iface/TcIface.lhs b/compiler/iface/TcIface.lhs
index 1748e94..c47066d 100644
--- a/compiler/iface/TcIface.lhs
+++ b/compiler/iface/TcIface.lhs
@@ -1051,7 +1051,7 @@ tcIfaceExpr (IfaceCase scrut case_bndr alts) = do
scrut_ty = exprType scrut'
case_bndr' = mkLocalId case_bndr_name scrut_ty
tc_app = splitTyConApp scrut_ty
- -- NB: Won't always succeed (polymoprhic case)
+ -- NB: Won't always succeed (polymorphic case)
-- but won't be demanded in those cases
-- NB: not tcSplitTyConApp; we are looking at Core here
-- look through non-rec newtypes to find the tycon that
diff --git a/compiler/typecheck/TcHsSyn.lhs b/compiler/typecheck/TcHsSyn.lhs
index 2e3e166..22ce21a 100644
--- a/compiler/typecheck/TcHsSyn.lhs
+++ b/compiler/typecheck/TcHsSyn.lhs
@@ -412,7 +412,7 @@ localSigWarnId sig_ns id
| idName id `elemNameSet` sig_ns = return ()
| otherwise = warnMissingSig msg id
where
- msg = ptext (sLit "Polymophic local binding with no type signature:")
+ msg = ptext (sLit "Polymorphic local binding with no type signature:")
warnMissingSig :: SDoc -> Id -> TcM ()
warnMissingSig msg id
diff --git a/compiler/typecheck/TcPat.lhs b/compiler/typecheck/TcPat.lhs
index 6c480c4..f475965 100644
--- a/compiler/typecheck/TcPat.lhs
+++ b/compiler/typecheck/TcPat.lhs
@@ -283,7 +283,7 @@ mkLocalBinder name ty
Note [Polymorphism and pattern bindings]
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
When is_mono holds we are not generalising
-But the signature can still be polymoprhic!
+But the signature can still be polymorphic!
data T = MkT (forall a. a->a)
x :: forall a. a->a
MkT x = <rhs>
diff --git a/compiler/typecheck/TcRnDriver.lhs b/compiler/typecheck/TcRnDriver.lhs
index cfd96e3..5b7eb73 100644
--- a/compiler/typecheck/TcRnDriver.lhs
+++ b/compiler/typecheck/TcRnDriver.lhs
@@ -1601,7 +1601,7 @@ kind-generalise the type. This gives the right default behaviour at
the GHCi prompt, where if you say ":k T", and T has a polymorphic
kind, you'd like to see that polymorphism. Of course. If T isn't
kind-polymorphic you won't get anything unexpected, but the apparent
-*loss* of polymorphism, for types that you konw are polymorphic, is
+*loss* of polymorphism, for types that you know are polymorphic, is
quite surprising. See Trac #7688 for a discussion.
More information about the ghc-commits
mailing list