Skip to content

Commit

Permalink
s/implict/implicit/i
Browse files Browse the repository at this point in the history
Signed-off-by: Edward Z. Yang <ezyang@cs.stanford.edu>
  • Loading branch information
ezyang committed May 30, 2014
1 parent a23f131 commit fc6a952
Show file tree
Hide file tree
Showing 8 changed files with 13 additions and 13 deletions.
10 changes: 5 additions & 5 deletions compiler/iface/LoadIface.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -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).
-----------------------------------------------------
Expand Down Expand Up @@ -445,19 +445,19 @@ 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>, ... ]
-- where the 'MkT' here is the *OccName* associated with MkT.
--
-- 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
Expand Down Expand Up @@ -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
Expand Down
2 changes: 1 addition & 1 deletion compiler/main/HscTypes.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -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).
Expand Down
2 changes: 1 addition & 1 deletion compiler/main/TidyPgm.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -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 }
Expand Down
4 changes: 2 additions & 2 deletions compiler/typecheck/TcValidity.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -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 ()
Expand Down Expand Up @@ -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
Expand Down
2 changes: 1 addition & 1 deletion testsuite/tests/typecheck/should_fail/T8912.stderr
Original file line number Diff line number Diff line change
@@ -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]’
2 changes: 1 addition & 1 deletion testsuite/tests/typecheck/should_fail/tcfail041.stderr
Original file line number Diff line number Diff line change
@@ -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’
2 changes: 1 addition & 1 deletion testsuite/tests/typecheck/should_fail/tcfail211.stderr
Original file line number Diff line number Diff line change
@@ -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’
2 changes: 1 addition & 1 deletion testsuite/tests/typecheck/should_run/tcrun045.stderr
Original file line number Diff line number Diff line change
@@ -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’

0 comments on commit fc6a952

Please sign in to comment.