{-# LANGUAGE CPP #-}
{-# OPTIONS_GHC -Wno-incomplete-record-updates #-}
{-# OPTIONS_GHC -Wno-incomplete-uni-patterns #-}
module GHC.Tc.Solver.Interact (
solveSimpleGivens,
solveSimpleWanteds,
) where
#include "HsVersions.h"
import GHC.Prelude
import GHC.Types.Basic ( SwapFlag(..),
infinity, IntWithInf, intGtLimit )
import GHC.Tc.Solver.Canonical
import GHC.Types.Var.Set
import GHC.Core.Type as Type
import GHC.Core.InstEnv ( DFunInstType )
import GHC.Types.Var
import GHC.Tc.Utils.TcType
import GHC.Builtin.Names ( coercibleTyConKey, heqTyConKey, eqTyConKey, ipClassKey )
import GHC.Core.Coercion.Axiom ( CoAxBranch (..), CoAxiom (..), TypeEqn, fromBranches, sfInteractInert, sfInteractTop )
import GHC.Core.Class
import GHC.Core.TyCon
import GHC.Tc.Instance.FunDeps
import GHC.Tc.Instance.Family
import GHC.Tc.Instance.Class ( InstanceWhat(..), safeOverlap )
import GHC.Core.FamInstEnv
import GHC.Core.Unify ( tcUnifyTyWithTFs, ruleMatchTyKiX )
import GHC.Tc.Types.Evidence
import GHC.Utils.Outputable
import GHC.Utils.Panic
import GHC.Tc.Types
import GHC.Tc.Types.Constraint
import GHC.Core.Predicate
import GHC.Tc.Types.Origin
import GHC.Tc.Utils.TcMType( promoteMetaTyVarTo )
import GHC.Tc.Solver.Monad
import GHC.Data.Bag
import GHC.Utils.Monad ( concatMapM, foldlM )
import GHC.Core
import Data.List( partition, deleteFirstsBy )
import GHC.Types.SrcLoc
import GHC.Types.Var.Env
import Control.Monad
import GHC.Data.Maybe( isJust )
import GHC.Data.Pair (Pair(..))
import GHC.Types.Unique( hasKey )
import GHC.Driver.Session
import GHC.Utils.Misc
import qualified GHC.LanguageExtensions as LangExt
import Data.List.NonEmpty ( NonEmpty(..) )
import Control.Monad.Trans.Class
import Control.Monad.Trans.Maybe
solveSimpleGivens :: [Ct] -> TcS ()
solveSimpleGivens :: [Ct] -> TcS ()
solveSimpleGivens [Ct]
givens
| [Ct] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Ct]
givens
= () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
| Bool
otherwise
= do { String -> SDoc -> TcS ()
traceTcS String
"solveSimpleGivens {" ([Ct] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [Ct]
givens)
; [Ct] -> TcS ()
go [Ct]
givens
; String -> SDoc -> TcS ()
traceTcS String
"End solveSimpleGivens }" SDoc
empty }
where
go :: [Ct] -> TcS ()
go [Ct]
givens = do { Cts -> TcS ()
solveSimples ([Ct] -> Cts
forall a. [a] -> Bag a
listToBag [Ct]
givens)
; [Ct]
new_givens <- TcS [Ct]
runTcPluginsGiven
; Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when ([Ct] -> Bool
forall (f :: * -> *) a. Foldable f => f a -> Bool
notNull [Ct]
new_givens) (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
[Ct] -> TcS ()
go [Ct]
new_givens }
solveSimpleWanteds :: Cts -> TcS WantedConstraints
solveSimpleWanteds :: Cts -> TcS WantedConstraints
solveSimpleWanteds Cts
simples
= do { String -> SDoc -> TcS ()
traceTcS String
"solveSimpleWanteds {" (Cts -> SDoc
forall a. Outputable a => a -> SDoc
ppr Cts
simples)
; DynFlags
dflags <- TcS DynFlags
forall (m :: * -> *). HasDynFlags m => m DynFlags
getDynFlags
; (Int
n,WantedConstraints
wc) <- Int
-> TypeSize -> WantedConstraints -> TcS (Int, WantedConstraints)
go Int
1 (DynFlags -> TypeSize
solverIterations DynFlags
dflags) (WantedConstraints
emptyWC { wc_simple :: Cts
wc_simple = Cts
simples })
; String -> SDoc -> TcS ()
traceTcS String
"solveSimpleWanteds end }" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
[SDoc] -> SDoc
vcat [ String -> SDoc
text String
"iterations =" SDoc -> SDoc -> SDoc
<+> Int -> SDoc
forall a. Outputable a => a -> SDoc
ppr Int
n
, String -> SDoc
text String
"residual =" SDoc -> SDoc -> SDoc
<+> WantedConstraints -> SDoc
forall a. Outputable a => a -> SDoc
ppr WantedConstraints
wc ]
; WantedConstraints -> TcS WantedConstraints
forall (m :: * -> *) a. Monad m => a -> m a
return WantedConstraints
wc }
where
go :: Int -> IntWithInf -> WantedConstraints -> TcS (Int, WantedConstraints)
go :: Int
-> TypeSize -> WantedConstraints -> TcS (Int, WantedConstraints)
go Int
n TypeSize
limit WantedConstraints
wc
| Int
n Int -> TypeSize -> Bool
`intGtLimit` TypeSize
limit
= SDoc -> TcS (Int, WantedConstraints)
forall a. SDoc -> TcS a
failTcS (SDoc -> Int -> SDoc -> SDoc
hang (String -> SDoc
text String
"solveSimpleWanteds: too many iterations"
SDoc -> SDoc -> SDoc
<+> SDoc -> SDoc
parens (String -> SDoc
text String
"limit =" SDoc -> SDoc -> SDoc
<+> TypeSize -> SDoc
forall a. Outputable a => a -> SDoc
ppr TypeSize
limit))
Int
2 ([SDoc] -> SDoc
vcat [ String -> SDoc
text String
"Set limit with -fconstraint-solver-iterations=n; n=0 for no limit"
, String -> SDoc
text String
"Simples =" SDoc -> SDoc -> SDoc
<+> Cts -> SDoc
forall a. Outputable a => a -> SDoc
ppr Cts
simples
, String -> SDoc
text String
"WC =" SDoc -> SDoc -> SDoc
<+> WantedConstraints -> SDoc
forall a. Outputable a => a -> SDoc
ppr WantedConstraints
wc ]))
| Cts -> Bool
forall a. Bag a -> Bool
isEmptyBag (WantedConstraints -> Cts
wc_simple WantedConstraints
wc)
= (Int, WantedConstraints) -> TcS (Int, WantedConstraints)
forall (m :: * -> *) a. Monad m => a -> m a
return (Int
n,WantedConstraints
wc)
| Bool
otherwise
= do {
WantedConstraints
wc1 <- WantedConstraints -> TcS WantedConstraints
solve_simple_wanteds WantedConstraints
wc
; (Bool
rerun_plugin, WantedConstraints
wc2) <- WantedConstraints -> TcS (Bool, WantedConstraints)
runTcPluginsWanted WantedConstraints
wc1
; if Bool
rerun_plugin
then do { String -> SDoc -> TcS ()
traceTcS String
"solveSimple going round again:" (Bool -> SDoc
forall a. Outputable a => a -> SDoc
ppr Bool
rerun_plugin)
; Int
-> TypeSize -> WantedConstraints -> TcS (Int, WantedConstraints)
go (Int
nInt -> Int -> Int
forall a. Num a => a -> a -> a
+Int
1) TypeSize
limit WantedConstraints
wc2 }
else (Int, WantedConstraints) -> TcS (Int, WantedConstraints)
forall (m :: * -> *) a. Monad m => a -> m a
return (Int
n, WantedConstraints
wc2) }
solve_simple_wanteds :: WantedConstraints -> TcS WantedConstraints
solve_simple_wanteds :: WantedConstraints -> TcS WantedConstraints
solve_simple_wanteds (WC { wc_simple :: WantedConstraints -> Cts
wc_simple = Cts
simples1, wc_impl :: WantedConstraints -> Bag Implication
wc_impl = Bag Implication
implics1, wc_holes :: WantedConstraints -> Bag Hole
wc_holes = Bag Hole
holes })
= TcS WantedConstraints -> TcS WantedConstraints
forall a. TcS a -> TcS a
nestTcS (TcS WantedConstraints -> TcS WantedConstraints)
-> TcS WantedConstraints -> TcS WantedConstraints
forall a b. (a -> b) -> a -> b
$
do { Cts -> TcS ()
solveSimples Cts
simples1
; (Bag Implication
implics2, Cts
unsolved) <- TcS (Bag Implication, Cts)
getUnsolvedInerts
; WantedConstraints -> TcS WantedConstraints
forall (m :: * -> *) a. Monad m => a -> m a
return (WC { wc_simple :: Cts
wc_simple = Cts
unsolved
, wc_impl :: Bag Implication
wc_impl = Bag Implication
implics1 Bag Implication -> Bag Implication -> Bag Implication
forall a. Bag a -> Bag a -> Bag a
`unionBags` Bag Implication
implics2
, wc_holes :: Bag Hole
wc_holes = Bag Hole
holes }) }
solveSimples :: Cts -> TcS ()
solveSimples :: Cts -> TcS ()
solveSimples Cts
cts
= {-# SCC "solveSimples" #-}
do { (WorkList -> WorkList) -> TcS ()
updWorkListTcS (\WorkList
wl -> (Ct -> WorkList -> WorkList) -> WorkList -> Cts -> WorkList
forall (t :: * -> *) a b.
Foldable t =>
(a -> b -> b) -> b -> t a -> b
foldr Ct -> WorkList -> WorkList
extendWorkListCt WorkList
wl Cts
cts)
; TcS ()
solve_loop }
where
solve_loop :: TcS ()
solve_loop
= {-# SCC "solve_loop" #-}
do { Maybe Ct
sel <- TcS (Maybe Ct)
selectNextWorkItem
; case Maybe Ct
sel of
Maybe Ct
Nothing -> () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
Just Ct
ct -> do { [(String, SimplifierStage)] -> Ct -> TcS ()
runSolverPipeline [(String, SimplifierStage)]
thePipeline Ct
ct
; TcS ()
solve_loop } }
runTcPluginsGiven :: TcS [Ct]
runTcPluginsGiven :: TcS [Ct]
runTcPluginsGiven
= do { [TcPluginSolver]
plugins <- TcS [TcPluginSolver]
getTcPlugins
; if [TcPluginSolver] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [TcPluginSolver]
plugins then [Ct] -> TcS [Ct]
forall (m :: * -> *) a. Monad m => a -> m a
return [] else
do { [Ct]
givens <- TcS [Ct]
getInertGivens
; if [Ct] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [Ct]
givens then [Ct] -> TcS [Ct]
forall (m :: * -> *) a. Monad m => a -> m a
return [] else
do { TcPluginProgress
p <- [TcPluginSolver] -> SplitCts -> TcS TcPluginProgress
runTcPlugins [TcPluginSolver]
plugins ([Ct]
givens,[],[])
; let ([Ct]
solved_givens, [Ct]
_, [(EvTerm, Ct)]
_) = TcPluginProgress -> ([Ct], [Ct], [(EvTerm, Ct)])
pluginSolvedCts TcPluginProgress
p
insols :: [Ct]
insols = TcPluginProgress -> [Ct]
pluginBadCts TcPluginProgress
p
; (InertCans -> InertCans) -> TcS ()
updInertCans ([Ct] -> InertCans -> InertCans
removeInertCts [Ct]
solved_givens)
; (Cts -> Cts) -> TcS ()
updInertIrreds (\Cts
irreds -> Cts -> [Ct] -> Cts
extendCtsList Cts
irreds [Ct]
insols)
; [Ct] -> TcS [Ct]
forall (m :: * -> *) a. Monad m => a -> m a
return (TcPluginProgress -> [Ct]
pluginNewCts TcPluginProgress
p) } } }
runTcPluginsWanted :: WantedConstraints -> TcS (Bool, WantedConstraints)
runTcPluginsWanted :: WantedConstraints -> TcS (Bool, WantedConstraints)
runTcPluginsWanted wc :: WantedConstraints
wc@(WC { wc_simple :: WantedConstraints -> Cts
wc_simple = Cts
simples1 })
| Cts -> Bool
forall a. Bag a -> Bool
isEmptyBag Cts
simples1
= (Bool, WantedConstraints) -> TcS (Bool, WantedConstraints)
forall (m :: * -> *) a. Monad m => a -> m a
return (Bool
False, WantedConstraints
wc)
| Bool
otherwise
= do { [TcPluginSolver]
plugins <- TcS [TcPluginSolver]
getTcPlugins
; if [TcPluginSolver] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [TcPluginSolver]
plugins then (Bool, WantedConstraints) -> TcS (Bool, WantedConstraints)
forall (m :: * -> *) a. Monad m => a -> m a
return (Bool
False, WantedConstraints
wc) else
do { [Ct]
given <- TcS [Ct]
getInertGivens
; Cts
simples1 <- Cts -> TcS Cts
zonkSimples Cts
simples1
; let ([Ct]
wanted, [Ct]
derived) = (Ct -> Bool) -> [Ct] -> ([Ct], [Ct])
forall a. (a -> Bool) -> [a] -> ([a], [a])
partition Ct -> Bool
isWantedCt (Cts -> [Ct]
forall a. Bag a -> [a]
bagToList Cts
simples1)
; TcPluginProgress
p <- [TcPluginSolver] -> SplitCts -> TcS TcPluginProgress
runTcPlugins [TcPluginSolver]
plugins ([Ct]
given, [Ct]
derived, [Ct]
wanted)
; let ([Ct]
_, [Ct]
_, [(EvTerm, Ct)]
solved_wanted) = TcPluginProgress -> ([Ct], [Ct], [(EvTerm, Ct)])
pluginSolvedCts TcPluginProgress
p
([Ct]
_, [Ct]
unsolved_derived, [Ct]
unsolved_wanted) = TcPluginProgress -> SplitCts
pluginInputCts TcPluginProgress
p
new_wanted :: [Ct]
new_wanted = TcPluginProgress -> [Ct]
pluginNewCts TcPluginProgress
p
insols :: [Ct]
insols = TcPluginProgress -> [Ct]
pluginBadCts TcPluginProgress
p
; ((EvTerm, Ct) -> TcS ()) -> [(EvTerm, Ct)] -> TcS ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (EvTerm, Ct) -> TcS ()
setEv [(EvTerm, Ct)]
solved_wanted
; (Bool, WantedConstraints) -> TcS (Bool, WantedConstraints)
forall (m :: * -> *) a. Monad m => a -> m a
return ( [Ct] -> Bool
forall (f :: * -> *) a. Foldable f => f a -> Bool
notNull (TcPluginProgress -> [Ct]
pluginNewCts TcPluginProgress
p)
, WantedConstraints
wc { wc_simple :: Cts
wc_simple = [Ct] -> Cts
forall a. [a] -> Bag a
listToBag [Ct]
new_wanted Cts -> Cts -> Cts
`andCts`
[Ct] -> Cts
forall a. [a] -> Bag a
listToBag [Ct]
unsolved_wanted Cts -> Cts -> Cts
`andCts`
[Ct] -> Cts
forall a. [a] -> Bag a
listToBag [Ct]
unsolved_derived Cts -> Cts -> Cts
`andCts`
[Ct] -> Cts
forall a. [a] -> Bag a
listToBag [Ct]
insols } ) } }
where
setEv :: (EvTerm,Ct) -> TcS ()
setEv :: (EvTerm, Ct) -> TcS ()
setEv (EvTerm
ev,Ct
ct) = case Ct -> CtEvidence
ctEvidence Ct
ct of
CtWanted { ctev_dest :: CtEvidence -> TcEvDest
ctev_dest = TcEvDest
dest } -> TcEvDest -> EvTerm -> TcS ()
setWantedEvTerm TcEvDest
dest EvTerm
ev
CtEvidence
_ -> String -> TcS ()
forall a. String -> a
panic String
"runTcPluginsWanted.setEv: attempt to solve non-wanted!"
type SplitCts = ([Ct], [Ct], [Ct])
type SolvedCts = ([Ct], [Ct], [(EvTerm,Ct)])
data TcPluginProgress = TcPluginProgress
{ TcPluginProgress -> SplitCts
pluginInputCts :: SplitCts
, TcPluginProgress -> ([Ct], [Ct], [(EvTerm, Ct)])
pluginSolvedCts :: SolvedCts
, TcPluginProgress -> [Ct]
pluginBadCts :: [Ct]
, TcPluginProgress -> [Ct]
pluginNewCts :: [Ct]
}
getTcPlugins :: TcS [TcPluginSolver]
getTcPlugins :: TcS [TcPluginSolver]
getTcPlugins = do { TcGblEnv
tcg_env <- TcS TcGblEnv
getGblEnv; [TcPluginSolver] -> TcS [TcPluginSolver]
forall (m :: * -> *) a. Monad m => a -> m a
return (TcGblEnv -> [TcPluginSolver]
tcg_tc_plugins TcGblEnv
tcg_env) }
runTcPlugins :: [TcPluginSolver] -> SplitCts -> TcS TcPluginProgress
runTcPlugins :: [TcPluginSolver] -> SplitCts -> TcS TcPluginProgress
runTcPlugins [TcPluginSolver]
plugins SplitCts
all_cts
= (TcPluginProgress -> TcPluginSolver -> TcS TcPluginProgress)
-> TcPluginProgress -> [TcPluginSolver] -> TcS TcPluginProgress
forall (t :: * -> *) (m :: * -> *) b a.
(Foldable t, Monad m) =>
(b -> a -> m b) -> b -> t a -> m b
foldM TcPluginProgress -> TcPluginSolver -> TcS TcPluginProgress
do_plugin TcPluginProgress
initialProgress [TcPluginSolver]
plugins
where
do_plugin :: TcPluginProgress -> TcPluginSolver -> TcS TcPluginProgress
do_plugin :: TcPluginProgress -> TcPluginSolver -> TcS TcPluginProgress
do_plugin TcPluginProgress
p TcPluginSolver
solver = do
TcPluginResult
result <- TcPluginM TcPluginResult -> TcS TcPluginResult
forall a. TcPluginM a -> TcS a
runTcPluginTcS (TcPluginSolver -> SplitCts -> TcPluginM TcPluginResult
forall a b c d. (a -> b -> c -> d) -> (a, b, c) -> d
uncurry3 TcPluginSolver
solver (TcPluginProgress -> SplitCts
pluginInputCts TcPluginProgress
p))
TcPluginProgress -> TcS TcPluginProgress
forall (m :: * -> *) a. Monad m => a -> m a
return (TcPluginProgress -> TcS TcPluginProgress)
-> TcPluginProgress -> TcS TcPluginProgress
forall a b. (a -> b) -> a -> b
$ TcPluginProgress -> TcPluginResult -> TcPluginProgress
progress TcPluginProgress
p TcPluginResult
result
progress :: TcPluginProgress -> TcPluginResult -> TcPluginProgress
progress :: TcPluginProgress -> TcPluginResult -> TcPluginProgress
progress TcPluginProgress
p (TcPluginContradiction [Ct]
bad_cts) =
TcPluginProgress
p { pluginInputCts :: SplitCts
pluginInputCts = [Ct] -> SplitCts -> SplitCts
discard [Ct]
bad_cts (TcPluginProgress -> SplitCts
pluginInputCts TcPluginProgress
p)
, pluginBadCts :: [Ct]
pluginBadCts = [Ct]
bad_cts [Ct] -> [Ct] -> [Ct]
forall a. [a] -> [a] -> [a]
++ TcPluginProgress -> [Ct]
pluginBadCts TcPluginProgress
p
}
progress TcPluginProgress
p (TcPluginOk [(EvTerm, Ct)]
solved_cts [Ct]
new_cts) =
TcPluginProgress
p { pluginInputCts :: SplitCts
pluginInputCts = [Ct] -> SplitCts -> SplitCts
discard (((EvTerm, Ct) -> Ct) -> [(EvTerm, Ct)] -> [Ct]
forall a b. (a -> b) -> [a] -> [b]
map (EvTerm, Ct) -> Ct
forall a b. (a, b) -> b
snd [(EvTerm, Ct)]
solved_cts) (TcPluginProgress -> SplitCts
pluginInputCts TcPluginProgress
p)
, pluginSolvedCts :: ([Ct], [Ct], [(EvTerm, Ct)])
pluginSolvedCts = [(EvTerm, Ct)]
-> ([Ct], [Ct], [(EvTerm, Ct)]) -> ([Ct], [Ct], [(EvTerm, Ct)])
add [(EvTerm, Ct)]
solved_cts (TcPluginProgress -> ([Ct], [Ct], [(EvTerm, Ct)])
pluginSolvedCts TcPluginProgress
p)
, pluginNewCts :: [Ct]
pluginNewCts = [Ct]
new_cts [Ct] -> [Ct] -> [Ct]
forall a. [a] -> [a] -> [a]
++ TcPluginProgress -> [Ct]
pluginNewCts TcPluginProgress
p
}
initialProgress :: TcPluginProgress
initialProgress = SplitCts
-> ([Ct], [Ct], [(EvTerm, Ct)]) -> [Ct] -> [Ct] -> TcPluginProgress
TcPluginProgress SplitCts
all_cts ([], [], []) [] []
discard :: [Ct] -> SplitCts -> SplitCts
discard :: [Ct] -> SplitCts -> SplitCts
discard [Ct]
cts ([Ct]
xs, [Ct]
ys, [Ct]
zs) =
([Ct]
xs [Ct] -> [Ct] -> [Ct]
`without` [Ct]
cts, [Ct]
ys [Ct] -> [Ct] -> [Ct]
`without` [Ct]
cts, [Ct]
zs [Ct] -> [Ct] -> [Ct]
`without` [Ct]
cts)
without :: [Ct] -> [Ct] -> [Ct]
without :: [Ct] -> [Ct] -> [Ct]
without = (Ct -> Ct -> Bool) -> [Ct] -> [Ct] -> [Ct]
forall a. (a -> a -> Bool) -> [a] -> [a] -> [a]
deleteFirstsBy Ct -> Ct -> Bool
eqCt
eqCt :: Ct -> Ct -> Bool
eqCt :: Ct -> Ct -> Bool
eqCt Ct
c Ct
c' = Ct -> CtFlavour
ctFlavour Ct
c CtFlavour -> CtFlavour -> Bool
forall a. Eq a => a -> a -> Bool
== Ct -> CtFlavour
ctFlavour Ct
c'
Bool -> Bool -> Bool
&& Ct -> TcPredType
ctPred Ct
c HasDebugCallStack => TcPredType -> TcPredType -> Bool
TcPredType -> TcPredType -> Bool
`tcEqType` Ct -> TcPredType
ctPred Ct
c'
add :: [(EvTerm,Ct)] -> SolvedCts -> SolvedCts
add :: [(EvTerm, Ct)]
-> ([Ct], [Ct], [(EvTerm, Ct)]) -> ([Ct], [Ct], [(EvTerm, Ct)])
add [(EvTerm, Ct)]
xs ([Ct], [Ct], [(EvTerm, Ct)])
scs = (([Ct], [Ct], [(EvTerm, Ct)])
-> (EvTerm, Ct) -> ([Ct], [Ct], [(EvTerm, Ct)]))
-> ([Ct], [Ct], [(EvTerm, Ct)])
-> [(EvTerm, Ct)]
-> ([Ct], [Ct], [(EvTerm, Ct)])
forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
foldl' ([Ct], [Ct], [(EvTerm, Ct)])
-> (EvTerm, Ct) -> ([Ct], [Ct], [(EvTerm, Ct)])
addOne ([Ct], [Ct], [(EvTerm, Ct)])
scs [(EvTerm, Ct)]
xs
addOne :: SolvedCts -> (EvTerm,Ct) -> SolvedCts
addOne :: ([Ct], [Ct], [(EvTerm, Ct)])
-> (EvTerm, Ct) -> ([Ct], [Ct], [(EvTerm, Ct)])
addOne ([Ct]
givens, [Ct]
deriveds, [(EvTerm, Ct)]
wanteds) (EvTerm
ev,Ct
ct) = case Ct -> CtEvidence
ctEvidence Ct
ct of
CtGiven {} -> (Ct
ctCt -> [Ct] -> [Ct]
forall a. a -> [a] -> [a]
:[Ct]
givens, [Ct]
deriveds, [(EvTerm, Ct)]
wanteds)
CtDerived{} -> ([Ct]
givens, Ct
ctCt -> [Ct] -> [Ct]
forall a. a -> [a] -> [a]
:[Ct]
deriveds, [(EvTerm, Ct)]
wanteds)
CtWanted {} -> ([Ct]
givens, [Ct]
deriveds, (EvTerm
ev,Ct
ct)(EvTerm, Ct) -> [(EvTerm, Ct)] -> [(EvTerm, Ct)]
forall a. a -> [a] -> [a]
:[(EvTerm, Ct)]
wanteds)
type WorkItem = Ct
type SimplifierStage = WorkItem -> TcS (StopOrContinue Ct)
runSolverPipeline :: [(String,SimplifierStage)]
-> WorkItem
-> TcS ()
runSolverPipeline :: [(String, SimplifierStage)] -> Ct -> TcS ()
runSolverPipeline [(String, SimplifierStage)]
pipeline Ct
workItem
= do { WorkList
wl <- TcS WorkList
getWorkList
; InertSet
inerts <- TcS InertSet
getTcSInerts
; TcLevel
tclevel <- TcS TcLevel
getTcLevel
; String -> SDoc -> TcS ()
traceTcS String
"----------------------------- " SDoc
empty
; String -> SDoc -> TcS ()
traceTcS String
"Start solver pipeline {" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
[SDoc] -> SDoc
vcat [ String -> SDoc
text String
"tclevel =" SDoc -> SDoc -> SDoc
<+> TcLevel -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcLevel
tclevel
, String -> SDoc
text String
"work item =" SDoc -> SDoc -> SDoc
<+> Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
workItem
, String -> SDoc
text String
"inerts =" SDoc -> SDoc -> SDoc
<+> InertSet -> SDoc
forall a. Outputable a => a -> SDoc
ppr InertSet
inerts
, String -> SDoc
text String
"rest of worklist =" SDoc -> SDoc -> SDoc
<+> WorkList -> SDoc
forall a. Outputable a => a -> SDoc
ppr WorkList
wl ]
; TcS ()
bumpStepCountTcS
; StopOrContinue Ct
final_res <- [(String, SimplifierStage)]
-> StopOrContinue Ct -> TcS (StopOrContinue Ct)
run_pipeline [(String, SimplifierStage)]
pipeline (Ct -> StopOrContinue Ct
forall a. a -> StopOrContinue a
ContinueWith Ct
workItem)
; case StopOrContinue Ct
final_res of
Stop CtEvidence
ev SDoc
s -> do { CtEvidence -> SDoc -> TcS ()
traceFireTcS CtEvidence
ev SDoc
s
; String -> SDoc -> TcS ()
traceTcS String
"End solver pipeline (discharged) }" SDoc
empty
; () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return () }
ContinueWith Ct
ct -> do { Ct -> TcS ()
addInertCan Ct
ct
; CtEvidence -> SDoc -> TcS ()
traceFireTcS (Ct -> CtEvidence
ctEvidence Ct
ct) (String -> SDoc
text String
"Kept as inert")
; String -> SDoc -> TcS ()
traceTcS String
"End solver pipeline (kept as inert) }" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
(String -> SDoc
text String
"final_item =" SDoc -> SDoc -> SDoc
<+> Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
ct) }
}
where run_pipeline :: [(String,SimplifierStage)] -> StopOrContinue Ct
-> TcS (StopOrContinue Ct)
run_pipeline :: [(String, SimplifierStage)]
-> StopOrContinue Ct -> TcS (StopOrContinue Ct)
run_pipeline [] StopOrContinue Ct
res = StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall (m :: * -> *) a. Monad m => a -> m a
return StopOrContinue Ct
res
run_pipeline [(String, SimplifierStage)]
_ (Stop CtEvidence
ev SDoc
s) = StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall (m :: * -> *) a. Monad m => a -> m a
return (CtEvidence -> SDoc -> StopOrContinue Ct
forall a. CtEvidence -> SDoc -> StopOrContinue a
Stop CtEvidence
ev SDoc
s)
run_pipeline ((String
stg_name,SimplifierStage
stg):[(String, SimplifierStage)]
stgs) (ContinueWith Ct
ct)
= do { String -> SDoc -> TcS ()
traceTcS (String
"runStage " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
stg_name String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" {")
(String -> SDoc
text String
"workitem = " SDoc -> SDoc -> SDoc
<+> Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
ct)
; StopOrContinue Ct
res <- SimplifierStage
stg Ct
ct
; String -> SDoc -> TcS ()
traceTcS (String
"end stage " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
stg_name String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" }") SDoc
empty
; [(String, SimplifierStage)]
-> StopOrContinue Ct -> TcS (StopOrContinue Ct)
run_pipeline [(String, SimplifierStage)]
stgs StopOrContinue Ct
res }
thePipeline :: [(String,SimplifierStage)]
thePipeline :: [(String, SimplifierStage)]
thePipeline = [ (String
"canonicalization", SimplifierStage
GHC.Tc.Solver.Canonical.canonicalize)
, (String
"interact with inerts", SimplifierStage
interactWithInertsStage)
, (String
"top-level reactions", SimplifierStage
topReactionsStage) ]
interactWithInertsStage :: WorkItem -> TcS (StopOrContinue Ct)
interactWithInertsStage :: SimplifierStage
interactWithInertsStage Ct
wi
= do { InertSet
inerts <- TcS InertSet
getTcSInerts
; let ics :: InertCans
ics = InertSet -> InertCans
inert_cans InertSet
inerts
; case Ct
wi of
CEqCan {} -> InertCans -> SimplifierStage
interactEq InertCans
ics Ct
wi
CIrredCan {} -> InertCans -> SimplifierStage
interactIrred InertCans
ics Ct
wi
CDictCan {} -> InertCans -> SimplifierStage
interactDict InertCans
ics Ct
wi
Ct
_ -> String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactWithInerts" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
wi) }
data InteractResult
= KeepInert
| KeepWork
| KeepBoth
instance Outputable InteractResult where
ppr :: InteractResult -> SDoc
ppr InteractResult
KeepBoth = String -> SDoc
text String
"keep both"
ppr InteractResult
KeepInert = String -> SDoc
text String
"keep inert"
ppr InteractResult
KeepWork = String -> SDoc
text String
"keep work-item"
solveOneFromTheOther :: CtEvidence
-> CtEvidence
-> TcS InteractResult
solveOneFromTheOther :: CtEvidence -> CtEvidence -> TcS InteractResult
solveOneFromTheOther CtEvidence
ev_i CtEvidence
ev_w
| CtDerived {} <- CtEvidence
ev_w
= case CtEvidence
ev_i of
CtWanted { ctev_nosh :: CtEvidence -> ShadowInfo
ctev_nosh = ShadowInfo
WOnly } -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepBoth
CtEvidence
_ -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepInert
| CtDerived {} <- CtEvidence
ev_i
= case CtEvidence
ev_w of
CtWanted { ctev_nosh :: CtEvidence -> ShadowInfo
ctev_nosh = ShadowInfo
WOnly } -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepBoth
CtEvidence
_ -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepWork
| CtWanted { ctev_loc :: CtEvidence -> CtLoc
ctev_loc = CtLoc
loc_w } <- CtEvidence
ev_w
, CtLoc -> CtLoc -> Bool
prohibitedSuperClassSolve (CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_i) CtLoc
loc_w
=
do { String -> SDoc -> TcS ()
traceTcS String
"prohibitedClassSolve1" (CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
ev_i SDoc -> SDoc -> SDoc
$$ CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
ev_w)
; InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepWork }
| CtWanted { ctev_nosh :: CtEvidence -> ShadowInfo
ctev_nosh = ShadowInfo
nosh_w } <- CtEvidence
ev_w
= case CtEvidence
ev_i of
CtWanted { ctev_nosh :: CtEvidence -> ShadowInfo
ctev_nosh = ShadowInfo
WOnly }
| ShadowInfo
WDeriv <- ShadowInfo
nosh_w -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepWork
CtEvidence
_ -> InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepInert
| CtWanted { ctev_loc :: CtEvidence -> CtLoc
ctev_loc = CtLoc
loc_i } <- CtEvidence
ev_i
, CtLoc -> CtLoc -> Bool
prohibitedSuperClassSolve CtLoc
loc_w CtLoc
loc_i
= do { String -> SDoc -> TcS ()
traceTcS String
"prohibitedClassSolve2" (CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
ev_i SDoc -> SDoc -> SDoc
$$ CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
ev_w)
; InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepInert }
| CtWanted {} <- CtEvidence
ev_i
= InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
KeepWork
| TcLevel
lvl_i TcLevel -> TcLevel -> Bool
forall a. Eq a => a -> a -> Bool
== TcLevel
lvl_w
= do { EvBindsVar
ev_binds_var <- TcS EvBindsVar
getTcEvBindsVar
; EvBindMap
binds <- EvBindsVar -> TcS EvBindMap
getTcEvBindsMap EvBindsVar
ev_binds_var
; InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return (EvBindMap -> InteractResult
same_level_strategy EvBindMap
binds) }
| Bool
otherwise
= InteractResult -> TcS InteractResult
forall (m :: * -> *) a. Monad m => a -> m a
return InteractResult
different_level_strategy
where
pred :: TcPredType
pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev_i
loc_i :: CtLoc
loc_i = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_i
loc_w :: CtLoc
loc_w = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_w
lvl_i :: TcLevel
lvl_i = CtLoc -> TcLevel
ctLocLevel CtLoc
loc_i
lvl_w :: TcLevel
lvl_w = CtLoc -> TcLevel
ctLocLevel CtLoc
loc_w
ev_id_i :: TyVar
ev_id_i = CtEvidence -> TyVar
ctEvEvId CtEvidence
ev_i
ev_id_w :: TyVar
ev_id_w = CtEvidence -> TyVar
ctEvEvId CtEvidence
ev_w
different_level_strategy :: InteractResult
different_level_strategy
| TcPredType -> Bool
isIPLikePred TcPredType
pred = if TcLevel
lvl_w TcLevel -> TcLevel -> Bool
forall a. Ord a => a -> a -> Bool
> TcLevel
lvl_i then InteractResult
KeepWork else InteractResult
KeepInert
| Bool
otherwise = if TcLevel
lvl_w TcLevel -> TcLevel -> Bool
forall a. Ord a => a -> a -> Bool
> TcLevel
lvl_i then InteractResult
KeepInert else InteractResult
KeepWork
same_level_strategy :: EvBindMap -> InteractResult
same_level_strategy EvBindMap
binds
| GivenOrigin (InstSC TypeSize
s_i) <- CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc_i
= case CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc_w of
GivenOrigin (InstSC TypeSize
s_w) | TypeSize
s_w TypeSize -> TypeSize -> Bool
forall a. Ord a => a -> a -> Bool
< TypeSize
s_i -> InteractResult
KeepWork
| Bool
otherwise -> InteractResult
KeepInert
CtOrigin
_ -> InteractResult
KeepWork
| GivenOrigin (InstSC {}) <- CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc_w
= InteractResult
KeepInert
| EvBindMap -> TyVar -> Bool
has_binding EvBindMap
binds TyVar
ev_id_w
, Bool -> Bool
not (EvBindMap -> TyVar -> Bool
has_binding EvBindMap
binds TyVar
ev_id_i)
, Bool -> Bool
not (TyVar
ev_id_i TyVar -> VarSet -> Bool
`elemVarSet` EvBindMap -> VarSet -> VarSet
findNeededEvVars EvBindMap
binds (TyVar -> VarSet
unitVarSet TyVar
ev_id_w))
= InteractResult
KeepWork
| Bool
otherwise
= InteractResult
KeepInert
has_binding :: EvBindMap -> TyVar -> Bool
has_binding EvBindMap
binds TyVar
ev_id = Maybe EvBind -> Bool
forall a. Maybe a -> Bool
isJust (EvBindMap -> TyVar -> Maybe EvBind
lookupEvBind EvBindMap
binds TyVar
ev_id)
interactIrred :: InertCans -> Ct -> TcS (StopOrContinue Ct)
interactIrred :: InertCans -> SimplifierStage
interactIrred InertCans
inerts workItem :: Ct
workItem@(CIrredCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev_w, cc_reason :: Ct -> CtIrredReason
cc_reason = CtIrredReason
reason })
| CtIrredReason -> Bool
isInsolubleReason CtIrredReason
reason
, Bool -> Bool
not (Ct -> Bool
isDroppableCt Ct
workItem)
= SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem
| let (Bag (Ct, SwapFlag)
matching_irreds, Cts
others) = Cts -> CtEvidence -> (Bag (Ct, SwapFlag), Cts)
findMatchingIrreds (InertCans -> Cts
inert_irreds InertCans
inerts) CtEvidence
ev_w
, ((Ct
ct_i, SwapFlag
swap) : [(Ct, SwapFlag)]
_rest) <- Bag (Ct, SwapFlag) -> [(Ct, SwapFlag)]
forall a. Bag a -> [a]
bagToList Bag (Ct, SwapFlag)
matching_irreds
, let ev_i :: CtEvidence
ev_i = Ct -> CtEvidence
ctEvidence Ct
ct_i
= do { InteractResult
what_next <- CtEvidence -> CtEvidence -> TcS InteractResult
solveOneFromTheOther CtEvidence
ev_i CtEvidence
ev_w
; String -> SDoc -> TcS ()
traceTcS String
"iteractIrred" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
workItem SDoc -> SDoc -> SDoc
$$ InteractResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr InteractResult
what_next SDoc -> SDoc -> SDoc
$$ Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
ct_i)
; case InteractResult
what_next of
InteractResult
KeepBoth -> SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem
InteractResult
KeepInert -> do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev_w (SwapFlag -> CtEvidence -> EvTerm
swap_me SwapFlag
swap CtEvidence
ev_i)
; StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall (m :: * -> *) a. Monad m => a -> m a
return (CtEvidence -> SDoc -> StopOrContinue Ct
forall a. CtEvidence -> SDoc -> StopOrContinue a
Stop CtEvidence
ev_w (String -> SDoc
text String
"Irred equal" SDoc -> SDoc -> SDoc
<+> SDoc -> SDoc
parens (InteractResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr InteractResult
what_next))) }
InteractResult
KeepWork -> do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev_i (SwapFlag -> CtEvidence -> EvTerm
swap_me SwapFlag
swap CtEvidence
ev_w)
; (Cts -> Cts) -> TcS ()
updInertIrreds (\Cts
_ -> Cts
others)
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem } }
| Bool
otherwise
= SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem
where
swap_me :: SwapFlag -> CtEvidence -> EvTerm
swap_me :: SwapFlag -> CtEvidence -> EvTerm
swap_me SwapFlag
swap CtEvidence
ev
= case SwapFlag
swap of
SwapFlag
NotSwapped -> CtEvidence -> EvTerm
ctEvTerm CtEvidence
ev
SwapFlag
IsSwapped -> TcCoercion -> EvTerm
evCoercion (TcCoercion -> TcCoercion
mkTcSymCo (EvTerm -> TcCoercion
evTermCoercion (CtEvidence -> EvTerm
ctEvTerm CtEvidence
ev)))
interactIrred InertCans
_ Ct
wi = String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactIrred" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
wi)
findMatchingIrreds :: Cts -> CtEvidence -> (Bag (Ct, SwapFlag), Bag Ct)
findMatchingIrreds :: Cts -> CtEvidence -> (Bag (Ct, SwapFlag), Cts)
findMatchingIrreds Cts
irreds CtEvidence
ev
| EqPred EqRel
eq_rel1 TcPredType
lty1 TcPredType
rty1 <- TcPredType -> Pred
classifyPredType TcPredType
pred
= (Ct -> Either (Ct, SwapFlag) Ct)
-> Cts -> (Bag (Ct, SwapFlag), Cts)
forall a b c. (a -> Either b c) -> Bag a -> (Bag b, Bag c)
partitionBagWith (EqRel -> TcPredType -> TcPredType -> Ct -> Either (Ct, SwapFlag) Ct
match_eq EqRel
eq_rel1 TcPredType
lty1 TcPredType
rty1) Cts
irreds
| Bool
otherwise
= (Ct -> Either (Ct, SwapFlag) Ct)
-> Cts -> (Bag (Ct, SwapFlag), Cts)
forall a b c. (a -> Either b c) -> Bag a -> (Bag b, Bag c)
partitionBagWith Ct -> Either (Ct, SwapFlag) Ct
match_non_eq Cts
irreds
where
pred :: TcPredType
pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev
match_non_eq :: Ct -> Either (Ct, SwapFlag) Ct
match_non_eq Ct
ct
| Ct -> TcPredType
ctPred Ct
ct TcPredType -> TcPredType -> Bool
`tcEqTypeNoKindCheck` TcPredType
pred = (Ct, SwapFlag) -> Either (Ct, SwapFlag) Ct
forall a b. a -> Either a b
Left (Ct
ct, SwapFlag
NotSwapped)
| Bool
otherwise = Ct -> Either (Ct, SwapFlag) Ct
forall a b. b -> Either a b
Right Ct
ct
match_eq :: EqRel -> TcPredType -> TcPredType -> Ct -> Either (Ct, SwapFlag) Ct
match_eq EqRel
eq_rel1 TcPredType
lty1 TcPredType
rty1 Ct
ct
| EqPred EqRel
eq_rel2 TcPredType
lty2 TcPredType
rty2 <- TcPredType -> Pred
classifyPredType (Ct -> TcPredType
ctPred Ct
ct)
, EqRel
eq_rel1 EqRel -> EqRel -> Bool
forall a. Eq a => a -> a -> Bool
== EqRel
eq_rel2
, Just SwapFlag
swap <- TcPredType
-> TcPredType -> TcPredType -> TcPredType -> Maybe SwapFlag
match_eq_help TcPredType
lty1 TcPredType
rty1 TcPredType
lty2 TcPredType
rty2
= (Ct, SwapFlag) -> Either (Ct, SwapFlag) Ct
forall a b. a -> Either a b
Left (Ct
ct, SwapFlag
swap)
| Bool
otherwise
= Ct -> Either (Ct, SwapFlag) Ct
forall a b. b -> Either a b
Right Ct
ct
match_eq_help :: TcPredType
-> TcPredType -> TcPredType -> TcPredType -> Maybe SwapFlag
match_eq_help TcPredType
lty1 TcPredType
rty1 TcPredType
lty2 TcPredType
rty2
| TcPredType
lty1 TcPredType -> TcPredType -> Bool
`tcEqTypeNoKindCheck` TcPredType
lty2, TcPredType
rty1 TcPredType -> TcPredType -> Bool
`tcEqTypeNoKindCheck` TcPredType
rty2
= SwapFlag -> Maybe SwapFlag
forall a. a -> Maybe a
Just SwapFlag
NotSwapped
| TcPredType
lty1 TcPredType -> TcPredType -> Bool
`tcEqTypeNoKindCheck` TcPredType
rty2, TcPredType
rty1 TcPredType -> TcPredType -> Bool
`tcEqTypeNoKindCheck` TcPredType
lty2
= SwapFlag -> Maybe SwapFlag
forall a. a -> Maybe a
Just SwapFlag
IsSwapped
| Bool
otherwise
= Maybe SwapFlag
forall a. Maybe a
Nothing
interactDict :: InertCans -> Ct -> TcS (StopOrContinue Ct)
interactDict :: InertCans -> SimplifierStage
interactDict InertCans
inerts workItem :: Ct
workItem@(CDictCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev_w, cc_class :: Ct -> Class
cc_class = Class
cls, cc_tyargs :: Ct -> [TcPredType]
cc_tyargs = [TcPredType]
tys })
| Just Ct
ct_i <- InertCans -> CtLoc -> Class -> [TcPredType] -> Maybe Ct
lookupInertDict InertCans
inerts (CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_w) Class
cls [TcPredType]
tys
, let ev_i :: CtEvidence
ev_i = Ct -> CtEvidence
ctEvidence Ct
ct_i
=
do {
DynFlags
dflags <- TcS DynFlags
forall (m :: * -> *). HasDynFlags m => m DynFlags
getDynFlags
; Bool
short_cut_worked <- DynFlags -> CtEvidence -> CtEvidence -> TcS Bool
shortCutSolver DynFlags
dflags CtEvidence
ev_w CtEvidence
ev_i
; if Bool
short_cut_worked
then CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev_w String
"interactDict/solved from instance"
else
do {
InteractResult
what_next <- CtEvidence -> CtEvidence -> TcS InteractResult
solveOneFromTheOther CtEvidence
ev_i CtEvidence
ev_w
; String -> SDoc -> TcS ()
traceTcS String
"lookupInertDict" (InteractResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr InteractResult
what_next)
; case InteractResult
what_next of
InteractResult
KeepBoth -> SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem
InteractResult
KeepInert -> do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev_w (CtEvidence -> EvTerm
ctEvTerm CtEvidence
ev_i)
; StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall (m :: * -> *) a. Monad m => a -> m a
return (StopOrContinue Ct -> TcS (StopOrContinue Ct))
-> StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall a b. (a -> b) -> a -> b
$ CtEvidence -> SDoc -> StopOrContinue Ct
forall a. CtEvidence -> SDoc -> StopOrContinue a
Stop CtEvidence
ev_w (String -> SDoc
text String
"Dict equal" SDoc -> SDoc -> SDoc
<+> SDoc -> SDoc
parens (InteractResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr InteractResult
what_next)) }
InteractResult
KeepWork -> do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev_i (CtEvidence -> EvTerm
ctEvTerm CtEvidence
ev_w)
; (DictMap Ct -> DictMap Ct) -> TcS ()
updInertDicts ((DictMap Ct -> DictMap Ct) -> TcS ())
-> (DictMap Ct -> DictMap Ct) -> TcS ()
forall a b. (a -> b) -> a -> b
$ \ DictMap Ct
ds -> DictMap Ct -> Class -> [TcPredType] -> DictMap Ct
forall a. DictMap a -> Class -> [TcPredType] -> DictMap a
delDict DictMap Ct
ds Class
cls [TcPredType]
tys
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem } } }
| Class
cls Class -> Unique -> Bool
forall a. Uniquable a => a -> Unique -> Bool
`hasKey` Unique
ipClassKey
, CtEvidence -> Bool
isGiven CtEvidence
ev_w
= InertCans -> SimplifierStage
interactGivenIP InertCans
inerts Ct
workItem
| Bool
otherwise
= do { InertCans -> CtEvidence -> Class -> TcS ()
addFunDepWork InertCans
inerts CtEvidence
ev_w Class
cls
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem }
interactDict InertCans
_ Ct
wi = String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactDict" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
wi)
shortCutSolver :: DynFlags
-> CtEvidence
-> CtEvidence
-> TcS Bool
shortCutSolver :: DynFlags -> CtEvidence -> CtEvidence -> TcS Bool
shortCutSolver DynFlags
dflags CtEvidence
ev_w CtEvidence
ev_i
| CtEvidence -> Bool
isWanted CtEvidence
ev_w
Bool -> Bool -> Bool
&& CtEvidence -> Bool
isGiven CtEvidence
ev_i
Bool -> Bool -> Bool
&& Bool -> Bool
not (TcPredType -> Bool
isIPLikePred (CtEvidence -> TcPredType
ctEvPred CtEvidence
ev_w))
Bool -> Bool -> Bool
&& Bool -> Bool
not (Extension -> DynFlags -> Bool
xopt Extension
LangExt.IncoherentInstances DynFlags
dflags)
Bool -> Bool -> Bool
&& GeneralFlag -> DynFlags -> Bool
gopt GeneralFlag
Opt_SolveConstantDicts DynFlags
dflags
= do { EvBindsVar
ev_binds_var <- TcS EvBindsVar
getTcEvBindsVar
; EvBindMap
ev_binds <- ASSERT2( not (isCoEvBindsVar ev_binds_var ), ppr ev_w )
EvBindsVar -> TcS EvBindMap
getTcEvBindsMap EvBindsVar
ev_binds_var
; DictMap CtEvidence
solved_dicts <- TcS (DictMap CtEvidence)
getSolvedDicts
; Maybe (EvBindMap, DictMap CtEvidence)
mb_stuff <- MaybeT TcS (EvBindMap, DictMap CtEvidence)
-> TcS (Maybe (EvBindMap, DictMap CtEvidence))
forall (m :: * -> *) a. MaybeT m a -> m (Maybe a)
runMaybeT (MaybeT TcS (EvBindMap, DictMap CtEvidence)
-> TcS (Maybe (EvBindMap, DictMap CtEvidence)))
-> MaybeT TcS (EvBindMap, DictMap CtEvidence)
-> TcS (Maybe (EvBindMap, DictMap CtEvidence))
forall a b. (a -> b) -> a -> b
$ (EvBindMap, DictMap CtEvidence)
-> CtEvidence -> MaybeT TcS (EvBindMap, DictMap CtEvidence)
try_solve_from_instance
(EvBindMap
ev_binds, DictMap CtEvidence
solved_dicts) CtEvidence
ev_w
; case Maybe (EvBindMap, DictMap CtEvidence)
mb_stuff of
Maybe (EvBindMap, DictMap CtEvidence)
Nothing -> Bool -> TcS Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
False
Just (EvBindMap
ev_binds', DictMap CtEvidence
solved_dicts')
-> do { EvBindsVar -> EvBindMap -> TcS ()
setTcEvBindsMap EvBindsVar
ev_binds_var EvBindMap
ev_binds'
; DictMap CtEvidence -> TcS ()
setSolvedDicts DictMap CtEvidence
solved_dicts'
; Bool -> TcS Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
True } }
| Bool
otherwise
= Bool -> TcS Bool
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
False
where
loc_w :: CtLoc
loc_w = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_w
try_solve_from_instance
:: (EvBindMap, DictMap CtEvidence) -> CtEvidence
-> MaybeT TcS (EvBindMap, DictMap CtEvidence)
try_solve_from_instance :: (EvBindMap, DictMap CtEvidence)
-> CtEvidence -> MaybeT TcS (EvBindMap, DictMap CtEvidence)
try_solve_from_instance (EvBindMap
ev_binds, DictMap CtEvidence
solved_dicts) CtEvidence
ev
| let pred :: TcPredType
pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev
loc :: CtLoc
loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev
, ClassPred Class
cls [TcPredType]
tys <- TcPredType -> Pred
classifyPredType TcPredType
pred
= do { ClsInstResult
inst_res <- TcS ClsInstResult -> MaybeT TcS ClsInstResult
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a.
(MonadTrans t, Monad m) =>
m a -> t m a
lift (TcS ClsInstResult -> MaybeT TcS ClsInstResult)
-> TcS ClsInstResult -> MaybeT TcS ClsInstResult
forall a b. (a -> b) -> a -> b
$ DynFlags -> Bool -> Class -> [TcPredType] -> TcS ClsInstResult
matchGlobalInst DynFlags
dflags Bool
True Class
cls [TcPredType]
tys
; case ClsInstResult
inst_res of
OneInst { cir_new_theta :: ClsInstResult -> [TcPredType]
cir_new_theta = [TcPredType]
preds
, cir_mk_ev :: ClsInstResult -> [EvExpr] -> EvTerm
cir_mk_ev = [EvExpr] -> EvTerm
mk_ev
, cir_what :: ClsInstResult -> InstanceWhat
cir_what = InstanceWhat
what }
| InstanceWhat -> Bool
safeOverlap InstanceWhat
what
, (TcPredType -> Bool) -> [TcPredType] -> Bool
forall (t :: * -> *) a. Foldable t => (a -> Bool) -> t a -> Bool
all TcPredType -> Bool
isTyFamFree [TcPredType]
preds
-> do { let solved_dicts' :: DictMap CtEvidence
solved_dicts' = DictMap CtEvidence
-> Class -> [TcPredType] -> CtEvidence -> DictMap CtEvidence
forall a. DictMap a -> Class -> [TcPredType] -> a -> DictMap a
addDict DictMap CtEvidence
solved_dicts Class
cls [TcPredType]
tys CtEvidence
ev
; TcS () -> MaybeT TcS ()
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a.
(MonadTrans t, Monad m) =>
m a -> t m a
lift (TcS () -> MaybeT TcS ()) -> TcS () -> MaybeT TcS ()
forall a b. (a -> b) -> a -> b
$ String -> SDoc -> TcS ()
traceTcS String
"shortCutSolver: found instance" ([TcPredType] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TcPredType]
preds)
; CtLoc
loc' <- TcS CtLoc -> MaybeT TcS CtLoc
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a.
(MonadTrans t, Monad m) =>
m a -> t m a
lift (TcS CtLoc -> MaybeT TcS CtLoc) -> TcS CtLoc -> MaybeT TcS CtLoc
forall a b. (a -> b) -> a -> b
$ CtLoc -> InstanceWhat -> TcPredType -> TcS CtLoc
checkInstanceOK CtLoc
loc InstanceWhat
what TcPredType
pred
; TcS () -> MaybeT TcS ()
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a.
(MonadTrans t, Monad m) =>
m a -> t m a
lift (TcS () -> MaybeT TcS ()) -> TcS () -> MaybeT TcS ()
forall a b. (a -> b) -> a -> b
$ CtLoc -> TcPredType -> TcS ()
checkReductionDepth CtLoc
loc' TcPredType
pred
; [MaybeNew]
evc_vs <- (TcPredType -> MaybeT TcS MaybeNew)
-> [TcPredType] -> MaybeT TcS [MaybeNew]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
mapM (CtLoc -> DictMap CtEvidence -> TcPredType -> MaybeT TcS MaybeNew
new_wanted_cached CtLoc
loc' DictMap CtEvidence
solved_dicts') [TcPredType]
preds
; let ev_tm :: EvTerm
ev_tm = [EvExpr] -> EvTerm
mk_ev ((MaybeNew -> EvExpr) -> [MaybeNew] -> [EvExpr]
forall a b. (a -> b) -> [a] -> [b]
map MaybeNew -> EvExpr
getEvExpr [MaybeNew]
evc_vs)
ev_binds' :: EvBindMap
ev_binds' = EvBindMap -> EvBind -> EvBindMap
extendEvBinds EvBindMap
ev_binds (EvBind -> EvBindMap) -> EvBind -> EvBindMap
forall a b. (a -> b) -> a -> b
$
TyVar -> EvTerm -> EvBind
mkWantedEvBind (CtEvidence -> TyVar
ctEvEvId CtEvidence
ev) EvTerm
ev_tm
; ((EvBindMap, DictMap CtEvidence)
-> CtEvidence -> MaybeT TcS (EvBindMap, DictMap CtEvidence))
-> (EvBindMap, DictMap CtEvidence)
-> [CtEvidence]
-> MaybeT TcS (EvBindMap, DictMap CtEvidence)
forall (t :: * -> *) (m :: * -> *) b a.
(Foldable t, Monad m) =>
(b -> a -> m b) -> b -> t a -> m b
foldlM (EvBindMap, DictMap CtEvidence)
-> CtEvidence -> MaybeT TcS (EvBindMap, DictMap CtEvidence)
try_solve_from_instance
(EvBindMap
ev_binds', DictMap CtEvidence
solved_dicts')
([MaybeNew] -> [CtEvidence]
freshGoals [MaybeNew]
evc_vs) }
ClsInstResult
_ -> MaybeT TcS (EvBindMap, DictMap CtEvidence)
forall (m :: * -> *) a. MonadPlus m => m a
mzero }
| Bool
otherwise = MaybeT TcS (EvBindMap, DictMap CtEvidence)
forall (m :: * -> *) a. MonadPlus m => m a
mzero
new_wanted_cached :: CtLoc -> DictMap CtEvidence -> TcPredType -> MaybeT TcS MaybeNew
new_wanted_cached :: CtLoc -> DictMap CtEvidence -> TcPredType -> MaybeT TcS MaybeNew
new_wanted_cached CtLoc
loc DictMap CtEvidence
cache TcPredType
pty
| ClassPred Class
cls [TcPredType]
tys <- TcPredType -> Pred
classifyPredType TcPredType
pty
= TcS MaybeNew -> MaybeT TcS MaybeNew
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a.
(MonadTrans t, Monad m) =>
m a -> t m a
lift (TcS MaybeNew -> MaybeT TcS MaybeNew)
-> TcS MaybeNew -> MaybeT TcS MaybeNew
forall a b. (a -> b) -> a -> b
$ case DictMap CtEvidence
-> CtLoc -> Class -> [TcPredType] -> Maybe CtEvidence
forall a. DictMap a -> CtLoc -> Class -> [TcPredType] -> Maybe a
findDict DictMap CtEvidence
cache CtLoc
loc_w Class
cls [TcPredType]
tys of
Just CtEvidence
ctev -> MaybeNew -> TcS MaybeNew
forall (m :: * -> *) a. Monad m => a -> m a
return (MaybeNew -> TcS MaybeNew) -> MaybeNew -> TcS MaybeNew
forall a b. (a -> b) -> a -> b
$ EvExpr -> MaybeNew
Cached (CtEvidence -> EvExpr
ctEvExpr CtEvidence
ctev)
Maybe CtEvidence
Nothing -> CtEvidence -> MaybeNew
Fresh (CtEvidence -> MaybeNew) -> TcS CtEvidence -> TcS MaybeNew
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> CtLoc -> TcPredType -> TcS CtEvidence
newWantedNC CtLoc
loc TcPredType
pty
| Bool
otherwise = MaybeT TcS MaybeNew
forall (m :: * -> *) a. MonadPlus m => m a
mzero
addFunDepWork :: InertCans -> CtEvidence -> Class -> TcS ()
addFunDepWork :: InertCans -> CtEvidence -> Class -> TcS ()
addFunDepWork InertCans
inerts CtEvidence
work_ev Class
cls
| CtEvidence -> Bool
isImprovable CtEvidence
work_ev
= (Ct -> TcS ()) -> Cts -> TcS ()
forall (m :: * -> *) a b. Monad m => (a -> m b) -> Bag a -> m ()
mapBagM_ Ct -> TcS ()
add_fds (DictMap Ct -> Class -> Cts
forall a. DictMap a -> Class -> Bag a
findDictsByClass (InertCans -> DictMap Ct
inert_dicts InertCans
inerts) Class
cls)
| Bool
otherwise
= () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
where
work_pred :: TcPredType
work_pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
work_ev
work_loc :: CtLoc
work_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
work_ev
add_fds :: Ct -> TcS ()
add_fds Ct
inert_ct
| CtEvidence -> Bool
isImprovable CtEvidence
inert_ev
= do { String -> SDoc -> TcS ()
traceTcS String
"addFunDepWork" ([SDoc] -> SDoc
vcat
[ CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
work_ev
, CtLoc -> SDoc
pprCtLoc CtLoc
work_loc, Bool -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> Bool
isGivenLoc CtLoc
work_loc)
, CtLoc -> SDoc
pprCtLoc CtLoc
inert_loc, Bool -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> Bool
isGivenLoc CtLoc
inert_loc)
, CtLoc -> SDoc
pprCtLoc CtLoc
derived_loc, Bool -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> Bool
isGivenLoc CtLoc
derived_loc) ]) ;
[FunDepEqn CtLoc] -> TcS ()
emitFunDepDeriveds ([FunDepEqn CtLoc] -> TcS ()) -> [FunDepEqn CtLoc] -> TcS ()
forall a b. (a -> b) -> a -> b
$
CtLoc -> TcPredType -> TcPredType -> [FunDepEqn CtLoc]
forall loc. loc -> TcPredType -> TcPredType -> [FunDepEqn loc]
improveFromAnother CtLoc
derived_loc TcPredType
inert_pred TcPredType
work_pred
}
| Bool
otherwise
= () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
where
inert_ev :: CtEvidence
inert_ev = Ct -> CtEvidence
ctEvidence Ct
inert_ct
inert_pred :: TcPredType
inert_pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
inert_ev
inert_loc :: CtLoc
inert_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
inert_ev
derived_loc :: CtLoc
derived_loc = CtLoc
work_loc { ctl_depth :: SubGoalDepth
ctl_depth = CtLoc -> SubGoalDepth
ctl_depth CtLoc
work_loc SubGoalDepth -> SubGoalDepth -> SubGoalDepth
`maxSubGoalDepth`
CtLoc -> SubGoalDepth
ctl_depth CtLoc
inert_loc
, ctl_origin :: CtOrigin
ctl_origin = TcPredType
-> CtOrigin
-> RealSrcSpan
-> TcPredType
-> CtOrigin
-> RealSrcSpan
-> CtOrigin
FunDepOrigin1 TcPredType
work_pred
(CtLoc -> CtOrigin
ctLocOrigin CtLoc
work_loc)
(CtLoc -> RealSrcSpan
ctLocSpan CtLoc
work_loc)
TcPredType
inert_pred
(CtLoc -> CtOrigin
ctLocOrigin CtLoc
inert_loc)
(CtLoc -> RealSrcSpan
ctLocSpan CtLoc
inert_loc) }
interactGivenIP :: InertCans -> Ct -> TcS (StopOrContinue Ct)
interactGivenIP :: InertCans -> SimplifierStage
interactGivenIP InertCans
inerts workItem :: Ct
workItem@(CDictCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev, cc_class :: Ct -> Class
cc_class = Class
cls
, cc_tyargs :: Ct -> [TcPredType]
cc_tyargs = tys :: [TcPredType]
tys@(TcPredType
ip_str:[TcPredType]
_) })
= do { (InertCans -> InertCans) -> TcS ()
updInertCans ((InertCans -> InertCans) -> TcS ())
-> (InertCans -> InertCans) -> TcS ()
forall a b. (a -> b) -> a -> b
$ \InertCans
cans -> InertCans
cans { inert_dicts :: DictMap Ct
inert_dicts = DictMap Ct -> Class -> [TcPredType] -> Ct -> DictMap Ct
forall a. DictMap a -> Class -> [TcPredType] -> a -> DictMap a
addDict DictMap Ct
filtered_dicts Class
cls [TcPredType]
tys Ct
workItem }
; CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev String
"Given IP" }
where
dicts :: DictMap Ct
dicts = InertCans -> DictMap Ct
inert_dicts InertCans
inerts
ip_dicts :: Cts
ip_dicts = DictMap Ct -> Class -> Cts
forall a. DictMap a -> Class -> Bag a
findDictsByClass DictMap Ct
dicts Class
cls
other_ip_dicts :: Cts
other_ip_dicts = (Ct -> Bool) -> Cts -> Cts
forall a. (a -> Bool) -> Bag a -> Bag a
filterBag (Bool -> Bool
not (Bool -> Bool) -> (Ct -> Bool) -> Ct -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Ct -> Bool
is_this_ip) Cts
ip_dicts
filtered_dicts :: DictMap Ct
filtered_dicts = DictMap Ct -> Class -> Cts -> DictMap Ct
addDictsByClass DictMap Ct
dicts Class
cls Cts
other_ip_dicts
is_this_ip :: Ct -> Bool
is_this_ip (CDictCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev, cc_tyargs :: Ct -> [TcPredType]
cc_tyargs = TcPredType
ip_str':[TcPredType]
_ })
= CtEvidence -> Bool
isGiven CtEvidence
ev Bool -> Bool -> Bool
&& TcPredType
ip_str HasDebugCallStack => TcPredType -> TcPredType -> Bool
TcPredType -> TcPredType -> Bool
`tcEqType` TcPredType
ip_str'
is_this_ip Ct
_ = Bool
False
interactGivenIP InertCans
_ Ct
wi = String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactGivenIP" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
wi)
improveLocalFunEqs :: CtEvidence -> InertCans -> TyCon -> [TcType] -> TcType
-> TcS ()
improveLocalFunEqs :: CtEvidence
-> InertCans -> TyCon -> [TcPredType] -> TcPredType -> TcS ()
improveLocalFunEqs CtEvidence
work_ev InertCans
inerts TyCon
fam_tc [TcPredType]
args TcPredType
rhs
= ASSERT( isImprovable work_ev )
Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless ([FunDepEqn CtLoc] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [FunDepEqn CtLoc]
improvement_eqns) (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
do { String -> SDoc -> TcS ()
traceTcS String
"interactFunEq improvements: " (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
[SDoc] -> SDoc
vcat [ String -> SDoc
text String
"Eqns:" SDoc -> SDoc -> SDoc
<+> [FunDepEqn CtLoc] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [FunDepEqn CtLoc]
improvement_eqns
, String -> SDoc
text String
"Candidates:" SDoc -> SDoc -> SDoc
<+> [Ct] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [Ct]
funeqs_for_tc
, String -> SDoc
text String
"Inert eqs:" SDoc -> SDoc -> SDoc
<+> InertEqs -> SDoc
forall a. Outputable a => a -> SDoc
ppr (InertCans -> InertEqs
inert_eqs InertCans
inerts) ]
; [FunDepEqn CtLoc] -> TcS ()
emitFunDepDeriveds [FunDepEqn CtLoc]
improvement_eqns }
where
funeqs :: FunEqMap EqualCtList
funeqs = InertCans -> FunEqMap EqualCtList
inert_funeqs InertCans
inerts
funeqs_for_tc :: [Ct]
funeqs_for_tc = [ Ct
funeq_ct | EqualCtList (Ct
funeq_ct :| [Ct]
_)
<- FunEqMap EqualCtList -> TyCon -> [EqualCtList]
forall a. FunEqMap a -> TyCon -> [a]
findFunEqsByTyCon FunEqMap EqualCtList
funeqs TyCon
fam_tc
, EqRel
NomEq EqRel -> EqRel -> Bool
forall a. Eq a => a -> a -> Bool
== Ct -> EqRel
ctEqRel Ct
funeq_ct ]
work_loc :: CtLoc
work_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
work_ev
work_pred :: TcPredType
work_pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
work_ev
fam_inj_info :: Injectivity
fam_inj_info = TyCon -> Injectivity
tyConInjectivityInfo TyCon
fam_tc
improvement_eqns :: [FunDepEqn CtLoc]
improvement_eqns :: [FunDepEqn CtLoc]
improvement_eqns
| Just BuiltInSynFamily
ops <- TyCon -> Maybe BuiltInSynFamily
isBuiltInSynFamTyCon_maybe TyCon
fam_tc
=
(Ct -> [FunDepEqn CtLoc]) -> [Ct] -> [FunDepEqn CtLoc]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap (BuiltInSynFamily -> TcPredType -> Ct -> [FunDepEqn CtLoc]
do_one_built_in BuiltInSynFamily
ops TcPredType
rhs) [Ct]
funeqs_for_tc
| Injective [Bool]
injective_args <- Injectivity
fam_inj_info
=
(Ct -> [FunDepEqn CtLoc]) -> [Ct] -> [FunDepEqn CtLoc]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap ([Bool] -> TcPredType -> Ct -> [FunDepEqn CtLoc]
do_one_injective [Bool]
injective_args TcPredType
rhs) [Ct]
funeqs_for_tc
| Bool
otherwise
= []
do_one_built_in :: BuiltInSynFamily -> TcPredType -> Ct -> [FunDepEqn CtLoc]
do_one_built_in BuiltInSynFamily
ops TcPredType
rhs (CEqCan { cc_lhs :: Ct -> CanEqLHS
cc_lhs = TyFamLHS TyCon
_ [TcPredType]
iargs, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
irhs, cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
inert_ev })
= CtEvidence -> [TypeEqn] -> [FunDepEqn CtLoc]
mk_fd_eqns CtEvidence
inert_ev (BuiltInSynFamily
-> [TcPredType]
-> TcPredType
-> [TcPredType]
-> TcPredType
-> [TypeEqn]
sfInteractInert BuiltInSynFamily
ops [TcPredType]
args TcPredType
rhs [TcPredType]
iargs TcPredType
irhs)
do_one_built_in BuiltInSynFamily
_ TcPredType
_ Ct
_ = String -> SDoc -> [FunDepEqn CtLoc]
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactFunEq 1" (TyCon -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyCon
fam_tc)
do_one_injective :: [Bool] -> TcPredType -> Ct -> [FunDepEqn CtLoc]
do_one_injective [Bool]
inj_args TcPredType
rhs (CEqCan { cc_lhs :: Ct -> CanEqLHS
cc_lhs = TyFamLHS TyCon
_ [TcPredType]
inert_args
, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
irhs, cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
inert_ev })
| CtEvidence -> Bool
isImprovable CtEvidence
inert_ev
, TcPredType
rhs HasDebugCallStack => TcPredType -> TcPredType -> Bool
TcPredType -> TcPredType -> Bool
`tcEqType` TcPredType
irhs
= CtEvidence -> [TypeEqn] -> [FunDepEqn CtLoc]
mk_fd_eqns CtEvidence
inert_ev ([TypeEqn] -> [FunDepEqn CtLoc]) -> [TypeEqn] -> [FunDepEqn CtLoc]
forall a b. (a -> b) -> a -> b
$ [ TcPredType -> TcPredType -> TypeEqn
forall a. a -> a -> Pair a
Pair TcPredType
arg TcPredType
iarg
| (TcPredType
arg, TcPredType
iarg, Bool
True) <- [TcPredType]
-> [TcPredType] -> [Bool] -> [(TcPredType, TcPredType, Bool)]
forall a b c. [a] -> [b] -> [c] -> [(a, b, c)]
zip3 [TcPredType]
args [TcPredType]
inert_args [Bool]
inj_args ]
| Bool
otherwise
= []
do_one_injective [Bool]
_ TcPredType
_ Ct
_ = String -> SDoc -> [FunDepEqn CtLoc]
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactFunEq 2" (TyCon -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyCon
fam_tc)
mk_fd_eqns :: CtEvidence -> [TypeEqn] -> [FunDepEqn CtLoc]
mk_fd_eqns :: CtEvidence -> [TypeEqn] -> [FunDepEqn CtLoc]
mk_fd_eqns CtEvidence
inert_ev [TypeEqn]
eqns
| [TypeEqn] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [TypeEqn]
eqns = []
| Bool
otherwise = [ FDEqn { fd_qtvs :: [TyVar]
fd_qtvs = [], fd_eqs :: [TypeEqn]
fd_eqs = [TypeEqn]
eqns
, fd_pred1 :: TcPredType
fd_pred1 = TcPredType
work_pred
, fd_pred2 :: TcPredType
fd_pred2 = CtEvidence -> TcPredType
ctEvPred CtEvidence
inert_ev
, fd_loc :: CtLoc
fd_loc = CtLoc
loc } ]
where
inert_loc :: CtLoc
inert_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
inert_ev
loc :: CtLoc
loc = CtLoc
inert_loc { ctl_depth :: SubGoalDepth
ctl_depth = CtLoc -> SubGoalDepth
ctl_depth CtLoc
inert_loc SubGoalDepth -> SubGoalDepth -> SubGoalDepth
`maxSubGoalDepth`
CtLoc -> SubGoalDepth
ctl_depth CtLoc
work_loc }
inertsCanDischarge :: InertCans -> Ct
-> Maybe ( CtEvidence
, SwapFlag
, Bool)
inertsCanDischarge :: InertCans -> Ct -> Maybe (CtEvidence, SwapFlag, Bool)
inertsCanDischarge InertCans
inerts (CEqCan { cc_lhs :: Ct -> CanEqLHS
cc_lhs = CanEqLHS
lhs_w, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
rhs_w
, cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev_w, cc_eq_rel :: Ct -> EqRel
cc_eq_rel = EqRel
eq_rel })
| (CtEvidence
ev_i : [CtEvidence]
_) <- [ CtEvidence
ev_i | CEqCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev_i, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
rhs_i
, cc_eq_rel :: Ct -> EqRel
cc_eq_rel = EqRel
eq_rel }
<- InertCans -> CanEqLHS -> [Ct]
findEq InertCans
inerts CanEqLHS
lhs_w
, TcPredType
rhs_i HasDebugCallStack => TcPredType -> TcPredType -> Bool
TcPredType -> TcPredType -> Bool
`tcEqType` TcPredType
rhs_w
, CtEvidence -> EqRel -> Bool
inert_beats_wanted CtEvidence
ev_i EqRel
eq_rel ]
=
(CtEvidence, SwapFlag, Bool) -> Maybe (CtEvidence, SwapFlag, Bool)
forall a. a -> Maybe a
Just (CtEvidence
ev_i, SwapFlag
NotSwapped, CtEvidence -> Bool
keep_deriv CtEvidence
ev_i)
| Just CanEqLHS
rhs_lhs <- TcPredType -> Maybe CanEqLHS
canEqLHS_maybe TcPredType
rhs_w
, (CtEvidence
ev_i : [CtEvidence]
_) <- [ CtEvidence
ev_i | CEqCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev_i, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
rhs_i
, cc_eq_rel :: Ct -> EqRel
cc_eq_rel = EqRel
eq_rel }
<- InertCans -> CanEqLHS -> [Ct]
findEq InertCans
inerts CanEqLHS
rhs_lhs
, TcPredType
rhs_i HasDebugCallStack => TcPredType -> TcPredType -> Bool
TcPredType -> TcPredType -> Bool
`tcEqType` CanEqLHS -> TcPredType
canEqLHSType CanEqLHS
lhs_w
, CtEvidence -> EqRel -> Bool
inert_beats_wanted CtEvidence
ev_i EqRel
eq_rel ]
=
(CtEvidence, SwapFlag, Bool) -> Maybe (CtEvidence, SwapFlag, Bool)
forall a. a -> Maybe a
Just (CtEvidence
ev_i, SwapFlag
IsSwapped, CtEvidence -> Bool
keep_deriv CtEvidence
ev_i)
where
loc_w :: CtLoc
loc_w = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_w
flav_w :: CtFlavour
flav_w = CtEvidence -> CtFlavour
ctEvFlavour CtEvidence
ev_w
fr_w :: (CtFlavour, EqRel)
fr_w = (CtFlavour
flav_w, EqRel
eq_rel)
inert_beats_wanted :: CtEvidence -> EqRel -> Bool
inert_beats_wanted CtEvidence
ev_i EqRel
eq_rel
=
(CtFlavour, EqRel)
fr_i(CtFlavour, EqRel) -> (CtFlavour, EqRel) -> Bool
`eqCanDischargeFR` (CtFlavour, EqRel)
fr_w
Bool -> Bool -> Bool
&& Bool -> Bool
not ((CtLoc
loc_w CtLoc -> CtLoc -> Bool
`strictly_more_visible` CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev_i)
Bool -> Bool -> Bool
&& ((CtFlavour, EqRel)
fr_w (CtFlavour, EqRel) -> (CtFlavour, EqRel) -> Bool
`eqCanDischargeFR` (CtFlavour, EqRel)
fr_i))
where
fr_i :: (CtFlavour, EqRel)
fr_i = (CtEvidence -> CtFlavour
ctEvFlavour CtEvidence
ev_i, EqRel
eq_rel)
keep_deriv :: CtEvidence -> Bool
keep_deriv CtEvidence
ev_i
| Wanted ShadowInfo
WOnly <- CtEvidence -> CtFlavour
ctEvFlavour CtEvidence
ev_i
, Wanted ShadowInfo
WDeriv <- CtFlavour
flav_w
= Bool
True
| Bool
otherwise
= Bool
False
strictly_more_visible :: CtLoc -> CtLoc -> Bool
strictly_more_visible CtLoc
loc1 CtLoc
loc2
= Bool -> Bool
not (CtOrigin -> Bool
isVisibleOrigin (CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc2)) Bool -> Bool -> Bool
&&
CtOrigin -> Bool
isVisibleOrigin (CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc1)
inertsCanDischarge InertCans
_ Ct
_ = Maybe (CtEvidence, SwapFlag, Bool)
forall a. Maybe a
Nothing
interactEq :: InertCans -> Ct -> TcS (StopOrContinue Ct)
interactEq :: InertCans -> SimplifierStage
interactEq InertCans
inerts workItem :: Ct
workItem@(CEqCan { cc_lhs :: Ct -> CanEqLHS
cc_lhs = CanEqLHS
lhs
, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
rhs
, cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev
, cc_eq_rel :: Ct -> EqRel
cc_eq_rel = EqRel
eq_rel })
| Just (CtEvidence
ev_i, SwapFlag
swapped, Bool
keep_deriv) <- InertCans -> Ct -> Maybe (CtEvidence, SwapFlag, Bool)
inertsCanDischarge InertCans
inerts Ct
workItem
= do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev (EvTerm -> TcS ()) -> EvTerm -> TcS ()
forall a b. (a -> b) -> a -> b
$
TcCoercion -> EvTerm
evCoercion (SwapFlag -> TcCoercion -> TcCoercion
maybeTcSymCo SwapFlag
swapped (TcCoercion -> TcCoercion) -> TcCoercion -> TcCoercion
forall a b. (a -> b) -> a -> b
$
Role -> Role -> TcCoercion -> TcCoercion
tcDowngradeRole (EqRel -> Role
eqRelRole EqRel
eq_rel)
(CtEvidence -> Role
ctEvRole CtEvidence
ev_i)
(HasDebugCallStack => CtEvidence -> TcCoercion
CtEvidence -> TcCoercion
ctEvCoercion CtEvidence
ev_i))
; let deriv_ev :: CtEvidence
deriv_ev = CtDerived { ctev_pred :: TcPredType
ctev_pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev
, ctev_loc :: CtLoc
ctev_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev }
; Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
keep_deriv (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
[Ct] -> TcS ()
emitWork [Ct
workItem { cc_ev :: CtEvidence
cc_ev = CtEvidence
deriv_ev }]
; CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev String
"Solved from inert" }
| EqRel
ReprEq <- EqRel
eq_rel
= do { String -> SDoc -> TcS ()
traceTcS String
"Not unifying representational equality" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
workItem)
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem }
| Bool
otherwise
= case CanEqLHS
lhs of
TyVarLHS TyVar
tv -> Ct -> CtEvidence -> TyVar -> TcPredType -> TcS (StopOrContinue Ct)
tryToSolveByUnification Ct
workItem CtEvidence
ev TyVar
tv TcPredType
rhs
TyFamLHS TyCon
tc [TcPredType]
args -> do { Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (CtEvidence -> Bool
isImprovable CtEvidence
ev) (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
CtEvidence
-> InertCans -> TyCon -> [TcPredType] -> TcPredType -> TcS ()
improveLocalFunEqs CtEvidence
ev InertCans
inerts TyCon
tc [TcPredType]
args TcPredType
rhs
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
workItem }
interactEq InertCans
_ Ct
wi = String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"interactEq" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
wi)
tryToSolveByUnification :: Ct -> CtEvidence
-> TcTyVar
-> TcType
-> TcS (StopOrContinue Ct)
tryToSolveByUnification :: Ct -> CtEvidence -> TyVar -> TcPredType -> TcS (StopOrContinue Ct)
tryToSolveByUnification Ct
work_item CtEvidence
ev TyVar
tv TcPredType
rhs
= do { TouchabilityTestResult
is_touchable <- CtFlavour -> TyVar -> TcPredType -> TcS TouchabilityTestResult
touchabilityTest (CtEvidence -> CtFlavour
ctEvFlavour CtEvidence
ev) TyVar
tv TcPredType
rhs
; String -> SDoc -> TcS ()
traceTcS String
"tryToSolveByUnification" ([SDoc] -> SDoc
vcat [ TyVar -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyVar
tv SDoc -> SDoc -> SDoc
<+> Char -> SDoc
char Char
'~' SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
rhs
, TouchabilityTestResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr TouchabilityTestResult
is_touchable ])
; case TouchabilityTestResult
is_touchable of
TouchabilityTestResult
Untouchable -> SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item
TouchabilityTestResult
TouchableSameLevel -> CtEvidence -> TyVar -> TcPredType -> TcS (StopOrContinue Ct)
solveByUnification CtEvidence
ev TyVar
tv TcPredType
rhs
TouchableOuterLevel [TyVar]
free_metas TcLevel
tv_lvl
-> do { TcM () -> TcS ()
forall a. TcM a -> TcS a
wrapTcS (TcM () -> TcS ()) -> TcM () -> TcS ()
forall a b. (a -> b) -> a -> b
$ (TyVar -> IOEnv (Env TcGblEnv TcLclEnv) Bool) -> [TyVar] -> TcM ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (TcLevel -> TyVar -> IOEnv (Env TcGblEnv TcLclEnv) Bool
promoteMetaTyVarTo TcLevel
tv_lvl) [TyVar]
free_metas
; TcLevel -> TcS ()
setUnificationFlag TcLevel
tv_lvl
; CtEvidence -> TyVar -> TcPredType -> TcS (StopOrContinue Ct)
solveByUnification CtEvidence
ev TyVar
tv TcPredType
rhs } }
solveByUnification :: CtEvidence -> TcTyVar -> Xi -> TcS (StopOrContinue Ct)
solveByUnification :: CtEvidence -> TyVar -> TcPredType -> TcS (StopOrContinue Ct)
solveByUnification CtEvidence
wd TyVar
tv TcPredType
xi
= do { let tv_ty :: TcPredType
tv_ty = TyVar -> TcPredType
mkTyVarTy TyVar
tv
; String -> SDoc -> TcS ()
traceTcS String
"Sneaky unification:" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
[SDoc] -> SDoc
vcat [String -> SDoc
text String
"Unifies:" SDoc -> SDoc -> SDoc
<+> TyVar -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyVar
tv SDoc -> SDoc -> SDoc
<+> String -> SDoc
text String
":=" SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
xi,
String -> SDoc
text String
"Coercion:" SDoc -> SDoc -> SDoc
<+> TcPredType -> TcPredType -> SDoc
pprEq TcPredType
tv_ty TcPredType
xi,
String -> SDoc
text String
"Left Kind is:" SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr (HasDebugCallStack => TcPredType -> TcPredType
TcPredType -> TcPredType
tcTypeKind TcPredType
tv_ty),
String -> SDoc
text String
"Right Kind is:" SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr (HasDebugCallStack => TcPredType -> TcPredType
TcPredType -> TcPredType
tcTypeKind TcPredType
xi) ]
; TyVar -> TcPredType -> TcS ()
unifyTyVar TyVar
tv TcPredType
xi
; CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
wd (TcCoercion -> EvTerm
evCoercion (TcPredType -> TcCoercion
mkTcNomReflCo TcPredType
xi))
; Int
n_kicked <- TyVar -> TcS Int
kickOutAfterUnification TyVar
tv
; StopOrContinue Ct -> TcS (StopOrContinue Ct)
forall (m :: * -> *) a. Monad m => a -> m a
return (CtEvidence -> SDoc -> StopOrContinue Ct
forall a. CtEvidence -> SDoc -> StopOrContinue a
Stop CtEvidence
wd (String -> SDoc
text String
"Solved by unification" SDoc -> SDoc -> SDoc
<+> Int -> SDoc
pprKicked Int
n_kicked)) }
emitFunDepDeriveds :: [FunDepEqn CtLoc] -> TcS ()
emitFunDepDeriveds :: [FunDepEqn CtLoc] -> TcS ()
emitFunDepDeriveds [FunDepEqn CtLoc]
fd_eqns
= (FunDepEqn CtLoc -> TcS ()) -> [FunDepEqn CtLoc] -> TcS ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ FunDepEqn CtLoc -> TcS ()
do_one_FDEqn [FunDepEqn CtLoc]
fd_eqns
where
do_one_FDEqn :: FunDepEqn CtLoc -> TcS ()
do_one_FDEqn (FDEqn { fd_qtvs :: forall loc. FunDepEqn loc -> [TyVar]
fd_qtvs = [TyVar]
tvs, fd_eqs :: forall loc. FunDepEqn loc -> [TypeEqn]
fd_eqs = [TypeEqn]
eqs, fd_loc :: forall loc. FunDepEqn loc -> loc
fd_loc = CtLoc
loc })
| [TyVar] -> Bool
forall (t :: * -> *) a. Foldable t => t a -> Bool
null [TyVar]
tvs
= do { String -> SDoc -> TcS ()
traceTcS String
"emitFunDepDeriveds 1" (SubGoalDepth -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> SubGoalDepth
ctl_depth CtLoc
loc) SDoc -> SDoc -> SDoc
$$ [TypeEqn] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TypeEqn]
eqs SDoc -> SDoc -> SDoc
$$ Bool -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> Bool
isGivenLoc CtLoc
loc))
; (TypeEqn -> TcS ()) -> [TypeEqn] -> TcS ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (CtLoc -> Role -> TypeEqn -> TcS ()
unifyDerived CtLoc
loc Role
Nominal) [TypeEqn]
eqs }
| Bool
otherwise
= do { String -> SDoc -> TcS ()
traceTcS String
"emitFunDepDeriveds 2" (SubGoalDepth -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> SubGoalDepth
ctl_depth CtLoc
loc) SDoc -> SDoc -> SDoc
$$ [TyVar] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TyVar]
tvs SDoc -> SDoc -> SDoc
$$ [TypeEqn] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TypeEqn]
eqs)
; TCvSubst
subst <- [TyVar] -> TcS TCvSubst
instFlexi [TyVar]
tvs
; (TypeEqn -> TcS ()) -> [TypeEqn] -> TcS ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (CtLoc -> TCvSubst -> TypeEqn -> TcS ()
do_one_eq CtLoc
loc TCvSubst
subst) [TypeEqn]
eqs }
do_one_eq :: CtLoc -> TCvSubst -> TypeEqn -> TcS ()
do_one_eq CtLoc
loc TCvSubst
subst (Pair TcPredType
ty1 TcPredType
ty2)
= CtLoc -> Role -> TypeEqn -> TcS ()
unifyDerived CtLoc
loc Role
Nominal (TypeEqn -> TcS ()) -> TypeEqn -> TcS ()
forall a b. (a -> b) -> a -> b
$
TcPredType -> TcPredType -> TypeEqn
forall a. a -> a -> Pair a
Pair (TCvSubst -> TcPredType -> TcPredType
Type.substTyUnchecked TCvSubst
subst TcPredType
ty1) (TCvSubst -> TcPredType -> TcPredType
Type.substTyUnchecked TCvSubst
subst TcPredType
ty2)
topReactionsStage :: WorkItem -> TcS (StopOrContinue Ct)
topReactionsStage :: SimplifierStage
topReactionsStage Ct
work_item
= do { String -> SDoc -> TcS ()
traceTcS String
"doTopReact" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
work_item)
; case Ct
work_item of
CDictCan {} -> do { InertSet
inerts <- TcS InertSet
getTcSInerts
; InertSet -> SimplifierStage
doTopReactDict InertSet
inerts Ct
work_item }
CEqCan {} -> SimplifierStage
doTopReactEq Ct
work_item
CIrredCan {} -> SimplifierStage
doTopReactOther Ct
work_item
Ct
_ ->
SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item }
doTopReactOther :: Ct -> TcS (StopOrContinue Ct)
doTopReactOther :: SimplifierStage
doTopReactOther Ct
work_item
| CtEvidence -> Bool
isGiven CtEvidence
ev
= SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item
| EqPred EqRel
eq_rel TcPredType
t1 TcPredType
t2 <- TcPredType -> Pred
classifyPredType TcPredType
pred
= Ct -> EqRel -> TcPredType -> TcPredType -> TcS (StopOrContinue Ct)
doTopReactEqPred Ct
work_item EqRel
eq_rel TcPredType
t1 TcPredType
t2
| Bool
otherwise
= do { ClsInstResult
res <- TcPredType -> CtLoc -> TcS ClsInstResult
matchLocalInst TcPredType
pred CtLoc
loc
; case ClsInstResult
res of
OneInst {} -> Ct -> ClsInstResult -> TcS (StopOrContinue Ct)
chooseInstance Ct
work_item ClsInstResult
res
ClsInstResult
_ -> SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item }
where
ev :: CtEvidence
ev = Ct -> CtEvidence
ctEvidence Ct
work_item
loc :: CtLoc
loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev
pred :: TcPredType
pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev
doTopReactEqPred :: Ct -> EqRel -> TcType -> TcType -> TcS (StopOrContinue Ct)
doTopReactEqPred :: Ct -> EqRel -> TcPredType -> TcPredType -> TcS (StopOrContinue Ct)
doTopReactEqPred Ct
work_item EqRel
eq_rel TcPredType
t1 TcPredType
t2
| Just (Class
cls, [TcPredType]
tys) <- EqRel -> TcPredType -> TcPredType -> Maybe (Class, [TcPredType])
boxEqPred EqRel
eq_rel TcPredType
t1 TcPredType
t2
= do { ClsInstResult
res <- TcPredType -> CtLoc -> TcS ClsInstResult
matchLocalInst (Class -> [TcPredType] -> TcPredType
mkClassPred Class
cls [TcPredType]
tys) CtLoc
loc
; case ClsInstResult
res of
OneInst { cir_mk_ev :: ClsInstResult -> [EvExpr] -> EvTerm
cir_mk_ev = [EvExpr] -> EvTerm
mk_ev }
-> Ct -> ClsInstResult -> TcS (StopOrContinue Ct)
chooseInstance Ct
work_item
(ClsInstResult
res { cir_mk_ev :: [EvExpr] -> EvTerm
cir_mk_ev = Class -> [TcPredType] -> ([EvExpr] -> EvTerm) -> [EvExpr] -> EvTerm
forall {t}. Class -> [TcPredType] -> (t -> EvTerm) -> t -> EvTerm
mk_eq_ev Class
cls [TcPredType]
tys [EvExpr] -> EvTerm
mk_ev })
ClsInstResult
_ -> SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item }
| Bool
otherwise
= SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item
where
ev :: CtEvidence
ev = Ct -> CtEvidence
ctEvidence Ct
work_item
loc :: CtLoc
loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev
mk_eq_ev :: Class -> [TcPredType] -> (t -> EvTerm) -> t -> EvTerm
mk_eq_ev Class
cls [TcPredType]
tys t -> EvTerm
mk_ev t
evs
= case (t -> EvTerm
mk_ev t
evs) of
EvExpr EvExpr
e -> EvExpr -> EvTerm
EvExpr (TyVar -> EvExpr
forall b. TyVar -> Expr b
Var TyVar
sc_id EvExpr -> [TcPredType] -> EvExpr
forall b. Expr b -> [TcPredType] -> Expr b
`mkTyApps` [TcPredType]
tys EvExpr -> EvExpr -> EvExpr
forall b. Expr b -> Expr b -> Expr b
`App` EvExpr
e)
EvTerm
ev -> String -> SDoc -> EvTerm
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"mk_eq_ev" (EvTerm -> SDoc
forall a. Outputable a => a -> SDoc
ppr EvTerm
ev)
where
[TyVar
sc_id] = Class -> [TyVar]
classSCSelIds Class
cls
doTopReactEq :: Ct -> TcS (StopOrContinue Ct)
doTopReactEq :: SimplifierStage
doTopReactEq work_item :: Ct
work_item@(CEqCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
old_ev, cc_lhs :: Ct -> CanEqLHS
cc_lhs = TyFamLHS TyCon
fam_tc [TcPredType]
args
, cc_rhs :: Ct -> TcPredType
cc_rhs = TcPredType
rhs })
= do { CtEvidence -> TyCon -> [TcPredType] -> TcPredType -> TcS ()
improveTopFunEqs CtEvidence
old_ev TyCon
fam_tc [TcPredType]
args TcPredType
rhs
; SimplifierStage
doTopReactOther Ct
work_item }
doTopReactEq Ct
work_item = SimplifierStage
doTopReactOther Ct
work_item
improveTopFunEqs :: CtEvidence -> TyCon -> [TcType] -> TcType -> TcS ()
improveTopFunEqs :: CtEvidence -> TyCon -> [TcPredType] -> TcPredType -> TcS ()
improveTopFunEqs CtEvidence
ev TyCon
fam_tc [TcPredType]
args TcPredType
rhs
| Bool -> Bool
not (CtEvidence -> Bool
isImprovable CtEvidence
ev)
= () -> TcS ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
| Bool
otherwise
= do { (FamInstEnv, FamInstEnv)
fam_envs <- TcS (FamInstEnv, FamInstEnv)
getFamInstEnvs
; [TypeEqn]
eqns <- (FamInstEnv, FamInstEnv)
-> TyCon -> [TcPredType] -> TcPredType -> TcS [TypeEqn]
improve_top_fun_eqs (FamInstEnv, FamInstEnv)
fam_envs TyCon
fam_tc [TcPredType]
args TcPredType
rhs
; String -> SDoc -> TcS ()
traceTcS String
"improveTopFunEqs" ([SDoc] -> SDoc
vcat [ TyCon -> SDoc
forall a. Outputable a => a -> SDoc
ppr TyCon
fam_tc SDoc -> SDoc -> SDoc
<+> [TcPredType] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TcPredType]
args SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
rhs
, [TypeEqn] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [TypeEqn]
eqns ])
; (TypeEqn -> TcS ()) -> [TypeEqn] -> TcS ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (CtLoc -> Role -> TypeEqn -> TcS ()
unifyDerived CtLoc
loc Role
Nominal) [TypeEqn]
eqns }
where
loc :: CtLoc
loc = CtLoc -> CtLoc
bumpCtLocDepth (CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev)
improve_top_fun_eqs :: FamInstEnvs
-> TyCon -> [TcType] -> TcType
-> TcS [TypeEqn]
improve_top_fun_eqs :: (FamInstEnv, FamInstEnv)
-> TyCon -> [TcPredType] -> TcPredType -> TcS [TypeEqn]
improve_top_fun_eqs (FamInstEnv, FamInstEnv)
fam_envs TyCon
fam_tc [TcPredType]
args TcPredType
rhs_ty
| Just BuiltInSynFamily
ops <- TyCon -> Maybe BuiltInSynFamily
isBuiltInSynFamTyCon_maybe TyCon
fam_tc
= [TypeEqn] -> TcS [TypeEqn]
forall (m :: * -> *) a. Monad m => a -> m a
return (BuiltInSynFamily -> [TcPredType] -> TcPredType -> [TypeEqn]
sfInteractTop BuiltInSynFamily
ops [TcPredType]
args TcPredType
rhs_ty)
| TyCon -> Bool
isOpenTypeFamilyTyCon TyCon
fam_tc
, Injective [Bool]
injective_args <- TyCon -> Injectivity
tyConInjectivityInfo TyCon
fam_tc
, let fam_insts :: [FamInst]
fam_insts = (FamInstEnv, FamInstEnv) -> TyCon -> [FamInst]
lookupFamInstEnvByTyCon (FamInstEnv, FamInstEnv)
fam_envs TyCon
fam_tc
=
do { let improvs :: [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
improvs = [FamInst]
-> (FamInst -> [TyVar])
-> (FamInst -> [TcPredType])
-> (FamInst -> TcPredType)
-> (FamInst -> Maybe CoAxBranch)
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
forall a.
[a]
-> (a -> [TyVar])
-> (a -> [TcPredType])
-> (a -> TcPredType)
-> (a -> Maybe CoAxBranch)
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
buildImprovementData [FamInst]
fam_insts
FamInst -> [TyVar]
fi_tvs FamInst -> [TcPredType]
fi_tys FamInst -> TcPredType
fi_rhs (Maybe CoAxBranch -> FamInst -> Maybe CoAxBranch
forall a b. a -> b -> a
const Maybe CoAxBranch
forall a. Maybe a
Nothing)
; String -> SDoc -> TcS ()
traceTcS String
"improve_top_fun_eqs2" ([([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)] -> SDoc
forall a. Outputable a => a -> SDoc
ppr [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
improvs)
; (([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)
-> TcS [TypeEqn])
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn]
forall (m :: * -> *) a b. Monad m => (a -> m [b]) -> [a] -> m [b]
concatMapM ([Bool]
-> ([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)
-> TcS [TypeEqn]
injImproveEqns [Bool]
injective_args) ([([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn])
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn]
forall a b. (a -> b) -> a -> b
$
Int
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
forall a. Int -> [a] -> [a]
take Int
1 [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
improvs }
| Just CoAxiom Branched
ax <- TyCon -> Maybe (CoAxiom Branched)
isClosedSynFamilyTyConWithAxiom_maybe TyCon
fam_tc
, Injective [Bool]
injective_args <- TyCon -> Injectivity
tyConInjectivityInfo TyCon
fam_tc
= (([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)
-> TcS [TypeEqn])
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn]
forall (m :: * -> *) a b. Monad m => (a -> m [b]) -> [a] -> m [b]
concatMapM ([Bool]
-> ([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)
-> TcS [TypeEqn]
injImproveEqns [Bool]
injective_args) ([([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn])
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
-> TcS [TypeEqn]
forall a b. (a -> b) -> a -> b
$
[CoAxBranch]
-> (CoAxBranch -> [TyVar])
-> (CoAxBranch -> [TcPredType])
-> (CoAxBranch -> TcPredType)
-> (CoAxBranch -> Maybe CoAxBranch)
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
forall a.
[a]
-> (a -> [TyVar])
-> (a -> [TcPredType])
-> (a -> TcPredType)
-> (a -> Maybe CoAxBranch)
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
buildImprovementData (Branches Branched -> [CoAxBranch]
forall (br :: BranchFlag). Branches br -> [CoAxBranch]
fromBranches (CoAxiom Branched -> Branches Branched
forall (br :: BranchFlag). CoAxiom br -> Branches br
co_ax_branches CoAxiom Branched
ax))
CoAxBranch -> [TyVar]
cab_tvs CoAxBranch -> [TcPredType]
cab_lhs CoAxBranch -> TcPredType
cab_rhs CoAxBranch -> Maybe CoAxBranch
forall a. a -> Maybe a
Just
| Bool
otherwise
= [TypeEqn] -> TcS [TypeEqn]
forall (m :: * -> *) a. Monad m => a -> m a
return []
where
buildImprovementData
:: [a]
-> (a -> [TyVar])
-> (a -> [Type])
-> (a -> Type)
-> (a -> Maybe CoAxBranch)
-> [( [Type], TCvSubst, [TyVar], Maybe CoAxBranch )]
buildImprovementData :: forall a.
[a]
-> (a -> [TyVar])
-> (a -> [TcPredType])
-> (a -> TcPredType)
-> (a -> Maybe CoAxBranch)
-> [([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)]
buildImprovementData [a]
axioms a -> [TyVar]
axiomTVs a -> [TcPredType]
axiomLHS a -> TcPredType
axiomRHS a -> Maybe CoAxBranch
wrap =
[ ([TcPredType]
ax_args, TCvSubst
subst, [TyVar]
unsubstTvs, a -> Maybe CoAxBranch
wrap a
axiom)
| a
axiom <- [a]
axioms
, let ax_args :: [TcPredType]
ax_args = a -> [TcPredType]
axiomLHS a
axiom
ax_rhs :: TcPredType
ax_rhs = a -> TcPredType
axiomRHS a
axiom
ax_tvs :: [TyVar]
ax_tvs = a -> [TyVar]
axiomTVs a
axiom
, Just TCvSubst
subst <- [Bool -> TcPredType -> TcPredType -> Maybe TCvSubst
tcUnifyTyWithTFs Bool
False TcPredType
ax_rhs TcPredType
rhs_ty]
, let notInSubst :: TyVar -> Bool
notInSubst TyVar
tv = Bool -> Bool
not (TyVar
tv TyVar -> VarEnv TcPredType -> Bool
forall a. TyVar -> VarEnv a -> Bool
`elemVarEnv` TCvSubst -> VarEnv TcPredType
getTvSubstEnv TCvSubst
subst)
unsubstTvs :: [TyVar]
unsubstTvs = (TyVar -> Bool) -> [TyVar] -> [TyVar]
forall a. (a -> Bool) -> [a] -> [a]
filter (TyVar -> Bool
notInSubst (TyVar -> Bool) -> (TyVar -> Bool) -> TyVar -> Bool
forall (f :: * -> *). Applicative f => f Bool -> f Bool -> f Bool
<&&> TyVar -> Bool
isTyVar) [TyVar]
ax_tvs ]
injImproveEqns :: [Bool]
-> ([Type], TCvSubst, [TyCoVar], Maybe CoAxBranch)
-> TcS [TypeEqn]
injImproveEqns :: [Bool]
-> ([TcPredType], TCvSubst, [TyVar], Maybe CoAxBranch)
-> TcS [TypeEqn]
injImproveEqns [Bool]
inj_args ([TcPredType]
ax_args, TCvSubst
subst, [TyVar]
unsubstTvs, Maybe CoAxBranch
cabr)
= do { TCvSubst
subst <- TCvSubst -> [TyVar] -> TcS TCvSubst
instFlexiX TCvSubst
subst [TyVar]
unsubstTvs
; [TypeEqn] -> TcS [TypeEqn]
forall (m :: * -> *) a. Monad m => a -> m a
return [ TcPredType -> TcPredType -> TypeEqn
forall a. a -> a -> Pair a
Pair (TCvSubst -> TcPredType -> TcPredType
substTyUnchecked TCvSubst
subst TcPredType
ax_arg) TcPredType
arg
| case Maybe CoAxBranch
cabr of
Just CoAxBranch
cabr' -> [TcPredType] -> CoAxBranch -> Bool
apartnessCheck (HasCallStack => TCvSubst -> [TcPredType] -> [TcPredType]
TCvSubst -> [TcPredType] -> [TcPredType]
substTys TCvSubst
subst [TcPredType]
ax_args) CoAxBranch
cabr'
Maybe CoAxBranch
_ -> Bool
True
, (TcPredType
ax_arg, TcPredType
arg, Bool
True) <- [TcPredType]
-> [TcPredType] -> [Bool] -> [(TcPredType, TcPredType, Bool)]
forall a b c. [a] -> [b] -> [c] -> [(a, b, c)]
zip3 [TcPredType]
ax_args [TcPredType]
args [Bool]
inj_args ] }
doTopReactDict :: InertSet -> Ct -> TcS (StopOrContinue Ct)
doTopReactDict :: InertSet -> SimplifierStage
doTopReactDict InertSet
inerts work_item :: Ct
work_item@(CDictCan { cc_ev :: Ct -> CtEvidence
cc_ev = CtEvidence
ev, cc_class :: Ct -> Class
cc_class = Class
cls
, cc_tyargs :: Ct -> [TcPredType]
cc_tyargs = [TcPredType]
xis })
| CtEvidence -> Bool
isGiven CtEvidence
ev
= do { TcS ()
try_fundep_improvement
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item }
| Just CtEvidence
solved_ev <- InertSet -> CtLoc -> Class -> [TcPredType] -> Maybe CtEvidence
lookupSolvedDict InertSet
inerts CtLoc
dict_loc Class
cls [TcPredType]
xis
= do { CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev (CtEvidence -> EvTerm
ctEvTerm CtEvidence
solved_ev)
; CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev String
"Dict/Top (cached)" }
| Bool
otherwise
= do { DynFlags
dflags <- TcS DynFlags
forall (m :: * -> *). HasDynFlags m => m DynFlags
getDynFlags
; ClsInstResult
lkup_res <- DynFlags
-> InertSet -> Class -> [TcPredType] -> CtLoc -> TcS ClsInstResult
matchClassInst DynFlags
dflags InertSet
inerts Class
cls [TcPredType]
xis CtLoc
dict_loc
; case ClsInstResult
lkup_res of
OneInst { cir_what :: ClsInstResult -> InstanceWhat
cir_what = InstanceWhat
what }
-> do { InstanceWhat -> Ct -> TcS ()
insertSafeOverlapFailureTcS InstanceWhat
what Ct
work_item
; InstanceWhat -> CtEvidence -> Class -> [TcPredType] -> TcS ()
addSolvedDict InstanceWhat
what CtEvidence
ev Class
cls [TcPredType]
xis
; Ct -> ClsInstResult -> TcS (StopOrContinue Ct)
chooseInstance Ct
work_item ClsInstResult
lkup_res }
ClsInstResult
_ ->
do { Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (CtEvidence -> Bool
isImprovable CtEvidence
ev) (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
TcS ()
try_fundep_improvement
; SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item } }
where
dict_pred :: TcPredType
dict_pred = Class -> [TcPredType] -> TcPredType
mkClassPred Class
cls [TcPredType]
xis
dict_loc :: CtLoc
dict_loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev
dict_origin :: CtOrigin
dict_origin = CtLoc -> CtOrigin
ctLocOrigin CtLoc
dict_loc
try_fundep_improvement :: TcS ()
try_fundep_improvement
= do { String -> SDoc -> TcS ()
traceTcS String
"try_fundeps" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
work_item)
; InstEnvs
instEnvs <- TcS InstEnvs
getInstEnvs
; [FunDepEqn CtLoc] -> TcS ()
emitFunDepDeriveds ([FunDepEqn CtLoc] -> TcS ()) -> [FunDepEqn CtLoc] -> TcS ()
forall a b. (a -> b) -> a -> b
$
InstEnvs
-> (TcPredType -> SrcSpan -> CtLoc)
-> TcPredType
-> [FunDepEqn CtLoc]
forall loc.
InstEnvs
-> (TcPredType -> SrcSpan -> loc) -> TcPredType -> [FunDepEqn loc]
improveFromInstEnv InstEnvs
instEnvs TcPredType -> SrcSpan -> CtLoc
mk_ct_loc TcPredType
dict_pred }
mk_ct_loc :: PredType
-> SrcSpan
-> CtLoc
mk_ct_loc :: TcPredType -> SrcSpan -> CtLoc
mk_ct_loc TcPredType
inst_pred SrcSpan
inst_loc
= CtLoc
dict_loc { ctl_origin :: CtOrigin
ctl_origin = TcPredType -> CtOrigin -> TcPredType -> SrcSpan -> CtOrigin
FunDepOrigin2 TcPredType
dict_pred CtOrigin
dict_origin
TcPredType
inst_pred SrcSpan
inst_loc }
doTopReactDict InertSet
_ Ct
w = String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"doTopReactDict" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
w)
chooseInstance :: Ct -> ClsInstResult -> TcS (StopOrContinue Ct)
chooseInstance :: Ct -> ClsInstResult -> TcS (StopOrContinue Ct)
chooseInstance Ct
work_item
(OneInst { cir_new_theta :: ClsInstResult -> [TcPredType]
cir_new_theta = [TcPredType]
theta
, cir_what :: ClsInstResult -> InstanceWhat
cir_what = InstanceWhat
what
, cir_mk_ev :: ClsInstResult -> [EvExpr] -> EvTerm
cir_mk_ev = [EvExpr] -> EvTerm
mk_ev })
= do { String -> SDoc -> TcS ()
traceTcS String
"doTopReact/found instance for" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$ CtEvidence -> SDoc
forall a. Outputable a => a -> SDoc
ppr CtEvidence
ev
; CtLoc
deeper_loc <- CtLoc -> InstanceWhat -> TcPredType -> TcS CtLoc
checkInstanceOK CtLoc
loc InstanceWhat
what TcPredType
pred
; if CtEvidence -> Bool
isDerived CtEvidence
ev
then
do { DynFlags
dflags <- TcS DynFlags
forall (m :: * -> *). HasDynFlags m => m DynFlags
getDynFlags
; Bool -> TcS () -> TcS ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (DynFlags -> SubGoalDepth -> Bool
subGoalDepthExceeded DynFlags
dflags (CtLoc -> SubGoalDepth
ctLocDepth CtLoc
deeper_loc)) (TcS () -> TcS ()) -> TcS () -> TcS ()
forall a b. (a -> b) -> a -> b
$
CtLoc -> [TcPredType] -> TcS ()
emitNewDeriveds CtLoc
deeper_loc [TcPredType]
theta
; String -> SDoc -> TcS ()
traceTcS String
"finish_derived" (SubGoalDepth -> SDoc
forall a. Outputable a => a -> SDoc
ppr (CtLoc -> SubGoalDepth
ctl_depth CtLoc
deeper_loc))
; CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev String
"Dict/Top (solved derived)" }
else
do { CtLoc -> TcPredType -> TcS ()
checkReductionDepth CtLoc
deeper_loc TcPredType
pred
; EvBindsVar
evb <- TcS EvBindsVar
getTcEvBindsVar
; if EvBindsVar -> Bool
isCoEvBindsVar EvBindsVar
evb
then SimplifierStage
forall a. a -> TcS (StopOrContinue a)
continueWith Ct
work_item
else
do { [MaybeNew]
evc_vars <- (TcPredType -> TcS MaybeNew) -> [TcPredType] -> TcS [MaybeNew]
forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
mapM (CtLoc -> TcPredType -> TcS MaybeNew
newWanted CtLoc
deeper_loc) [TcPredType]
theta
; CtEvidence -> EvTerm -> TcS ()
setEvBindIfWanted CtEvidence
ev ([EvExpr] -> EvTerm
mk_ev ((MaybeNew -> EvExpr) -> [MaybeNew] -> [EvExpr]
forall a b. (a -> b) -> [a] -> [b]
map MaybeNew -> EvExpr
getEvExpr [MaybeNew]
evc_vars))
; [CtEvidence] -> TcS ()
emitWorkNC ([MaybeNew] -> [CtEvidence]
freshGoals [MaybeNew]
evc_vars)
; CtEvidence -> String -> TcS (StopOrContinue Ct)
forall a. CtEvidence -> String -> TcS (StopOrContinue a)
stopWith CtEvidence
ev String
"Dict/Top (solved wanted)" }}}
where
ev :: CtEvidence
ev = Ct -> CtEvidence
ctEvidence Ct
work_item
pred :: TcPredType
pred = CtEvidence -> TcPredType
ctEvPred CtEvidence
ev
loc :: CtLoc
loc = CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev
chooseInstance Ct
work_item ClsInstResult
lookup_res
= String -> SDoc -> TcS (StopOrContinue Ct)
forall a. HasCallStack => String -> SDoc -> a
pprPanic String
"chooseInstance" (Ct -> SDoc
forall a. Outputable a => a -> SDoc
ppr Ct
work_item SDoc -> SDoc -> SDoc
$$ ClsInstResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr ClsInstResult
lookup_res)
checkInstanceOK :: CtLoc -> InstanceWhat -> TcPredType -> TcS CtLoc
checkInstanceOK :: CtLoc -> InstanceWhat -> TcPredType -> TcS CtLoc
checkInstanceOK CtLoc
loc InstanceWhat
what TcPredType
pred
= do { CtLoc -> InstanceWhat -> TcPredType -> TcS ()
checkWellStagedDFun CtLoc
loc InstanceWhat
what TcPredType
pred
; CtLoc -> TcS CtLoc
forall (m :: * -> *) a. Monad m => a -> m a
return CtLoc
deeper_loc }
where
deeper_loc :: CtLoc
deeper_loc = CtLoc -> CtLoc
zap_origin (CtLoc -> CtLoc
bumpCtLocDepth CtLoc
loc)
origin :: CtOrigin
origin = CtLoc -> CtOrigin
ctLocOrigin CtLoc
loc
zap_origin :: CtLoc -> CtLoc
zap_origin CtLoc
loc
| ScOrigin {} <- CtOrigin
origin
= CtLoc -> CtOrigin -> CtLoc
setCtLocOrigin CtLoc
loc (TypeSize -> CtOrigin
ScOrigin TypeSize
infinity)
| Bool
otherwise
= CtLoc
loc
matchClassInst :: DynFlags -> InertSet
-> Class -> [Type]
-> CtLoc -> TcS ClsInstResult
matchClassInst :: DynFlags
-> InertSet -> Class -> [TcPredType] -> CtLoc -> TcS ClsInstResult
matchClassInst DynFlags
dflags InertSet
inerts Class
clas [TcPredType]
tys CtLoc
loc
| Bool -> Bool
not (Extension -> DynFlags -> Bool
xopt Extension
LangExt.IncoherentInstances DynFlags
dflags)
, Bool -> Bool
not (Class -> Bool
naturallyCoherentClass Class
clas)
, let matchable_givens :: Cts
matchable_givens = CtLoc -> TcPredType -> InertSet -> Cts
matchableGivens CtLoc
loc TcPredType
pred InertSet
inerts
, Bool -> Bool
not (Cts -> Bool
forall a. Bag a -> Bool
isEmptyBag Cts
matchable_givens)
= do { String -> SDoc -> TcS ()
traceTcS String
"Delaying instance application" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$
[SDoc] -> SDoc
vcat [ String -> SDoc
text String
"Work item=" SDoc -> SDoc -> SDoc
<+> Class -> [TcPredType] -> SDoc
pprClassPred Class
clas [TcPredType]
tys
, String -> SDoc
text String
"Potential matching givens:" SDoc -> SDoc -> SDoc
<+> Cts -> SDoc
forall a. Outputable a => a -> SDoc
ppr Cts
matchable_givens ]
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
NotSure }
| Bool
otherwise
= do { String -> SDoc -> TcS ()
traceTcS String
"matchClassInst" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$ String -> SDoc
text String
"pred =" SDoc -> SDoc -> SDoc
<+> TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
pred SDoc -> SDoc -> SDoc
<+> Char -> SDoc
char Char
'{'
; ClsInstResult
local_res <- TcPredType -> CtLoc -> TcS ClsInstResult
matchLocalInst TcPredType
pred CtLoc
loc
; case ClsInstResult
local_res of
OneInst {} ->
do { String -> SDoc -> TcS ()
traceTcS String
"} matchClassInst local match" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$ ClsInstResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr ClsInstResult
local_res
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
local_res }
ClsInstResult
NotSure ->
do { String -> SDoc -> TcS ()
traceTcS String
"} matchClassInst local not sure" SDoc
empty
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
local_res }
ClsInstResult
NoInstance
-> do { ClsInstResult
global_res <- DynFlags -> Bool -> Class -> [TcPredType] -> TcS ClsInstResult
matchGlobalInst DynFlags
dflags Bool
False Class
clas [TcPredType]
tys
; String -> SDoc -> TcS ()
traceTcS String
"} matchClassInst global result" (SDoc -> TcS ()) -> SDoc -> TcS ()
forall a b. (a -> b) -> a -> b
$ ClsInstResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr ClsInstResult
global_res
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
global_res } }
where
pred :: TcPredType
pred = Class -> [TcPredType] -> TcPredType
mkClassPred Class
clas [TcPredType]
tys
naturallyCoherentClass :: Class -> Bool
naturallyCoherentClass :: Class -> Bool
naturallyCoherentClass Class
cls
= Class -> Bool
isCTupleClass Class
cls
Bool -> Bool -> Bool
|| 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
matchLocalInst :: TcPredType -> CtLoc -> TcS ClsInstResult
matchLocalInst :: TcPredType -> CtLoc -> TcS ClsInstResult
matchLocalInst TcPredType
pred CtLoc
loc
= do { inerts :: InertSet
inerts@(IS { inert_cans :: InertSet -> InertCans
inert_cans = InertCans
ics }) <- TcS InertSet
getTcSInerts
; case InertSet -> [QCInst] -> ([(CtEvidence, [DFunInstType])], Bool)
match_local_inst InertSet
inerts (InertCans -> [QCInst]
inert_insts InertCans
ics) of
([], Bool
False) -> do { String -> SDoc -> TcS ()
traceTcS String
"No local instance for" (TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
pred)
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
NoInstance }
([(CtEvidence
dfun_ev, [DFunInstType]
inst_tys)], Bool
unifs)
| Bool -> Bool
not Bool
unifs
-> do { let dfun_id :: TyVar
dfun_id = CtEvidence -> TyVar
ctEvEvId CtEvidence
dfun_ev
; ([TcPredType]
tys, [TcPredType]
theta) <- TyVar -> [DFunInstType] -> TcS ([TcPredType], [TcPredType])
instDFunType TyVar
dfun_id [DFunInstType]
inst_tys
; let result :: ClsInstResult
result = OneInst { cir_new_theta :: [TcPredType]
cir_new_theta = [TcPredType]
theta
, cir_mk_ev :: [EvExpr] -> EvTerm
cir_mk_ev = TyVar -> [TcPredType] -> [EvExpr] -> EvTerm
evDFunApp TyVar
dfun_id [TcPredType]
tys
, cir_what :: InstanceWhat
cir_what = InstanceWhat
LocalInstance }
; String -> SDoc -> TcS ()
traceTcS String
"Local inst found:" (ClsInstResult -> SDoc
forall a. Outputable a => a -> SDoc
ppr ClsInstResult
result)
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
result }
([(CtEvidence, [DFunInstType])], Bool)
_ -> do { String -> SDoc -> TcS ()
traceTcS String
"Multiple local instances for" (TcPredType -> SDoc
forall a. Outputable a => a -> SDoc
ppr TcPredType
pred)
; ClsInstResult -> TcS ClsInstResult
forall (m :: * -> *) a. Monad m => a -> m a
return ClsInstResult
NotSure }}
where
pred_tv_set :: VarSet
pred_tv_set = TcPredType -> VarSet
tyCoVarsOfType TcPredType
pred
match_local_inst :: InertSet
-> [QCInst]
-> ( [(CtEvidence, [DFunInstType])]
, Bool )
match_local_inst :: InertSet -> [QCInst] -> ([(CtEvidence, [DFunInstType])], Bool)
match_local_inst InertSet
_inerts []
= ([], Bool
False)
match_local_inst InertSet
inerts (qci :: QCInst
qci@(QCI { qci_tvs :: QCInst -> [TyVar]
qci_tvs = [TyVar]
qtvs, qci_pred :: QCInst -> TcPredType
qci_pred = TcPredType
qpred
, qci_ev :: QCInst -> CtEvidence
qci_ev = CtEvidence
ev })
: [QCInst]
qcis)
| let in_scope :: InScopeSet
in_scope = VarSet -> InScopeSet
mkInScopeSet (VarSet
qtv_set VarSet -> VarSet -> VarSet
`unionVarSet` VarSet
pred_tv_set)
, Just VarEnv TcPredType
tv_subst <- VarSet
-> RnEnv2
-> VarEnv TcPredType
-> TcPredType
-> TcPredType
-> Maybe (VarEnv TcPredType)
ruleMatchTyKiX VarSet
qtv_set (InScopeSet -> RnEnv2
mkRnEnv2 InScopeSet
in_scope)
VarEnv TcPredType
emptyTvSubstEnv TcPredType
qpred TcPredType
pred
, let match :: (CtEvidence, [DFunInstType])
match = (CtEvidence
ev, (TyVar -> DFunInstType) -> [TyVar] -> [DFunInstType]
forall a b. (a -> b) -> [a] -> [b]
map (VarEnv TcPredType -> TyVar -> DFunInstType
forall a. VarEnv a -> TyVar -> Maybe a
lookupVarEnv VarEnv TcPredType
tv_subst) [TyVar]
qtvs)
= ((CtEvidence, [DFunInstType])
match(CtEvidence, [DFunInstType])
-> [(CtEvidence, [DFunInstType])] -> [(CtEvidence, [DFunInstType])]
forall a. a -> [a] -> [a]
:[(CtEvidence, [DFunInstType])]
matches, Bool
unif)
| Bool
otherwise
= ASSERT2( disjointVarSet qtv_set (tyCoVarsOfType pred)
, ppr qci $$ ppr pred )
([(CtEvidence, [DFunInstType])]
matches, Bool
unif Bool -> Bool -> Bool
|| Bool
this_unif)
where
qtv_set :: VarSet
qtv_set = [TyVar] -> VarSet
mkVarSet [TyVar]
qtvs
this_unif :: Bool
this_unif = InertSet -> TcPredType -> CtLoc -> TcPredType -> CtLoc -> Bool
mightEqualLater InertSet
inerts TcPredType
qpred (CtEvidence -> CtLoc
ctEvLoc CtEvidence
ev) TcPredType
pred CtLoc
loc
([(CtEvidence, [DFunInstType])]
matches, Bool
unif) = InertSet -> [QCInst] -> ([(CtEvidence, [DFunInstType])], Bool)
match_local_inst InertSet
inerts [QCInst]
qcis