{-# LANGUAGE DerivingStrategies #-}
module GHC.Core.Predicate (
Pred(..), classifyPredType,
isPredTy, isEvVarType,
EqRel(..), eqRelRole,
isEqPred, isReprEqPred, isEqClassPred, isCoVarType,
getEqPredTys, getEqPredTys_maybe, getEqPredRole,
predTypeEqRel,
mkNomEqPred, mkReprEqPred, mkEqPred, mkEqPredRole,
mkClassPred, isDictTy, typeDeterminesValue,
isClassPred, isEqualityClass, isCTupleClass,
getClassPredTys, getClassPredTys_maybe,
classMethodTy, classMethodInstTy,
isIPLikePred, mentionsIP, isIPTyCon, isIPClass,
isCallStackTy, isCallStackPred, isCallStackPredTy,
isExceptionContextPred, isExceptionContextTy,
isIPPred_maybe,
DictId, isEvVar, isDictId,
scopedSort, tyCoVarsOfTypeWellScoped,
tyCoVarsOfTypesWellScoped,
CanEqLHS(..), canEqLHS_maybe, canTyFamEqLHS_maybe,
canEqLHSKind, canEqLHSType, eqCanEqLHS
) where
import GHC.Prelude
import GHC.Core.Type
import GHC.Core.Class
import GHC.Core.TyCo.Compare( tcEqTyConApps )
import GHC.Core.TyCo.FVs( tyCoVarsOfTypeList, tyCoVarsOfTypesList )
import GHC.Core.TyCon
import GHC.Core.TyCon.RecWalk
import GHC.Types.Var
import GHC.Types.Var.Set
import GHC.Core.Multiplicity ( scaledThing )
import GHC.Builtin.Names
import GHC.Builtin.Types.Prim( eqPrimTyCon, eqReprPrimTyCon )
import GHC.Utils.Outputable
import GHC.Utils.Misc
import GHC.Utils.Panic
import GHC.Data.FastString
data Pred
= ClassPred Class [Type]
| EqPred EqRel Type Type
| IrredPred PredType
| ForAllPred [TyVar] [PredType] PredType
classifyPredType :: PredType -> Pred
classifyPredType :: PredType -> Pred
classifyPredType PredType
ev_ty = case HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
splitTyConApp_maybe PredType
ev_ty of
Just (TyCon
tc, [PredType
_, PredType
_, PredType
ty1, PredType
ty2])
| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqReprPrimTyConKey -> EqRel -> PredType -> PredType -> Pred
EqPred EqRel
ReprEq PredType
ty1 PredType
ty2
| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqPrimTyConKey -> EqRel -> PredType -> PredType -> Pred
EqPred EqRel
NomEq PredType
ty1 PredType
ty2
Just (TyCon
tc, [PredType]
tys)
| Just Class
clas <- TyCon -> Maybe Class
tyConClass_maybe TyCon
tc
-> Class -> [PredType] -> Pred
ClassPred Class
clas [PredType]
tys
Maybe (TyCon, [PredType])
_ | ([TyVar]
tvs, PredType
rho) <- PredType -> ([TyVar], PredType)
splitForAllTyCoVars PredType
ev_ty
, ([Scaled PredType]
theta, PredType
pred) <- PredType -> ([Scaled PredType], PredType)
splitFunTys PredType
rho
, Bool -> Bool
not ([TyVar] -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [TyVar]
tvs Bool -> Bool -> Bool
&& [Scaled PredType] -> Bool
forall a. [a] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Scaled PredType]
theta)
-> [TyVar] -> [PredType] -> PredType -> Pred
ForAllPred [TyVar]
tvs ((Scaled PredType -> PredType) -> [Scaled PredType] -> [PredType]
forall a b. (a -> b) -> [a] -> [b]
map Scaled PredType -> PredType
forall a. Scaled a -> a
scaledThing [Scaled PredType]
theta) PredType
pred
| Bool
otherwise
-> PredType -> Pred
IrredPred PredType
ev_ty
mkClassPred :: Class -> [Type] -> PredType
mkClassPred :: Class -> [PredType] -> PredType
mkClassPred Class
clas [PredType]
tys = TyCon -> [PredType] -> PredType
mkTyConApp (Class -> TyCon
classTyCon Class
clas) [PredType]
tys
isDictTy :: Type -> Bool
isDictTy :: PredType -> Bool
isDictTy PredType
ty = PredType -> Bool
isClassPred PredType
pred
where
([PiTyBinder]
_, PredType
pred) = PredType -> ([PiTyBinder], PredType)
splitInvisPiTys PredType
ty
typeDeterminesValue :: Type -> Bool
typeDeterminesValue :: PredType -> Bool
typeDeterminesValue PredType
ty = PredType -> Bool
isDictTy PredType
ty Bool -> Bool -> Bool
&& Bool -> Bool
not (PredType -> Bool
isIPLikePred PredType
ty)
getClassPredTys :: HasDebugCallStack => PredType -> (Class, [Type])
getClassPredTys :: HasDebugCallStack => PredType -> (Class, [PredType])
getClassPredTys PredType
ty = case PredType -> Maybe (Class, [PredType])
getClassPredTys_maybe PredType
ty of
Just (Class
clas, [PredType]
tys) -> (Class
clas, [PredType]
tys)
Maybe (Class, [PredType])
Nothing -> String -> SDoc -> (Class, [PredType])
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"getClassPredTys" (PredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr PredType
ty)
getClassPredTys_maybe :: PredType -> Maybe (Class, [Type])
getClassPredTys_maybe :: PredType -> Maybe (Class, [PredType])
getClassPredTys_maybe PredType
ty = case HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
splitTyConApp_maybe PredType
ty of
Just (TyCon
tc, [PredType]
tys) | Just Class
clas <- TyCon -> Maybe Class
tyConClass_maybe TyCon
tc -> (Class, [PredType]) -> Maybe (Class, [PredType])
forall a. a -> Maybe a
Just (Class
clas, [PredType]
tys)
Maybe (TyCon, [PredType])
_ -> Maybe (Class, [PredType])
forall a. Maybe a
Nothing
classMethodTy :: Id -> Type
classMethodTy :: TyVar -> PredType
classMethodTy TyVar
sel_id
= HasDebugCallStack => PredType -> PredType
PredType -> PredType
funResultTy (PredType -> PredType) -> PredType -> PredType
forall a b. (a -> b) -> a -> b
$
PredType -> PredType
dropForAlls (PredType -> PredType) -> PredType -> PredType
forall a b. (a -> b) -> a -> b
$
TyVar -> PredType
varType TyVar
sel_id
classMethodInstTy :: Id -> [Type] -> Type
classMethodInstTy :: TyVar -> [PredType] -> PredType
classMethodInstTy TyVar
sel_id [PredType]
arg_tys
= HasDebugCallStack => PredType -> PredType
PredType -> PredType
funResultTy (PredType -> PredType) -> PredType -> PredType
forall a b. (a -> b) -> a -> b
$
HasDebugCallStack => PredType -> [PredType] -> PredType
PredType -> [PredType] -> PredType
piResultTys (TyVar -> PredType
varType TyVar
sel_id) [PredType]
arg_tys
data EqRel = NomEq | ReprEq
deriving (EqRel -> EqRel -> Bool
(EqRel -> EqRel -> Bool) -> (EqRel -> EqRel -> Bool) -> Eq EqRel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: EqRel -> EqRel -> Bool
== :: EqRel -> EqRel -> Bool
$c/= :: EqRel -> EqRel -> Bool
/= :: EqRel -> EqRel -> Bool
Eq, Eq EqRel
Eq EqRel =>
(EqRel -> EqRel -> Ordering)
-> (EqRel -> EqRel -> Bool)
-> (EqRel -> EqRel -> Bool)
-> (EqRel -> EqRel -> Bool)
-> (EqRel -> EqRel -> Bool)
-> (EqRel -> EqRel -> EqRel)
-> (EqRel -> EqRel -> EqRel)
-> Ord EqRel
EqRel -> EqRel -> Bool
EqRel -> EqRel -> Ordering
EqRel -> EqRel -> EqRel
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: EqRel -> EqRel -> Ordering
compare :: EqRel -> EqRel -> Ordering
$c< :: EqRel -> EqRel -> Bool
< :: EqRel -> EqRel -> Bool
$c<= :: EqRel -> EqRel -> Bool
<= :: EqRel -> EqRel -> Bool
$c> :: EqRel -> EqRel -> Bool
> :: EqRel -> EqRel -> Bool
$c>= :: EqRel -> EqRel -> Bool
>= :: EqRel -> EqRel -> Bool
$cmax :: EqRel -> EqRel -> EqRel
max :: EqRel -> EqRel -> EqRel
$cmin :: EqRel -> EqRel -> EqRel
min :: EqRel -> EqRel -> EqRel
Ord)
instance Outputable EqRel where
ppr :: EqRel -> SDoc
ppr EqRel
NomEq = String -> SDoc
forall doc. IsLine doc => String -> doc
text String
"nominal equality"
ppr EqRel
ReprEq = String -> SDoc
forall doc. IsLine doc => String -> doc
text String
"representational equality"
eqRelRole :: EqRel -> Role
eqRelRole :: EqRel -> Role
eqRelRole EqRel
NomEq = Role
Nominal
eqRelRole EqRel
ReprEq = Role
Representational
mkNomEqPred :: Type -> Type -> Type
mkNomEqPred :: PredType -> PredType -> PredType
mkNomEqPred PredType
ty1 PredType
ty2
= TyCon -> [PredType] -> PredType
mkTyConApp TyCon
eqPrimTyCon [PredType
k1, PredType
k2, PredType
ty1, PredType
ty2]
where
k1 :: PredType
k1 = HasDebugCallStack => PredType -> PredType
PredType -> PredType
typeKind PredType
ty1
k2 :: PredType
k2 = HasDebugCallStack => PredType -> PredType
PredType -> PredType
typeKind PredType
ty2
mkReprEqPred :: Type -> Type -> Type
mkReprEqPred :: PredType -> PredType -> PredType
mkReprEqPred PredType
ty1 PredType
ty2
= TyCon -> [PredType] -> PredType
mkTyConApp TyCon
eqReprPrimTyCon [PredType
k1, PredType
k2, PredType
ty1, PredType
ty2]
where
k1 :: PredType
k1 = HasDebugCallStack => PredType -> PredType
PredType -> PredType
typeKind PredType
ty1
k2 :: PredType
k2 = HasDebugCallStack => PredType -> PredType
PredType -> PredType
typeKind PredType
ty2
mkEqPred :: EqRel -> Type -> Type -> PredType
mkEqPred :: EqRel -> PredType -> PredType -> PredType
mkEqPred EqRel
NomEq = PredType -> PredType -> PredType
mkNomEqPred
mkEqPred EqRel
ReprEq = PredType -> PredType -> PredType
mkReprEqPred
mkEqPredRole :: Role -> Type -> Type -> PredType
mkEqPredRole :: Role -> PredType -> PredType -> PredType
mkEqPredRole Role
Nominal = PredType -> PredType -> PredType
mkNomEqPred
mkEqPredRole Role
Representational = PredType -> PredType -> PredType
mkReprEqPred
mkEqPredRole Role
Phantom = String -> PredType -> PredType -> PredType
forall a. HasCallStack => String -> a
panic String
"mkEqPred phantom"
getEqPredTys :: PredType -> (Type, Type)
getEqPredTys :: PredType -> (PredType, PredType)
getEqPredTys PredType
ty
= case HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
splitTyConApp_maybe PredType
ty of
Just (TyCon
tc, [PredType
_, PredType
_, PredType
ty1, PredType
ty2])
| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqPrimTyConKey
Bool -> Bool -> Bool
|| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqReprPrimTyConKey
-> (PredType
ty1, PredType
ty2)
Maybe (TyCon, [PredType])
_ -> String -> SDoc -> (PredType, PredType)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"getEqPredTys" (PredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr PredType
ty)
getEqPredTys_maybe :: PredType -> Maybe (Role, Type, Type)
getEqPredTys_maybe :: PredType -> Maybe (Role, PredType, PredType)
getEqPredTys_maybe PredType
ty
= case HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
splitTyConApp_maybe PredType
ty of
Just (TyCon
tc, [PredType
_, PredType
_, PredType
ty1, PredType
ty2])
| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqPrimTyConKey -> (Role, PredType, PredType) -> Maybe (Role, PredType, PredType)
forall a. a -> Maybe a
Just (Role
Nominal, PredType
ty1, PredType
ty2)
| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqReprPrimTyConKey -> (Role, PredType, PredType) -> Maybe (Role, PredType, PredType)
forall a. a -> Maybe a
Just (Role
Representational, PredType
ty1, PredType
ty2)
Maybe (TyCon, [PredType])
_ -> Maybe (Role, PredType, PredType)
forall a. Maybe a
Nothing
getEqPredRole :: PredType -> Role
getEqPredRole :: PredType -> Role
getEqPredRole PredType
ty = EqRel -> Role
eqRelRole (PredType -> EqRel
predTypeEqRel PredType
ty)
predTypeEqRel :: PredType -> EqRel
predTypeEqRel :: PredType -> EqRel
predTypeEqRel PredType
ty
| PredType -> Bool
isReprEqPred PredType
ty = EqRel
ReprEq
| Bool
otherwise = EqRel
NomEq
isPredTy :: HasDebugCallStack => Type -> Bool
isPredTy :: HasDebugCallStack => PredType -> Bool
isPredTy PredType
ty = case HasDebugCallStack => PredType -> TypeOrConstraint
PredType -> TypeOrConstraint
typeTypeOrConstraint PredType
ty of
TypeOrConstraint
TypeLike -> Bool
False
TypeOrConstraint
ConstraintLike -> Bool
True
isCoVarType :: Type -> Bool
isCoVarType :: PredType -> Bool
isCoVarType PredType
ty = PredType -> Bool
isEqPred PredType
ty
isEvVarType :: Type -> Bool
isEvVarType :: PredType -> Bool
isEvVarType PredType
ty = PredType -> Bool
isCoVarType PredType
ty Bool -> Bool -> Bool
|| HasDebugCallStack => PredType -> Bool
PredType -> Bool
isPredTy PredType
ty
isEqPred :: PredType -> Bool
isEqPred :: PredType -> Bool
isEqPred PredType
ty
| Just TyCon
tc <- PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty
= TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqPrimTyConKey Bool -> Bool -> Bool
|| TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqReprPrimTyConKey
| Bool
otherwise
= Bool
False
isReprEqPred :: PredType -> Bool
isReprEqPred :: PredType -> Bool
isReprEqPred PredType
ty
| Just TyCon
tc <- PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty
= TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqReprPrimTyConKey
| Bool
otherwise
= Bool
False
isClassPred :: PredType -> Bool
isClassPred :: PredType -> Bool
isClassPred PredType
ty = case PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty of
Just TyCon
tc -> TyCon -> Bool
isClassTyCon TyCon
tc
Maybe TyCon
_ -> Bool
False
isEqClassPred :: PredType -> Bool
isEqClassPred :: PredType -> Bool
isEqClassPred PredType
ty
| Just TyCon
tc <- PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty
, Just Class
cls <- TyCon -> Maybe Class
tyConClass_maybe TyCon
tc
= Class -> Bool
isEqualityClass Class
cls
| Bool
otherwise
= Bool
False
isEqualityClass :: Class -> Bool
isEqualityClass :: Class -> Bool
isEqualityClass Class
cls
= Class
cls Class -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
heqTyConKey
Bool -> Bool -> Bool
|| Class
cls Class -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
eqTyConKey
Bool -> Bool -> Bool
|| Class
cls Class -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
coercibleTyConKey
isCTupleClass :: Class -> Bool
isCTupleClass :: Class -> Bool
isCTupleClass Class
cls = TyCon -> Bool
isTupleTyCon (Class -> TyCon
classTyCon Class
cls)
isIPTyCon :: TyCon -> Bool
isIPTyCon :: TyCon -> Bool
isIPTyCon TyCon
tc = TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
ipClassKey
isIPClass :: Class -> Bool
isIPClass :: Class -> Bool
isIPClass Class
cls = Class
cls Class -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
ipClassKey
isIPPred_maybe :: Class -> [Type] -> Maybe (Type, Type)
isIPPred_maybe :: Class -> [PredType] -> Maybe (PredType, PredType)
isIPPred_maybe Class
cls [PredType]
tys
| Class -> Bool
isIPClass Class
cls
, [PredType
t1,PredType
t2] <- [PredType]
tys
= (PredType, PredType) -> Maybe (PredType, PredType)
forall a. a -> Maybe a
Just (PredType
t1,PredType
t2)
| Bool
otherwise
= Maybe (PredType, PredType)
forall a. Maybe a
Nothing
isExceptionContextPred :: Class -> [Type] -> Maybe FastString
isExceptionContextPred :: Class -> [PredType] -> Maybe FastString
isExceptionContextPred Class
cls [PredType]
tys
| [PredType
ty1, PredType
ty2] <- [PredType]
tys
, Class -> Bool
isIPClass Class
cls
, PredType -> Bool
isExceptionContextTy PredType
ty2
= PredType -> Maybe FastString
isStrLitTy PredType
ty1
| Bool
otherwise
= Maybe FastString
forall a. Maybe a
Nothing
isExceptionContextTy :: Type -> Bool
isExceptionContextTy :: PredType -> Bool
isExceptionContextTy PredType
ty
| Just TyCon
tc <- PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty
= TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
exceptionContextTyConKey
| Bool
otherwise
= Bool
False
isCallStackPredTy :: Type -> Bool
isCallStackPredTy :: PredType -> Bool
isCallStackPredTy PredType
ty
| Just (TyCon
tc, [PredType]
tys) <- HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
splitTyConApp_maybe PredType
ty
, Just Class
cls <- TyCon -> Maybe Class
tyConClass_maybe TyCon
tc
, Just {} <- Class -> [PredType] -> Maybe FastString
isCallStackPred Class
cls [PredType]
tys
= Bool
True
| Bool
otherwise
= Bool
False
isCallStackPred :: Class -> [Type] -> Maybe FastString
isCallStackPred :: Class -> [PredType] -> Maybe FastString
isCallStackPred Class
cls [PredType]
tys
| [PredType
ty1, PredType
ty2] <- [PredType]
tys
, Class -> Bool
isIPClass Class
cls
, PredType -> Bool
isCallStackTy PredType
ty2
= PredType -> Maybe FastString
isStrLitTy PredType
ty1
| Bool
otherwise
= Maybe FastString
forall a. Maybe a
Nothing
isCallStackTy :: Type -> Bool
isCallStackTy :: PredType -> Bool
isCallStackTy PredType
ty
| Just TyCon
tc <- PredType -> Maybe TyCon
tyConAppTyCon_maybe PredType
ty
= TyCon
tc TyCon -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
callStackTyConKey
| Bool
otherwise
= Bool
False
isIPLikePred :: Type -> Bool
isIPLikePred :: PredType -> Bool
isIPLikePred PredType
pred =
RecTcChecker
-> (PredType -> Bool) -> (PredType -> Bool) -> PredType -> Bool
mentions_ip_pred RecTcChecker
initIPRecTc (Bool -> PredType -> Bool
forall a b. a -> b -> a
const Bool
True) (Bool -> PredType -> Bool
forall a b. a -> b -> a
const Bool
True) PredType
pred
mentionsIP :: (Type -> Bool)
-> (Type -> Bool)
-> Class
-> [Type] -> Bool
mentionsIP :: (PredType -> Bool)
-> (PredType -> Bool) -> Class -> [PredType] -> Bool
mentionsIP = RecTcChecker
-> (PredType -> Bool)
-> (PredType -> Bool)
-> Class
-> [PredType]
-> Bool
mentions_ip RecTcChecker
initIPRecTc
mentions_ip :: RecTcChecker -> (Type -> Bool) -> (Type -> Bool) -> Class -> [Type] -> Bool
mentions_ip :: RecTcChecker
-> (PredType -> Bool)
-> (PredType -> Bool)
-> Class
-> [PredType]
-> Bool
mentions_ip RecTcChecker
rec_clss PredType -> Bool
str_cond PredType -> Bool
ty_cond Class
cls [PredType]
tys
| Just (PredType
str_ty, PredType
ty) <- Class -> [PredType] -> Maybe (PredType, PredType)
isIPPred_maybe Class
cls [PredType]
tys
= PredType -> Bool
str_cond PredType
str_ty Bool -> Bool -> Bool
&& PredType -> Bool
ty_cond PredType
ty
| Bool
otherwise
= [Bool] -> Bool
forall (t :: * -> *). Foldable t => t Bool -> Bool
or [ RecTcChecker
-> (PredType -> Bool) -> (PredType -> Bool) -> PredType -> Bool
mentions_ip_pred RecTcChecker
rec_clss PredType -> Bool
str_cond PredType -> Bool
ty_cond (TyVar -> [PredType] -> PredType
classMethodInstTy TyVar
sc_sel_id [PredType]
tys)
| TyVar
sc_sel_id <- Class -> [TyVar]
classSCSelIds Class
cls ]
mentions_ip_pred :: RecTcChecker -> (Type -> Bool) -> (Type -> Bool) -> Type -> Bool
mentions_ip_pred :: RecTcChecker
-> (PredType -> Bool) -> (PredType -> Bool) -> PredType -> Bool
mentions_ip_pred RecTcChecker
rec_clss PredType -> Bool
str_cond PredType -> Bool
ty_cond PredType
ty
| Just (Class
cls, [PredType]
tys) <- PredType -> Maybe (Class, [PredType])
getClassPredTys_maybe PredType
ty
, let tc :: TyCon
tc = Class -> TyCon
classTyCon Class
cls
, Just RecTcChecker
rec_clss' <- if TyCon -> Bool
isTupleTyCon TyCon
tc then RecTcChecker -> Maybe RecTcChecker
forall a. a -> Maybe a
Just RecTcChecker
rec_clss
else RecTcChecker -> TyCon -> Maybe RecTcChecker
checkRecTc RecTcChecker
rec_clss TyCon
tc
= RecTcChecker
-> (PredType -> Bool)
-> (PredType -> Bool)
-> Class
-> [PredType]
-> Bool
mentions_ip RecTcChecker
rec_clss' PredType -> Bool
str_cond PredType -> Bool
ty_cond Class
cls [PredType]
tys
| Bool
otherwise
= Bool
False
initIPRecTc :: RecTcChecker
initIPRecTc :: RecTcChecker
initIPRecTc = Int -> RecTcChecker -> RecTcChecker
setRecTcMaxBound Int
1 RecTcChecker
initRecTc
isEvVar :: Var -> Bool
isEvVar :: TyVar -> Bool
isEvVar TyVar
var = PredType -> Bool
isEvVarType (TyVar -> PredType
varType TyVar
var)
isDictId :: Id -> Bool
isDictId :: TyVar -> Bool
isDictId TyVar
id = PredType -> Bool
isDictTy (TyVar -> PredType
varType TyVar
id)
scopedSort :: [Var] -> [Var]
scopedSort :: [TyVar] -> [TyVar]
scopedSort = [TyVar] -> [TyCoVarSet] -> [TyVar] -> [TyVar]
go [] []
where
go :: [Var]
-> [TyCoVarSet]
-> [Var]
-> [Var]
go :: [TyVar] -> [TyCoVarSet] -> [TyVar] -> [TyVar]
go [TyVar]
acc [TyCoVarSet]
_fv_list [] = [TyVar] -> [TyVar]
forall a. [a] -> [a]
reverse [TyVar]
acc
go [TyVar]
acc [TyCoVarSet]
fv_list (TyVar
tv:[TyVar]
tvs)
= [TyVar] -> [TyCoVarSet] -> [TyVar] -> [TyVar]
go [TyVar]
acc' [TyCoVarSet]
fv_list' [TyVar]
tvs
where
([TyVar]
acc', [TyCoVarSet]
fv_list') = TyVar -> [TyVar] -> [TyCoVarSet] -> ([TyVar], [TyCoVarSet])
insert TyVar
tv [TyVar]
acc [TyCoVarSet]
fv_list
insert :: Var
-> [Var]
-> [TyCoVarSet]
-> ([Var], [TyCoVarSet])
insert :: TyVar -> [TyVar] -> [TyCoVarSet] -> ([TyVar], [TyCoVarSet])
insert TyVar
v [] [] = ([TyVar
v], [PredType -> TyCoVarSet
tyCoVarsOfType (TyVar -> PredType
varType TyVar
v)])
insert TyVar
v (TyVar
a:[TyVar]
as) (TyCoVarSet
fvs:[TyCoVarSet]
fvss)
| (TyVar -> Bool
isTyVar TyVar
v Bool -> Bool -> Bool
&& TyVar -> Bool
isId TyVar
a) Bool -> Bool -> Bool
||
(TyVar -> Bool
isEvVar TyVar
v Bool -> Bool -> Bool
&& TyVar -> Bool
isId TyVar
a Bool -> Bool -> Bool
&& Bool -> Bool
not (TyVar -> Bool
isEvVar TyVar
a)) Bool -> Bool -> Bool
||
(TyVar
v TyVar -> TyCoVarSet -> Bool
`elemVarSet` TyCoVarSet
fvs)
, ([TyVar]
as', [TyCoVarSet]
fvss') <- TyVar -> [TyVar] -> [TyCoVarSet] -> ([TyVar], [TyCoVarSet])
insert TyVar
v [TyVar]
as [TyCoVarSet]
fvss
= (TyVar
aTyVar -> [TyVar] -> [TyVar]
forall a. a -> [a] -> [a]
:[TyVar]
as', TyCoVarSet
fvs TyCoVarSet -> TyCoVarSet -> TyCoVarSet
`unionVarSet` TyCoVarSet
fv_v TyCoVarSet -> [TyCoVarSet] -> [TyCoVarSet]
forall a. a -> [a] -> [a]
: [TyCoVarSet]
fvss')
| Bool
otherwise
= (TyVar
vTyVar -> [TyVar] -> [TyVar]
forall a. a -> [a] -> [a]
:TyVar
aTyVar -> [TyVar] -> [TyVar]
forall a. a -> [a] -> [a]
:[TyVar]
as, TyCoVarSet
fvs TyCoVarSet -> TyCoVarSet -> TyCoVarSet
`unionVarSet` TyCoVarSet
fv_v TyCoVarSet -> [TyCoVarSet] -> [TyCoVarSet]
forall a. a -> [a] -> [a]
: TyCoVarSet
fvs TyCoVarSet -> [TyCoVarSet] -> [TyCoVarSet]
forall a. a -> [a] -> [a]
: [TyCoVarSet]
fvss)
where
fv_v :: TyCoVarSet
fv_v = PredType -> TyCoVarSet
tyCoVarsOfType (TyVar -> PredType
varType TyVar
v)
insert TyVar
_ [TyVar]
_ [TyCoVarSet]
_ = String -> ([TyVar], [TyCoVarSet])
forall a. HasCallStack => String -> a
panic String
"scopedSort"
tyCoVarsOfTypeWellScoped :: Type -> [TyVar]
tyCoVarsOfTypeWellScoped :: PredType -> [TyVar]
tyCoVarsOfTypeWellScoped = [TyVar] -> [TyVar]
scopedSort ([TyVar] -> [TyVar])
-> (PredType -> [TyVar]) -> PredType -> [TyVar]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PredType -> [TyVar]
tyCoVarsOfTypeList
tyCoVarsOfTypesWellScoped :: [Type] -> [TyVar]
tyCoVarsOfTypesWellScoped :: [PredType] -> [TyVar]
tyCoVarsOfTypesWellScoped = [TyVar] -> [TyVar]
scopedSort ([TyVar] -> [TyVar])
-> ([PredType] -> [TyVar]) -> [PredType] -> [TyVar]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [PredType] -> [TyVar]
tyCoVarsOfTypesList
data CanEqLHS
= TyVarLHS TyVar
| TyFamLHS TyCon
[Type]
instance Outputable CanEqLHS where
ppr :: CanEqLHS -> SDoc
ppr (TyVarLHS TyVar
tv) = TyVar -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyVar
tv
ppr (TyFamLHS TyCon
fam_tc [PredType]
fam_args) = PredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr (TyCon -> [PredType] -> PredType
mkTyConApp TyCon
fam_tc [PredType]
fam_args)
canEqLHS_maybe :: Type -> Maybe CanEqLHS
canEqLHS_maybe :: PredType -> Maybe CanEqLHS
canEqLHS_maybe PredType
xi
| Just TyVar
tv <- PredType -> Maybe TyVar
getTyVar_maybe PredType
xi
= CanEqLHS -> Maybe CanEqLHS
forall a. a -> Maybe a
Just (CanEqLHS -> Maybe CanEqLHS) -> CanEqLHS -> Maybe CanEqLHS
forall a b. (a -> b) -> a -> b
$ TyVar -> CanEqLHS
TyVarLHS TyVar
tv
| Bool
otherwise
= PredType -> Maybe CanEqLHS
canTyFamEqLHS_maybe PredType
xi
canTyFamEqLHS_maybe :: Type -> Maybe CanEqLHS
canTyFamEqLHS_maybe :: PredType -> Maybe CanEqLHS
canTyFamEqLHS_maybe PredType
xi
| Just (TyCon
tc, [PredType]
args) <- HasDebugCallStack => PredType -> Maybe (TyCon, [PredType])
PredType -> Maybe (TyCon, [PredType])
tcSplitTyConApp_maybe PredType
xi
, TyCon -> Bool
isTypeFamilyTyCon TyCon
tc
, [PredType]
args [PredType] -> Int -> Bool
forall a. [a] -> Int -> Bool
`lengthIs` TyCon -> Int
tyConArity TyCon
tc
= CanEqLHS -> Maybe CanEqLHS
forall a. a -> Maybe a
Just (CanEqLHS -> Maybe CanEqLHS) -> CanEqLHS -> Maybe CanEqLHS
forall a b. (a -> b) -> a -> b
$ TyCon -> [PredType] -> CanEqLHS
TyFamLHS TyCon
tc [PredType]
args
| Bool
otherwise
= Maybe CanEqLHS
forall a. Maybe a
Nothing
canEqLHSType :: CanEqLHS -> Type
canEqLHSType :: CanEqLHS -> PredType
canEqLHSType (TyVarLHS TyVar
tv) = TyVar -> PredType
mkTyVarTy TyVar
tv
canEqLHSType (TyFamLHS TyCon
fam_tc [PredType]
fam_args) = TyCon -> [PredType] -> PredType
mkTyConApp TyCon
fam_tc [PredType]
fam_args
canEqLHSKind :: CanEqLHS -> Kind
canEqLHSKind :: CanEqLHS -> PredType
canEqLHSKind (TyVarLHS TyVar
tv) = TyVar -> PredType
tyVarKind TyVar
tv
canEqLHSKind (TyFamLHS TyCon
fam_tc [PredType]
fam_args) = HasDebugCallStack => PredType -> [PredType] -> PredType
PredType -> [PredType] -> PredType
piResultTys (TyCon -> PredType
tyConKind TyCon
fam_tc) [PredType]
fam_args
eqCanEqLHS :: CanEqLHS -> CanEqLHS -> Bool
eqCanEqLHS :: CanEqLHS -> CanEqLHS -> Bool
eqCanEqLHS (TyVarLHS TyVar
tv1) (TyVarLHS TyVar
tv2) = TyVar
tv1 TyVar -> TyVar -> Bool
forall a. Eq a => a -> a -> Bool
== TyVar
tv2
eqCanEqLHS (TyFamLHS TyCon
fam_tc1 [PredType]
fam_args1) (TyFamLHS TyCon
fam_tc2 [PredType]
fam_args2)
= TyCon -> [PredType] -> TyCon -> [PredType] -> Bool
tcEqTyConApps TyCon
fam_tc1 [PredType]
fam_args1 TyCon
fam_tc2 [PredType]
fam_args2
eqCanEqLHS CanEqLHS
_ CanEqLHS
_ = Bool
False