[Git][ghc/ghc][wip/T25647] clear up candidateQTyVarsWithBinders
Patrick (@soulomoon)
gitlab at gitlab.haskell.org
Thu Mar 13 15:04:59 UTC 2025
Patrick pushed to branch wip/T25647 at Glasgow Haskell Compiler / GHC
Commits:
002e69f9 by Patrick at 2025-03-13T23:04:48+08:00
clear up candidateQTyVarsWithBinders
- - - - -
3 changed files:
- compiler/GHC/Tc/TyCl.hs
- compiler/GHC/Tc/Utils/TcMType.hs
- compiler/GHC/Tc/Zonk/TcType.hs
Changes:
=====================================
compiler/GHC/Tc/TyCl.hs
=====================================
@@ -253,14 +253,12 @@ tcFamInstLHSBinders :: TcLevel -> SkolemInfo -> HsOuterFamEqnTyVarBndrs GhcTc ->
-> [TcTyVar] -> Type -> WantedConstraints -> IOEnv (Env TcGblEnv TcLclEnv) ([TyCoVar], [TcTyVar])
tcFamInstLHSBinders tclvl skol_info outer_bndrs hs_outer_bndrs wcs lhs_ty wanted = do
- -- See Note [Type variables in type families instance decl]
; let outer_exp_tvs = scopedSort $ explicitOuterTyVars outer_bndrs
; let outer_imp_tvs = implicitOuterTyVars outer_bndrs
; checkFamTelescope tclvl hs_outer_bndrs outer_exp_tvs
- ; wc_itvs <- liftZonkM $ zonkInvariants wcs
- ; outer_imp_itvs <- liftZonkM $ zonkInvariants outer_imp_tvs
-- See GHC.Tc.TyCl Note [Generalising in tcTyFamInstEqnGuts]
- ; dvs <- candidateQTyVarsWithBinders (outer_exp_tvs ++ outer_imp_tvs ++ wcs) lhs_ty
+ -- See Note [Type variables in type families instance decl]
+ ; (dvs, wc_itvs, outer_imp_itvs) <- candidateQTyVarsWithBinders outer_exp_tvs outer_imp_tvs wcs lhs_ty
; (qtvs, outer_imp_qtvs) <- quantifyTyVarsWithBinders wc_itvs outer_imp_itvs skol_info dvs
-- Have to make a same defaulting choice for result kind here
-- and the `kindGeneralizeAll` in `tcConDecl`.
=====================================
compiler/GHC/Tc/Utils/TcMType.hs
=====================================
@@ -1369,6 +1369,11 @@ candidateVars (DV { dv_kvs = dep_kv_set, dv_tvs = nondep_tkv_set })
candidateKindVars :: CandidatesQTvs -> TyVarSet
candidateKindVars dvs = dVarSetToVarSet (dv_kvs dvs)
+intersectCandidates :: CandidatesQTvs -> [Var] -> [Var]
+intersectCandidates (DV { dv_kvs = kvs, dv_tvs = tvs }) varList
+ = dVarSetElems $ kvs `intersectDVarSet` vars `unionDVarSet` (tvs `intersectDVarSet` vars)
+ where vars = mkDVarSet varList
+
delCandidates :: CandidatesQTvs -> [Var] -> CandidatesQTvs
delCandidates (DV { dv_kvs = kvs, dv_tvs = tvs, dv_cvs = cvs }) vars
= DV { dv_kvs = kvs `delDVarSetList` vars
@@ -1384,21 +1389,23 @@ partitionCandidates dvs@(DV { dv_kvs = kvs, dv_tvs = tvs }) pred
(extracted_tvs, rest_tvs) = partitionDVarSet pred tvs
extracted = dVarSetToVarSet extracted_kvs `unionVarSet` dVarSetToVarSet extracted_tvs
-candidateQTyVarsWithBinders :: [TyVar] -> Type -> TcM CandidatesQTvs
+candidateQTyVarsWithBinders :: [TyVar] -> [TyVar] -> [TyVar] -> Type -> TcM (CandidatesQTvs, [TyVar], [TyVar])
-- (candidateQTyVarsWithBinders tvs ty) returns the candidateQTyVars
-- of (forall tvs. ty), but do not treat 'tvs' as bound for the purpose
-- of Note [Naughty quantification candidates]. Why?
-- Because we are going to scoped-sort the quantified variables
-- in among the tvs
-candidateQTyVarsWithBinders bound_tvs ty
+candidateQTyVarsWithBinders outer_exp_tvs outer_imp_tvs wcs ty
= do { kvs <- candidateQTyVarsOfKinds (map tyVarKind bound_tvs)
; cur_lvl <- getTcLevel
; all_tvs <- collect_cand_qtvs ty False cur_lvl emptyVarSet kvs ty
- ; return (all_tvs `delCandidates` bound_tvs)}
+ ; return (all_tvs `delCandidates` bound_tvs, intersectCandidates all_tvs outer_imp_tvs, intersectCandidates all_tvs wcs) }
+ where
+ bound_tvs = outer_exp_tvs ++ outer_imp_tvs ++ wcs
-- | Gathers free variables to use as quantification candidates (in
--- 'quantifyTyVarsWithBinders). This might output the same var
+-- 'quantifyTyVarsWithBinders'). This might output the same var
-- in both sets, if it's used in both a type and a kind.
-- The variables to quantify must have a TcLevel strictly greater than
-- the ambient level. (See Wrinkle in Note [Naughty quantification candidates])
@@ -1763,7 +1770,7 @@ quantifyTyVarsWithBinders ::
-- to the restrictions in Note [quantifyTyVars].
-- for wildcards, do not default, just skolemise add to the list of quantified
--- for outer_imp_qtvs, do not default and skolemise, and return separately
+-- for outer_imp_qtvs, do not default, just skolemise, and return separately
quantifyTyVarsWithBinders wc_itvs outer_imp_itvs skol_info dvs
-- short-circuit common case
| isEmptyCandidates dvs && null wc_itvs && null outer_imp_itvs
@@ -1780,10 +1787,9 @@ quantifyTyVarsWithBinders wc_itvs outer_imp_itvs skol_info dvs
; undefaulted <- defaultTyVars dvs
; (final_qtvs, out_imp_qtvs) <- liftZonkM $ do
- qtvs <- mapMaybeM zonk_quant undefaulted
- wc_qtv <- mapMaybeM zonk_quant wc_itvs
+ qtvs <- mapMaybeM zonk_quant (undefaulted ++ wc_itvs)
out_imp_qtvs <- mapMaybeM zonk_quant outer_imp_itvs
- return (qtvs ++ wc_qtv, out_imp_qtvs)
+ return (qtvs, out_imp_qtvs)
; traceTc "quantifyTyVars }"
(vcat [ text "undefaulted:" <+> pprTyVars undefaulted
@@ -1792,7 +1798,7 @@ quantifyTyVarsWithBinders wc_itvs outer_imp_itvs skol_info dvs
])
-- We should never quantify over coercion variables; check this
- ; let co_vars = filter isCoVar final_qtvs
+ ; let co_vars = filter isCoVar (final_qtvs ++ out_imp_qtvs)
; massertPpr (null co_vars) (ppr co_vars)
; return (final_qtvs, out_imp_qtvs) }
=====================================
compiler/GHC/Tc/Zonk/TcType.hs
=====================================
@@ -20,7 +20,6 @@ module GHC.Tc.Zonk.TcType
, zonkTcTyVarToTcTyVar, zonkTcTyVarsToTcTyVars
, zonkInvisTVBinder
, zonkCo
- , zonkInvariants
-- ** Zonking 'TyCon's
, zonkTcTyCon
@@ -270,13 +269,6 @@ zonkTcTyVar tv
zonkTcTyVarsToTcTyVars :: HasDebugCallStack => [TcTyVar] -> ZonkM [TcTyVar]
zonkTcTyVarsToTcTyVars = mapM zonkTcTyVarToTcTyVar
--- let x = zonked and y = unzonked
--- take intersection of x and y
-zonkInvariants :: HasDebugCallStack => [TcTyVar] -> ZonkM [TcTyVar]
-zonkInvariants y = do
- x <- mapMaybeM (fmap getTyVar_maybe . zonkTcTyVar) y
- return $ dVarSetElems $ mkDVarSet y `intersectDVarSet` mkDVarSet x
-
zonkTcTyVarToTcTyVar :: HasDebugCallStack => TcTyVar -> ZonkM TcTyVar
zonkTcTyVarToTcTyVar tv
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/002e69f975752208c082b02c9c990ed985ba11d1
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/002e69f975752208c082b02c9c990ed985ba11d1
You're receiving this email because of your account on gitlab.haskell.org.
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20250313/014aadac/attachment-0001.html>
More information about the ghc-commits
mailing list