[commit: ghc] master: s/implict/implicit/i (fc6a952)

git at git.haskell.org git at git.haskell.org
Fri May 30 01:36:58 UTC 2014


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

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

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

commit fc6a9525baad53ba3aa5acd545470df738ca54a9
Author: Edward Z. Yang <ezyang at cs.stanford.edu>
Date:   Thu May 29 17:25:41 2014 -0700

    s/implict/implicit/i
    
    Signed-off-by: Edward Z. Yang <ezyang at cs.stanford.edu>


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

fc6a9525baad53ba3aa5acd545470df738ca54a9
 compiler/iface/LoadIface.lhs                           | 10 +++++-----
 compiler/main/HscTypes.lhs                             |  2 +-
 compiler/main/TidyPgm.lhs                              |  2 +-
 compiler/typecheck/TcValidity.lhs                      |  4 ++--
 testsuite/tests/typecheck/should_fail/T8912.stderr     |  2 +-
 testsuite/tests/typecheck/should_fail/tcfail041.stderr |  2 +-
 testsuite/tests/typecheck/should_fail/tcfail211.stderr |  2 +-
 testsuite/tests/typecheck/should_run/tcrun045.stderr   |  2 +-
 8 files changed, 13 insertions(+), 13 deletions(-)

diff --git a/compiler/iface/LoadIface.lhs b/compiler/iface/LoadIface.lhs
index 30b2f0b..8f02282 100644
--- a/compiler/iface/LoadIface.lhs
+++ b/compiler/iface/LoadIface.lhs
@@ -392,7 +392,7 @@ compiler expects.
 -- the declaration itself, will find the fully-glorious Name
 --
 -- We handle ATs specially.  They are not main declarations, but also not
--- implict things (in particular, adding them to `implicitTyThings' would mess
+-- implicit things (in particular, adding them to `implicitTyThings' would mess
 -- things up in the renaming/type checking of source programs).
 -----------------------------------------------------
 
@@ -445,11 +445,11 @@ loadDecl ignore_prags mod (_version, decl)
         --      [ "MkT" -> <datacon MkT>, "x" -> <selector x>, ... ]
         -- (where the "MkT" is the *Name* associated with MkT, etc.)
         --
-        -- We do this by mapping the implict_names to the associated
+        -- We do this by mapping the implicit_names to the associated
         -- TyThings.  By the invariant on ifaceDeclImplicitBndrs and
         -- implicitTyThings, we can use getOccName on the implicit
         -- TyThings to make this association: each Name's OccName should
-        -- be the OccName of exactly one implictTyThing.  So the key is
+        -- be the OccName of exactly one implicitTyThing.  So the key is
         -- to define a "mini-env"
         --
         -- [ 'MkT' -> <datacon MkT>, 'x' -> <selector x>, ... ]
@@ -457,7 +457,7 @@ loadDecl ignore_prags mod (_version, decl)
         --
         -- However, there is a subtlety: due to how type checking needs
         -- to be staged, we can't poke on the forkM'd thunks inside the
-        -- implictTyThings while building this mini-env.  
+        -- implicitTyThings while building this mini-env.  
         -- If we poke these thunks too early, two problems could happen:
         --    (1) When processing mutually recursive modules across
         --        hs-boot boundaries, poking too early will do the
@@ -494,7 +494,7 @@ loadDecl ignore_prags mod (_version, decl)
 --         ; traceIf (text "Loading decl for " <> ppr main_name $$ ppr implicit_names)
         ; return $ (main_name, thing) :
                       -- uses the invariant that implicit_names and
-                      -- implictTyThings are bijective
+                      -- implicitTyThings are bijective
                       [(n, lookup n) | n <- implicit_names]
         }
   where
diff --git a/compiler/main/HscTypes.lhs b/compiler/main/HscTypes.lhs
index 875badf..8843d95 100644
--- a/compiler/main/HscTypes.lhs
+++ b/compiler/main/HscTypes.lhs
@@ -1484,7 +1484,7 @@ Examples:
     IfaceClass decl happens to use IfaceDecl recursively for the
     associated types, but that's irrelevant here.)
 
-  * Dictionary function Ids are not implict.
+  * Dictionary function Ids are not implicit.
 
   * Axioms for newtypes are implicit (same as above), but axioms
     for data/type family instances are *not* implicit (like DFunIds).
diff --git a/compiler/main/TidyPgm.lhs b/compiler/main/TidyPgm.lhs
index e974c82..9904bb0 100644
--- a/compiler/main/TidyPgm.lhs
+++ b/compiler/main/TidyPgm.lhs
@@ -520,7 +520,7 @@ of exceptions, and finally I gave up the battle:
 
 Note [Injecting implicit bindings]
 ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
-We inject the implict bindings right at the end, in CoreTidy.
+We inject the implicit bindings right at the end, in CoreTidy.
 Some of these bindings, notably record selectors, are not
 constructed in an optimised form.  E.g. record selector for
         data T = MkT { x :: {-# UNPACK #-} !Int }
diff --git a/compiler/typecheck/TcValidity.lhs b/compiler/typecheck/TcValidity.lhs
index 6177657..aa5ed07 100644
--- a/compiler/typecheck/TcValidity.lhs
+++ b/compiler/typecheck/TcValidity.lhs
@@ -508,7 +508,7 @@ okIPCtxt (SpecInstCtxt {}) = False
 okIPCtxt _                 = True
 
 badIPPred :: PredType -> SDoc
-badIPPred pred = ptext (sLit "Illegal implict parameter") <+> quotes (ppr pred)
+badIPPred pred = ptext (sLit "Illegal implicit parameter") <+> quotes (ppr pred)
 
 
 check_eq_pred :: DynFlags -> UserTypeCtxt -> PredType -> TcType -> TcType -> TcM ()
@@ -652,7 +652,7 @@ unambiguous. See Note [Impedence matching] in TcBinds.
 This test is very conveniently implemented by calling
     tcSubType <type> <type>
 This neatly takes account of the functional dependecy stuff above, 
-and implict parameter (see Note [Implicit parameters and ambiguity]).
+and implicit parameter (see Note [Implicit parameters and ambiguity]).
 
 What about this, though?
    g :: C [a] => Int
diff --git a/testsuite/tests/typecheck/should_fail/T8912.stderr b/testsuite/tests/typecheck/should_fail/T8912.stderr
index 24607c2..ad343f3 100644
--- a/testsuite/tests/typecheck/should_fail/T8912.stderr
+++ b/testsuite/tests/typecheck/should_fail/T8912.stderr
@@ -1,6 +1,6 @@
 
 T8912.hs:7:10:
-    Illegal implict parameter ‘?imp::Int’
+    Illegal implicit parameter ‘?imp::Int’
     In the context: (?imp::Int)
     While checking an instance declaration
     In the instance declaration for ‘C [a]’
diff --git a/testsuite/tests/typecheck/should_fail/tcfail041.stderr b/testsuite/tests/typecheck/should_fail/tcfail041.stderr
index ba5d4a1..c81d309 100644
--- a/testsuite/tests/typecheck/should_fail/tcfail041.stderr
+++ b/testsuite/tests/typecheck/should_fail/tcfail041.stderr
@@ -1,6 +1,6 @@
 
 tcfail041.hs:5:1:
-    Illegal implict parameter ‘?imp::Int’
+    Illegal implicit parameter ‘?imp::Int’
     In the context: (?imp::Int)
     While checking the super-classes of class ‘D’
     In the class declaration for ‘D’
diff --git a/testsuite/tests/typecheck/should_fail/tcfail211.stderr b/testsuite/tests/typecheck/should_fail/tcfail211.stderr
index 3adb97c..0d9d23d 100644
--- a/testsuite/tests/typecheck/should_fail/tcfail211.stderr
+++ b/testsuite/tests/typecheck/should_fail/tcfail211.stderr
@@ -1,6 +1,6 @@
 
 tcfail211.hs:5:1:
-    Illegal implict parameter ‘?imp::Int’
+    Illegal implicit parameter ‘?imp::Int’
     In the context: (?imp::Int)
     While checking the super-classes of class ‘D’
     In the class declaration for ‘D’
diff --git a/testsuite/tests/typecheck/should_run/tcrun045.stderr b/testsuite/tests/typecheck/should_run/tcrun045.stderr
index 82826c2..4017279 100644
--- a/testsuite/tests/typecheck/should_run/tcrun045.stderr
+++ b/testsuite/tests/typecheck/should_run/tcrun045.stderr
@@ -1,6 +1,6 @@
 
 tcrun045.hs:24:1:
-    Illegal implict parameter ‘?imp::Int’
+    Illegal implicit parameter ‘?imp::Int’
     In the context: (?imp::Int)
     While checking the super-classes of class ‘D’
     In the class declaration for ‘D’



More information about the ghc-commits mailing list