summaryrefslogtreecommitdiff
diff options
context:
space:
mode:
authorSebastian Graf <sgraf1337@gmail.com>2019-09-27 11:22:33 +0000
committerSebastian Graf <sebastian.graf@kit.edu>2019-10-07 17:44:07 +0200
commit9d5e91159ffbd7ac057691f93e296da32280f786 (patch)
tree6f4210ef7ad231a11b1e3199c07b76e089c26b38
parent241921a0c238a047326b0c0f599f1c24222ff66c (diff)
downloadhaskell-wip/T17207.tar.gz
PmCheck: Look up parent data family TyCon when populating `PossibleMatches`wip/T17207
The vanilla COMPLETE set is attached to the representation TyCon of a data family instance, whereas the user-defined COMPLETE sets are attached to the parent data family TyCon itself. Previously, we weren't trying particularly hard to get back to the representation TyCon to the parent data family TyCon, resulting in bugs like #17207. Now we should do much better. Fixes the original issue in #17207, but I found another related bug that isn't so easy to fix.
-rw-r--r--compiler/GHC/HsToCore/PmCheck/Oracle.hs93
-rw-r--r--testsuite/tests/pmcheck/should_compile/T17207b.hs21
-rw-r--r--testsuite/tests/pmcheck/should_compile/all.T4
3 files changed, 94 insertions, 24 deletions
diff --git a/compiler/GHC/HsToCore/PmCheck/Oracle.hs b/compiler/GHC/HsToCore/PmCheck/Oracle.hs
index 49b5a0cf8f..3db8bf26e4 100644
--- a/compiler/GHC/HsToCore/PmCheck/Oracle.hs
+++ b/compiler/GHC/HsToCore/PmCheck/Oracle.hs
@@ -98,22 +98,6 @@ mkPmId ty = getUniqueM >>= \unique ->
-----------------------------------------------
-- * Caching possible matches of a COMPLETE set
-initIM :: Type -> DsM (Maybe PossibleMatches)
-initIM ty = case splitTyConApp_maybe ty of
- Nothing -> pure Nothing
- Just (tc, tc_args) -> do
- -- Look into the representation type of a data family instance, too.
- env <- dsGetFamInstEnvs
- let (tc', _tc_args', _co) = tcLookupDataFamInst env tc tc_args
- let mb_rdcs = map RealDataCon <$> tyConDataCons_maybe tc'
- let rdcs = maybeToList mb_rdcs
- -- NB: tc, because COMPLETE sets are associated with the parent data family
- -- TyCon
- pragmas <- dsGetCompleteMatches tc
- let fams = mapM dsLookupConLike . completeMatchConLikes
- pscs <- mapM fams pragmas
- pure (PM tc . fmap mkUniqDSet <$> NonEmpty.nonEmpty (rdcs ++ pscs))
-
markMatched :: ConLike -> PossibleMatches -> PossibleMatches
markMatched con (PM tc ms) = PM tc (fmap (`delOneFromUniqDSet` con) ms)
markMatched _ NoPM = NoPM
@@ -630,7 +614,7 @@ Maintaining these invariants in 'addVarVarCt' (the core of the term oracle) and
'addRefutableAltCon' is subtle.
* Merging VarInfos. Example: Add the fact @x ~ y@ (see 'equate').
- (COMPLETE) If we had @x /~ True@ and @y /~ False@, then we get
- @x /~ [True,False]@. This is vacuous by matter of comparing to the vanilla
+ @x /~ [True,False]@. This is vacuous by matter of comparing to the built-in
COMPLETE set, so should refute.
- (Pos/Neg) If we had @x /~ True@ and @y ~ True@, we have to refute.
* Adding positive information. Example: Add the fact @x ~ K ys@ (see 'addVarConCt')
@@ -644,7 +628,7 @@ Maintaining these invariants in 'addVarVarCt' (the core of the term oracle) and
(ex. Just and Nothing), the info is redundant and can be
discarded.
- (COMPLETE) If K=Nothing and we had @x /~ Just@, then we get
- @x /~ [Just,Nothing]@. This is vacuous by matter of comparing to the vanilla
+ @x /~ [Just,Nothing]@. This is vacuous by matter of comparing to the built-in
COMPLETE set, so should refute.
Note that merging VarInfo in equate can be done by calling out to 'addVarConCt' and
@@ -696,11 +680,28 @@ initPossibleMatches ty_st vi@VI{ vi_ty = ty, vi_cache = NoPM } = do
-- of a COMPLETE set.
res <- pmTopNormaliseType ty_st ty
let ty' = normalisedSourceType res
- mb_pm <- initIM ty'
- -- tracePm "initPossibleMatches" (ppr vi $$ ppr ty' $$ ppr res $$ ppr mb_pm)
- case mb_pm of
- Nothing -> pure vi
- Just pm -> pure vi{ vi_ty = ty', vi_cache = pm }
+ case splitTyConApp_maybe ty' of
+ Nothing -> pure vi{ vi_ty = ty' }
+ Just (tc, tc_args) -> do
+ -- See Note [COMPLETE sets on data families]
+ (tc_rep, tc_fam) <- case tyConFamInst_maybe tc of
+ Just (tc_fam, _) -> pure (tc, tc_fam)
+ Nothing -> do
+ env <- dsGetFamInstEnvs
+ let (tc_rep, _tc_rep_args, _co) = tcLookupDataFamInst env tc tc_args
+ pure (tc_rep, tc)
+ -- Note that the common case here is tc_rep == tc_fam
+ let mb_rdcs = map RealDataCon <$> tyConDataCons_maybe tc_rep
+ let rdcs = maybeToList mb_rdcs
+ -- NB: tc_fam, because COMPLETE sets are associated with the parent data
+ -- family TyCon
+ pragmas <- dsGetCompleteMatches tc_fam
+ let fams = mapM dsLookupConLike . completeMatchConLikes
+ pscs <- mapM fams pragmas
+ -- pprTrace "initPossibleMatches" (ppr ty $$ ppr ty' $$ ppr tc_rep <+> ppr tc_fam <+> ppr tc_args $$ ppr (rdcs ++ pscs)) (return ())
+ case NonEmpty.nonEmpty (rdcs ++ pscs) of
+ Nothing -> pure vi{ vi_ty = ty' } -- Didn't find any COMPLETE sets
+ Just cs -> pure vi{ vi_ty = ty', vi_cache = PM tc_rep (mkUniqDSet <$> cs) }
initPossibleMatches _ vi = pure vi
-- | @initLookupVarInfo ts x@ looks up the 'VarInfo' for @x@ in @ts@ and tries
@@ -710,6 +711,49 @@ initLookupVarInfo :: Delta -> Id -> DsM VarInfo
initLookupVarInfo MkDelta{ delta_tm_st = ts, delta_ty_st = ty_st } x
= initPossibleMatches ty_st (lookupVarInfo ts x)
+{- Note [COMPLETE sets on data families]
+~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
+User-defined COMPLETE sets involving data families are attached to the family
+TyCon, whereas the built-in COMPLETE set is attached to a data family instance's
+representation TyCon. This matters for COMPLETE sets involving both DataCons
+and PatSyns (from #17207):
+
+ data family T a
+ data family instance T () = A | B
+ pattern C = B
+ {-# COMPLETE A, C #-}
+ f :: T () -> ()
+ f A = ()
+ f C = ()
+
+The match on A is actually wrapped in a CoPat, matching impedance between T ()
+and its representation TyCon, which we translate as
+@x | let y = x |> co, A <- y@ in PmCheck.
+
+Which TyCon should we use for looking up the COMPLETE set? The representation
+TyCon from the match on A would only reveal the built-in COMPLETE set, while the
+data family TyCon would only give the user-defined one. But when initialising
+the PossibleMatches for a given Type, we want to do so only once, because
+merging different COMPLETE sets after the fact is very complicated and possibly
+inefficient.
+
+So in fact, we just *drop* the coercion arising from the CoPat when handling
+handling the constraint @y ~ x |> co@ in addVarCoreCt, just equating @y ~ x@.
+We then handle the fallout in initPossibleMatches, which has to get a hand at
+both the representation TyCon tc_rep and the parent data family TyCon tc_fam.
+It considers three cases after having established that the Type is a TyConApp:
+
+1. The TyCon is a vanilla data type constructor
+2. The TyCon is tc_rep
+3. The TyCon is tc_fam
+
+1. is simple and subsumed by the handling of the other two.
+We check for case 2. by 'tyConFamInst_maybe' and get the tc_fam out.
+Otherwise (3.), we try to lookup the data family instance at that particular
+type to get out the tc_rep. In case 1., this will just return the original
+TyCon, so tc_rep = tc_fam afterwards.
+-}
+
------------------------------------------------
-- * Exported utility functions querying 'Delta'
@@ -1495,6 +1539,9 @@ addVarCoreCt delta x e = runMaybeT (execStateT (core_expr x e) delta)
-- literals and constructor applications as possible.
core_expr :: Id -> CoreExpr -> StateT Delta (MaybeT DsM) ()
-- TODO: Handle newtypes properly, by wrapping the expression in a DataCon
+ -- This is the right thing for casts involving data family instances and
+ -- their representation TyCon, though (which are not visible in source
+ -- syntax). See Note [COMPLETE sets on data families]
core_expr x (Cast e _co) = core_expr x e
core_expr x (Tick _t e) = core_expr x e
core_expr x e
diff --git a/testsuite/tests/pmcheck/should_compile/T17207b.hs b/testsuite/tests/pmcheck/should_compile/T17207b.hs
new file mode 100644
index 0000000000..1649eea3ff
--- /dev/null
+++ b/testsuite/tests/pmcheck/should_compile/T17207b.hs
@@ -0,0 +1,21 @@
+{-# OPTIONS_GHC -Wincomplete-patterns -Wno-missing-methods -fforce-recomp #-}
+{-# LANGUAGE GADTs, TypeFamilies, ViewPatterns, TypeOperators, PatternSynonyms #-}
+module Lib where
+
+import Data.Type.Equality
+
+data family T a
+
+data instance T () = A
+
+pattern B :: a
+pattern B <- (const False -> True)
+
+pattern C :: a
+pattern C <- (const True -> True)
+
+{-# COMPLETE B, C :: T #-}
+
+f :: a :~: () -> T a -> ()
+f _ B = ()
+f Refl A = ()
diff --git a/testsuite/tests/pmcheck/should_compile/all.T b/testsuite/tests/pmcheck/should_compile/all.T
index 12bb009899..e7d27ff70b 100644
--- a/testsuite/tests/pmcheck/should_compile/all.T
+++ b/testsuite/tests/pmcheck/should_compile/all.T
@@ -84,7 +84,9 @@ test('T17096', collect_compiler_stats('bytes allocated',10), compile,
['-fwarn-incomplete-patterns -fwarn-overlapping-patterns +RTS -M2G -RTS'])
test('T17112', normal, compile,
['-fwarn-incomplete-patterns -fwarn-overlapping-patterns'])
-test('T17207', expect_broken(17207), compile,
+test('T17207', normal, compile,
+ ['-fwarn-incomplete-patterns -fwarn-overlapping-patterns'])
+test('T17207b', expect_broken(17207), compile,
['-fwarn-incomplete-patterns -fwarn-overlapping-patterns'])
test('T17208', expect_broken(17208), compile,
['-fwarn-incomplete-patterns -fwarn-overlapping-patterns'])