[commit: ghc] master: A few typos [ci skip] (12e6e19)

git at git.haskell.org git at git.haskell.org
Thu Aug 30 16:49:03 UTC 2018


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

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

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

commit 12e6e194f6c533e0d41bc1942dce9176a3bccf1c
Author: Gabor Greif <ggreif at gmail.com>
Date:   Thu Aug 30 18:38:38 2018 +0200

    A few typos [ci skip]


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

12e6e194f6c533e0d41bc1942dce9176a3bccf1c
 compiler/cmm/CmmSink.hs       | 2 +-
 compiler/deSugar/DsBinds.hs   | 2 +-
 compiler/typecheck/ClsInst.hs | 2 +-
 3 files changed, 3 insertions(+), 3 deletions(-)

diff --git a/compiler/cmm/CmmSink.hs b/compiler/cmm/CmmSink.hs
index 7bfc075..6317cfe 100644
--- a/compiler/cmm/CmmSink.hs
+++ b/compiler/cmm/CmmSink.hs
@@ -477,7 +477,7 @@ into
   (a != b)
 but there's one case it can't handle: when the comparison is over
 floating-point values, we can't invert it, because floating-point
-comparisions aren't invertible (because NaN).
+comparisons aren't invertible (because of NaNs).
 
 But we *can* optimise this conditional by swapping the true and false
 branches. Given
diff --git a/compiler/deSugar/DsBinds.hs b/compiler/deSugar/DsBinds.hs
index 6524e10..421adca 100644
--- a/compiler/deSugar/DsBinds.hs
+++ b/compiler/deSugar/DsBinds.hs
@@ -1282,7 +1282,7 @@ ds_ev_typeable ty (EvTypeableTrFun ev1 ev2)
 ds_ev_typeable ty (EvTypeableTyLit ev)
   = -- See Note [Typeable for Nat and Symbol] in TcInteract
     do { fun  <- dsLookupGlobalId tr_fun
-       ; dict <- dsEvTerm ev       -- Of type KnownNat/KnownSym
+       ; dict <- dsEvTerm ev       -- Of type KnownNat/KnownSymbol
        ; let proxy = mkTyApps (Var proxyHashId) [ty_kind, ty]
        ; return (mkApps (mkTyApps (Var fun) [ty]) [ dict, proxy ]) }
   where
diff --git a/compiler/typecheck/ClsInst.hs b/compiler/typecheck/ClsInst.hs
index de957b7..0af1965 100644
--- a/compiler/typecheck/ClsInst.hs
+++ b/compiler/typecheck/ClsInst.hs
@@ -427,7 +427,7 @@ Note [Typeable for Nat and Symbol]
 We have special Typeable instances for Nat and Symbol.  Roughly we
 have this instance, implemented here by doTyLit:
       instance KnownNat n => Typeable (n :: Nat) where
-         typeRep = tyepNatTypeRep @n
+         typeRep = typeNatTypeRep @n
 where
    Data.Typeable.Internals.typeNatTypeRep :: KnownNat a => TypeRep a
 



More information about the ghc-commits mailing list