[Git][ghc/ghc][wip/T25647] clean up trace statements and remove unused function

Patrick (@soulomoon) gitlab at gitlab.haskell.org
Thu Mar 13 00:48:14 UTC 2025



Patrick pushed to branch wip/T25647 at Glasgow Haskell Compiler / GHC


Commits:
90ccf36d by Patrick at 2025-03-13T08:48:04+08:00
clean up trace statements and remove unused function

- - - - -


3 changed files:

- compiler/GHC/Tc/Solver.hs
- compiler/GHC/Tc/TyCl/Instance.hs
- compiler/GHC/Tc/Utils/TcMType.hs


Changes:

=====================================
compiler/GHC/Tc/Solver.hs
=====================================
@@ -175,7 +175,6 @@ pushLevelAndSolveEqualities skol_info_anon tcbs thing_inside
        ; report_unsolved_equalities skol_info_anon (binderVars tcbs) tclvl wanted
        ; return res }
 
-
 pushLevelAndSolveEqualitiesX :: String -> TcM a
                              -> TcM (TcLevel, WantedConstraints, a)
 -- Push the level, gather equality constraints, and then solve them.


=====================================
compiler/GHC/Tc/TyCl/Instance.hs
=====================================
@@ -507,8 +507,7 @@ tcClsInstDecl (L loc (ClsInstDecl { cid_ext = lwarn
                            fst $ splitForAllForAllTyBinders dfun_ty
               visible_skol_tvs = drop n_inferred skol_tvs
 
-        ; traceTc "tcLocalInstDecl 1" (ppr dfun_ty $$ ppr (invisibleBndrCount dfun_ty) $$ ppr skol_tvs
-                $$ ppr (classTyVars clas))
+        ; traceTc "tcLocalInstDecl 1" (ppr dfun_ty $$ ppr (invisibleBndrCount dfun_ty) $$ ppr skol_tvs)
 
         -- Next, process any associated types.
         ; (datafam_stuff, tyfam_insts)


=====================================
compiler/GHC/Tc/Utils/TcMType.hs
=====================================
@@ -827,7 +827,7 @@ cloneAnonMetaTyVar info tv kind
   = do  { details <- newMetaDetails info
         ; name    <- cloneMetaTyVarName (tyVarName tv)
         ; let tyvar = mkTcTyVar name kind details
-        ; traceTc "cloneAnonMetaTyVar" (ppr tyvar <+> dcolon <+> ppr (tyVarKind tyvar) <+> text "from" <+> ppr tv)
+        ; traceTc "cloneAnonMetaTyVar" (ppr tyvar <+> dcolon <+> ppr (tyVarKind tyvar))
         ; return tyvar }
 
 -- Make a new CycleBreakerTv. See Note [Type equality cycles]
@@ -1375,14 +1375,6 @@ delCandidates (DV { dv_kvs = kvs, dv_tvs = tvs, dv_cvs = cvs }) vars
        , dv_tvs = tvs `delDVarSetList` vars
        , dv_cvs = cvs `delVarSetList`  vars }
 
-boundedCandidates :: CandidatesQTvs -> [Var] -> [Var]
-boundedCandidates (DV { dv_kvs = kvs, dv_tvs = tvs, dv_cvs = _cvs }) vars
-  =  dVarSetElems $
-          (kvs `intersectDVarSet` dvars)
-          `unionDVarSet` (tvs `intersectDVarSet` dvars)
-  where dvars = extendDVarSetList emptyDVarSet vars
-
-
 partitionCandidates :: CandidatesQTvs -> (TyVar -> Bool) -> (TyVarSet, CandidatesQTvs)
 -- The selected TyVars are returned as a non-deterministic TyVarSet
 partitionCandidates dvs@(DV { dv_kvs = kvs, dv_tvs = tvs }) pred



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/90ccf36daedba03fdac61d86f2e34a07fb2daf89

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/90ccf36daedba03fdac61d86f2e34a07fb2daf89
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/20250312/bb1c8c58/attachment-0001.html>


More information about the ghc-commits mailing list