[commit: ghc] master: Typos [ci skip] (22a03e7)
git at git.haskell.org
git at git.haskell.org
Wed May 10 08:02:42 UTC 2017
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/22a03e7288129a165dc2cb866041185a06adb0e9/ghc
>---------------------------------------------------------------
commit 22a03e7288129a165dc2cb866041185a06adb0e9
Author: Gabor Greif <ggreif at gmail.com>
Date: Tue May 9 13:49:00 2017 +0200
Typos [ci skip]
>---------------------------------------------------------------
22a03e7288129a165dc2cb866041185a06adb0e9
compiler/basicTypes/MkId.hs | 2 +-
compiler/main/SysTools.hs | 2 +-
compiler/rename/RnBinds.hs | 2 +-
compiler/rename/RnPat.hs | 2 +-
compiler/specialise/SpecConstr.hs | 4 ++--
compiler/utils/Binary.hs | 4 ++--
rts/Schedule.c | 2 +-
7 files changed, 9 insertions(+), 9 deletions(-)
diff --git a/compiler/basicTypes/MkId.hs b/compiler/basicTypes/MkId.hs
index 08b9efa..e9a57bc 100644
--- a/compiler/basicTypes/MkId.hs
+++ b/compiler/basicTypes/MkId.hs
@@ -1497,7 +1497,7 @@ Also see https://ghc.haskell.org/trac/ghc/wiki/OneShot.
Note [magicDictId magic]
~~~~~~~~~~~~~~~~~~~~~~~~~
The identifier `magicDict` is just a place-holder, which is used to
-implement a primitve that we cannot define in Haskell but we can write
+implement a primitive that we cannot define in Haskell but we can write
in Core. It is declared with a place-holder type:
magicDict :: forall a. a
diff --git a/compiler/main/SysTools.hs b/compiler/main/SysTools.hs
index ad2e33c..612206b 100644
--- a/compiler/main/SysTools.hs
+++ b/compiler/main/SysTools.hs
@@ -1508,7 +1508,7 @@ foreign import WINDOWS_CCONV unsafe "windows.h GetModuleFileNameW"
-- is located at. See Trac #11759.
getFinalPath :: FilePath -> IO (Maybe FilePath)
getFinalPath name = do
- dllHwnd <- failIfNull "LoadLibray" $ loadLibrary "kernel32.dll"
+ dllHwnd <- failIfNull "LoadLibrary" $ loadLibrary "kernel32.dll"
-- Note: The API GetFinalPathNameByHandleW is only available starting from Windows Vista.
-- This means that we can't bind directly to it since it may be missing.
-- Instead try to find it's address at runtime and if we don't succeed consider the
diff --git a/compiler/rename/RnBinds.hs b/compiler/rename/RnBinds.hs
index 0b4cbeb..f91ca52 100644
--- a/compiler/rename/RnBinds.hs
+++ b/compiler/rename/RnBinds.hs
@@ -518,7 +518,7 @@ because they don't do anything! But we have two exceptions:
(b) is sometimes used to give a type sig for,
or an occurrence of, a variable on the RHS
-* A strict patten binding; that is, one with an outermost bang
+* A strict pattern binding; that is, one with an outermost bang
!Just _ = e
This can fail, so unlike the lazy variant, it is not a no-op.
Moreover, Trac #13646 argues that even for single constructor
diff --git a/compiler/rename/RnPat.hs b/compiler/rename/RnPat.hs
index 77e2134..ac3cf64 100644
--- a/compiler/rename/RnPat.hs
+++ b/compiler/rename/RnPat.hs
@@ -432,7 +432,7 @@ rnPatAndThen mk (NPlusKPat rdr (L l lit) _ _ _ _)
; (lit', _) <- liftCpsFV $ rnOverLit lit -- See Note [Negative zero]
-- We skip negateName as
-- negative zero doesn't make
- -- sense in n + k pattenrs
+ -- sense in n + k patterns
; minus <- liftCpsFV $ lookupSyntaxName minusName
; ge <- liftCpsFV $ lookupSyntaxName geName
; return (NPlusKPat (L (nameSrcSpan new_name) new_name)
diff --git a/compiler/specialise/SpecConstr.hs b/compiler/specialise/SpecConstr.hs
index dd6f191..39ec7e6 100644
--- a/compiler/specialise/SpecConstr.hs
+++ b/compiler/specialise/SpecConstr.hs
@@ -1952,8 +1952,8 @@ trim_pats env fn (SI { si_n_specs = done_spec_count }) pats
-- segment of this list
pat_cons :: CallPat -> Int
- -- How many data consturorst of literals are in
- -- the patten. More data-cons => less general
+ -- How many data constructors of literals are in
+ -- the pattern. More data-cons => less general
pat_cons (qs, ps) = foldr ((+) . n_cons) 0 ps
where
q_set = mkVarSet qs
diff --git a/compiler/utils/Binary.hs b/compiler/utils/Binary.hs
index 9d385d2..99ab07e 100644
--- a/compiler/utils/Binary.hs
+++ b/compiler/utils/Binary.hs
@@ -336,7 +336,7 @@ getByte :: BinHandle -> IO Word8
getByte h = getWord8 h
-- -----------------------------------------------------------------------------
--- Primitve Word writes
+-- Primitive Word writes
instance Binary Word8 where
put_ = putWord8
@@ -355,7 +355,7 @@ instance Binary Word64 where
get h = getWord64 h
-- -----------------------------------------------------------------------------
--- Primitve Int writes
+-- Primitive Int writes
instance Binary Int8 where
put_ h w = put_ h (fromIntegral w :: Word8)
diff --git a/rts/Schedule.c b/rts/Schedule.c
index 0a1d761..f82d924 100644
--- a/rts/Schedule.c
+++ b/rts/Schedule.c
@@ -2835,7 +2835,7 @@ deleteThread_(Capability *cap, StgTSO *tso)
/* -----------------------------------------------------------------------------
raiseExceptionHelper
- This function is called by the raise# primitve, just so that we can
+ This function is called by the raise# primitive, just so that we can
move some of the tricky bits of raising an exception from C-- into
C. Who knows, it might be a useful re-useable thing here too.
-------------------------------------------------------------------------- */
More information about the ghc-commits
mailing list