module Language.Haskell.Liquid.Types.Meet ( meetVarTypes ) where
import SrcLoc
import Text.PrettyPrint.HughesPJ (Doc)
import qualified Language.Fixpoint.Types as F
import Language.Haskell.Liquid.Types.Types
import Language.Haskell.Liquid.Types.RefType ()
import TyCon hiding (tyConName)
meetVarTypes :: F.TCEmb TyCon -> Doc -> (SrcSpan, SpecType) -> (SrcSpan, SpecType) -> SpecType
meetVarTypes :: TCEmb TyCon
-> Doc -> (SrcSpan, SpecType) -> (SrcSpan, SpecType) -> SpecType
meetVarTypes TCEmb TyCon
_emb Doc
_v (SrcSpan, SpecType)
hs (SrcSpan, SpecType)
lq = SpecType -> SpecType -> SpecType
forall r. Reftable r => r -> r -> r
F.meet SpecType
hsT SpecType
lqT
where
(SrcSpan
_hsSp, SpecType
hsT) = (SrcSpan, SpecType)
hs
(SrcSpan
_lqSp, SpecType
lqT) = (SrcSpan, SpecType)
lq