ghc-lib-0.20210601: The GHC API, decoupled from GHC versions
Safe HaskellNone
LanguageHaskell2010

GHC.Tc.Solver.InertSet

Synopsis

The work list

data WorkList Source #

Constructors

WL 

Fields

Instances

Instances details
Outputable WorkList Source # 
Instance details

Defined in GHC.Tc.Solver.InertSet

Methods

ppr :: WorkList -> SDoc

The inert set

data InertSet Source #

Constructors

IS 

Instances

Instances details
Outputable InertSet Source # 
Instance details

Defined in GHC.Tc.Solver.InertSet

Methods

ppr :: InertSet -> SDoc

data InertCans Source #

Constructors

IC 

Fields

Instances

Instances details
Outputable InertCans Source # 
Instance details

Defined in GHC.Tc.Solver.InertSet

Methods

ppr :: InertCans -> SDoc

type InertEqs = DTyVarEnv EqualCtList Source #

matchableGivens :: CtLoc -> PredType -> InertSet -> Cts Source #

Returns Given constraints that might, potentially, match the given pred. This is used when checking to see if a Given might overlap with an instance. See Note [Instance and Given overlap] in GHC.Tc.Solver.Interact

mightEqualLater :: InertSet -> TcPredType -> CtLoc -> TcPredType -> CtLoc -> Bool Source #

prohibitedSuperClassSolve :: CtLoc -> CtLoc -> Bool Source #

Inert equalities

foldTyEqs :: (Ct -> b -> b) -> InertEqs -> b -> b Source #

delEq :: InertCans -> CanEqLHS -> TcType -> InertCans Source #

findEq :: InertCans -> CanEqLHS -> [Ct] Source #

Kick-out

kickOutRewritableLHS :: CtFlavourRole -> CanEqLHS -> InertCans -> (WorkList, InertCans) Source #