[Git][ghc/ghc][wip/T23109] More rebase wibbles

Simon Peyton Jones (@simonpj) gitlab at gitlab.haskell.org
Tue Feb 4 17:44:36 UTC 2025



Simon Peyton Jones pushed to branch wip/T23109 at Glasgow Haskell Compiler / GHC


Commits:
b2d27a75 by Simon Peyton Jones at 2025-02-04T17:44:16+00:00
More rebase wibbles

- - - - -


3 changed files:

- compiler/GHC/Core/Lint.hs
- compiler/GHC/CoreToStg/Prep.hs
- compiler/GHC/Tc/Instance/Class.hs


Changes:

=====================================
compiler/GHC/Core/Lint.hs
=====================================
@@ -2599,8 +2599,7 @@ lintCoercion the_co@(SelCo cs co)
             -> failWithL $ hang (text "Bad SelCo:") 2 $
                vcat [ text "the_co:" <+> ppr the_co
                     , text "lhs type:" <+> ppr s
-                    , text "rhs type:" <+> ppr t
-                    , text "role:" <+> ppr co_role ] }
+                    , text "rhs type:" <+> ppr t ] }
 
 lintCoercion the_co@(LRCo _lr co)
   = do { lintCoercion co


=====================================
compiler/GHC/CoreToStg/Prep.hs
=====================================
@@ -40,7 +40,7 @@ import GHC.Core.Coercion
 import GHC.Core.TyCon
 import GHC.Core.Class( classTyCon )
 import GHC.Core.DataCon
-import GHC.Core.TyCo.Rep( UnivCoProvenance(..), scaledThing )
+import GHC.Core.TyCo.Rep( scaledThing )
 import GHC.Core.Opt.OccurAnal
 
 import GHC.Data.Maybe
@@ -1349,9 +1349,9 @@ isUnaryClassApp v args
   where
     -- mk_co makes a coercion of kind (C ta tb tc ~ ty[t1/a,tb/b,tc/c])
     mk_co tycon ty_args
+      | [meth_ty] <- dataConInstArgTys (tyConSingleDataCon tycon) ty_args
       = mkUnaryClassCo (mkTyConApp tycon ty_args) (scaledThing meth_ty)
-      where
-        [meth_ty] = dataConInstArgTys (tyConSingleDataCon tycon) ty_args
+      | otherwise = pprPanic "isUnaryClassApp" (ppr args $$ ppr tycon $$ ppr ty_args)
 
 getUnaryClassPayload :: TyCon -> [ArgInfo] -> Maybe (CoreExpr, [Type], [ArgInfo])
 getUnaryClassPayload tc args


=====================================
compiler/GHC/Tc/Instance/Class.hs
=====================================
@@ -21,7 +21,7 @@ import GHC.Tc.Utils.TcMType
 import GHC.Tc.Types.Evidence
 import GHC.Tc.Types.CtLoc
 import GHC.Tc.Types.Origin ( InstanceWhat (..), SafeOverlapping, CtOrigin(GetFieldOrigin) )
-import GHC.Tc.Instance.Family( tcGetFamInstEnvs, tcInstNewTyCon_maybe, tcLookupDataFamInst, FamInstEnvs )
+import GHC.Tc.Instance.Family( tcGetFamInstEnvs, tcLookupDataFamInst, FamInstEnvs )
 
 import GHC.Rename.Env( addUsedGRE, addUsedDataCons, DeprecationWarnings (..) )
 



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/b2d27a75e6f4d94e0ee2c6cd259efbc349e335ee
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/20250204/58284358/attachment-0001.html>


More information about the ghc-commits mailing list