... | @@ -21,7 +21,7 @@ Here are some resources |
... | @@ -21,7 +21,7 @@ Here are some resources |
|
|
|
|
|
- [Derivable type classes](https://www.microsoft.com/en-us/research/publication/derivable-type-classes), Section 7, where the idea was first proposed (I think).
|
|
- [Derivable type classes](https://www.microsoft.com/en-us/research/publication/derivable-type-classes), Section 7, where the idea was first proposed (I think).
|
|
|
|
|
|
- [\#2893](https://gitlab.haskell.org//ghc/ghc/issues/2893), a ticket about the idea
|
|
- [\#2893](https://gitlab.haskell.org/ghc/ghc/issues/2893), a ticket about the idea
|
|
|
|
|
|
- [Quantified class constraints](http://i.cs.hku.hk/~bruno//papers/hs2017.pdf), a Haskell 2017 paper that works out the idea in some detail, and a [ Reddit thread](https://www.reddit.com/r/haskell/comments/6me3sv/quantified_class_constraints_pdf/) about it.
|
|
- [Quantified class constraints](http://i.cs.hku.hk/~bruno//papers/hs2017.pdf), a Haskell 2017 paper that works out the idea in some detail, and a [ Reddit thread](https://www.reddit.com/r/haskell/comments/6me3sv/quantified_class_constraints_pdf/) about it.
|
|
|
|
|
... | @@ -37,55 +37,55 @@ Use Keyword = `QuantifiedConstraints` to ensure that a ticket ends up on these l |
... | @@ -37,55 +37,55 @@ Use Keyword = `QuantifiedConstraints` to ensure that a ticket ends up on these l |
|
|
|
|
|
Open Tickets:
|
|
Open Tickets:
|
|
|
|
|
|
<table><tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/8516">#8516</a></th>
|
|
<table><tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/8516">#8516</a></th>
|
|
<td>Add (->) representation and the Invariant class to GHC.Generics</td></tr>
|
|
<td>Add (->) representation and the Invariant class to GHC.Generics</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/13153">#13153</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/13153">#13153</a></th>
|
|
<td>Several Traversable instances have an extra fmap</td></tr>
|
|
<td>Several Traversable instances have an extra fmap</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14317">#14317</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14317">#14317</a></th>
|
|
<td>Solve Coercible constraints over type constructors</td></tr>
|
|
<td>Solve Coercible constraints over type constructors</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14831">#14831</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14831">#14831</a></th>
|
|
<td>QuantifiedConstraints: Odd superclass constraint</td></tr>
|
|
<td>QuantifiedConstraints: Odd superclass constraint</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14832">#14832</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14832">#14832</a></th>
|
|
<td>QuantifiedConstraints: Adding to the context causes failure</td></tr>
|
|
<td>QuantifiedConstraints: Adding to the context causes failure</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14860">#14860</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14860">#14860</a></th>
|
|
<td>QuantifiedConstraints: Can't quantify constraint involving type family</td></tr>
|
|
<td>QuantifiedConstraints: Can't quantify constraint involving type family</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14877">#14877</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14877">#14877</a></th>
|
|
<td>QuantifiedConstraints: Can't deduce `xx' from `(xx => a, xx)'</td></tr>
|
|
<td>QuantifiedConstraints: Can't deduce `xx' from `(xx => a, xx)'</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14879">#14879</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14879">#14879</a></th>
|
|
<td>QuantifiedConstraints: Big error message + can't substitute (=>) with a class alias</td></tr>
|
|
<td>QuantifiedConstraints: Big error message + can't substitute (=>) with a class alias</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14896">#14896</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14896">#14896</a></th>
|
|
<td>QuantifiedConstraints: GHC does doesn't discharge constraints if they are quantified</td></tr>
|
|
<td>QuantifiedConstraints: GHC does doesn't discharge constraints if they are quantified</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14937">#14937</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14937">#14937</a></th>
|
|
<td>QuantifiedConstraints: Reify implication constraints from terms lacking them</td></tr>
|
|
<td>QuantifiedConstraints: Reify implication constraints from terms lacking them</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14943">#14943</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14943">#14943</a></th>
|
|
<td>Make (=>) polykinded (:: k -> k -> Constraint)</td></tr>
|
|
<td>Make (=>) polykinded (:: k -> k -> Constraint)</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14958">#14958</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14958">#14958</a></th>
|
|
<td>QuantifiedConstraints: Doesn't apply implication for existential?</td></tr>
|
|
<td>QuantifiedConstraints: Doesn't apply implication for existential?</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14968">#14968</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14968">#14968</a></th>
|
|
<td>QuantifiedConstraints: Can't be RHS of type family instances</td></tr>
|
|
<td>QuantifiedConstraints: Can't be RHS of type family instances</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14983">#14983</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14983">#14983</a></th>
|
|
<td>Have custom type errors imply Void</td></tr>
|
|
<td>Have custom type errors imply Void</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14995">#14995</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14995">#14995</a></th>
|
|
<td>QuantifiedConstraints: Incorrect pretty printing</td></tr>
|
|
<td>QuantifiedConstraints: Incorrect pretty printing</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15347">#15347</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15347">#15347</a></th>
|
|
<td>QuantifiedConstraints: Implication constraints with type families don't work</td></tr>
|
|
<td>QuantifiedConstraints: Implication constraints with type families don't work</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15351">#15351</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15351">#15351</a></th>
|
|
<td>QuantifiedConstraints ignore FunctionalDependencies</td></tr>
|
|
<td>QuantifiedConstraints ignore FunctionalDependencies</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15409">#15409</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15409">#15409</a></th>
|
|
<td>Quantified constraints half-work with equality constraints</td></tr>
|
|
<td>Quantified constraints half-work with equality constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15639">#15639</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15639">#15639</a></th>
|
|
<td>Surprising failure combining QuantifiedConstraints with Coercible</td></tr>
|
|
<td>Surprising failure combining QuantifiedConstraints with Coercible</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15888">#15888</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15888">#15888</a></th>
|
|
<td>Quantified constraints can be loopy</td></tr>
|
|
<td>Quantified constraints can be loopy</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16139">#16139</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16139">#16139</a></th>
|
|
<td>GHC confused about type synonym kind with QuantifiedConstraints</td></tr>
|
|
<td>GHC confused about type synonym kind with QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16140">#16140</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16140">#16140</a></th>
|
|
<td>Cannot create type synonym for quantified constraint without ImpredicativeTypes</td></tr>
|
|
<td>Cannot create type synonym for quantified constraint without ImpredicativeTypes</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16173">#16173</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16173">#16173</a></th>
|
|
<td>Move `Data.Profunctor` from `profunctors` package to `base`</td></tr>
|
|
<td>Move `Data.Profunctor` from `profunctors` package to `base`</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16245">#16245</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16245">#16245</a></th>
|
|
<td>GHC panic (No skolem info) with QuantifiedConstraints and strange scoping</td></tr>
|
|
<td>GHC panic (No skolem info) with QuantifiedConstraints and strange scoping</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16365">#16365</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16365">#16365</a></th>
|
|
<td>Inconsistency in quantified constraint solving</td></tr></table>
|
|
<td>Inconsistency in quantified constraint solving</td></tr></table>
|
|
|
|
|
|
|
|
|
... | @@ -93,83 +93,83 @@ Open Tickets: |
... | @@ -93,83 +93,83 @@ Open Tickets: |
|
|
|
|
|
Closed Tickets:
|
|
Closed Tickets:
|
|
|
|
|
|
<table><tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/2256">#2256</a></th>
|
|
<table><tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/2256">#2256</a></th>
|
|
<td>Incompleteness of type inference: must quantify over implication constraints</td></tr>
|
|
<td>Incompleteness of type inference: must quantify over implication constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/2893">#2893</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/2893">#2893</a></th>
|
|
<td>Implement "Quantified constraints" proposal</td></tr>
|
|
<td>Implement "Quantified constraints" proposal</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/5927">#5927</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/5927">#5927</a></th>
|
|
<td>A type-level "implies" constraint on Constraints</td></tr>
|
|
<td>A type-level "implies" constraint on Constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/9123">#9123</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/9123">#9123</a></th>
|
|
<td>Emit quantified Coercible constraints in GeneralizedNewtypeDeriving</td></tr>
|
|
<td>Emit quantified Coercible constraints in GeneralizedNewtypeDeriving</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/12245">#12245</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/12245">#12245</a></th>
|
|
<td>Deriving Data at higher kinds</td></tr>
|
|
<td>Deriving Data at higher kinds</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14070">#14070</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14070">#14070</a></th>
|
|
<td>Allow ‘unsafe’ deriving strategy, deriving code with ‘unsafeCoerce’</td></tr>
|
|
<td>Allow ‘unsafe’ deriving strategy, deriving code with ‘unsafeCoerce’</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14733">#14733</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14733">#14733</a></th>
|
|
<td>Won't use (forall xx. f xx) with -XQuantifiedConstraints</td></tr>
|
|
<td>Won't use (forall xx. f xx) with -XQuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14734">#14734</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14734">#14734</a></th>
|
|
<td>QuantifiedConstraints conflated with impredicative polymorphism?</td></tr>
|
|
<td>QuantifiedConstraints conflated with impredicative polymorphism?</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14735">#14735</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14735">#14735</a></th>
|
|
<td>GHC Panic with QuantifiedConstraints</td></tr>
|
|
<td>GHC Panic with QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14744">#14744</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14744">#14744</a></th>
|
|
<td>Non-exhaustive patterns in case in GHCi with quantified class contexts</td></tr>
|
|
<td>Non-exhaustive patterns in case in GHCi with quantified class contexts</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14748">#14748</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14748">#14748</a></th>
|
|
<td>Infer context for Data instance of (data Foo f = Foo (f Bool) (f Int))</td></tr>
|
|
<td>Infer context for Data instance of (data Foo f = Foo (f Bool) (f Int))</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14799">#14799</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14799">#14799</a></th>
|
|
<td>QuantifiedConstraints: Problems with Typeable</td></tr>
|
|
<td>QuantifiedConstraints: Problems with Typeable</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14822">#14822</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14822">#14822</a></th>
|
|
<td>-XQuantifiedConstraints: Turn term-level entailments (:-) into constraints (=>)</td></tr>
|
|
<td>-XQuantifiedConstraints: Turn term-level entailments (:-) into constraints (=>)</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14833">#14833</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14833">#14833</a></th>
|
|
<td>QuantifiedConstraints: GHC can't deduce (() :: Constraint)?</td></tr>
|
|
<td>QuantifiedConstraints: GHC can't deduce (() :: Constraint)?</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14835">#14835</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14835">#14835</a></th>
|
|
<td>QuantifiedConstraints: Can't deduce "(a, b)" from "a" and "b"</td></tr>
|
|
<td>QuantifiedConstraints: Can't deduce "(a, b)" from "a" and "b"</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14840">#14840</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14840">#14840</a></th>
|
|
<td>QuantifiedConstraints: Can't define class alias</td></tr>
|
|
<td>QuantifiedConstraints: Can't define class alias</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14861">#14861</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14861">#14861</a></th>
|
|
<td>QuantifiedConstraints: Can't use forall'd variable in context</td></tr>
|
|
<td>QuantifiedConstraints: Can't use forall'd variable in context</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14863">#14863</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14863">#14863</a></th>
|
|
<td>QuantifiedConstraints: Can't deduce `c' from `(a, b)' and `a |- b |- c'</td></tr>
|
|
<td>QuantifiedConstraints: Can't deduce `c' from `(a, b)' and `a |- b |- c'</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14878">#14878</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14878">#14878</a></th>
|
|
<td>Can't witness transitivity ((.)) of isomorphism of Constraints</td></tr>
|
|
<td>Can't witness transitivity ((.)) of isomorphism of Constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14883">#14883</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14883">#14883</a></th>
|
|
<td>QuantifiedConstraints don't kick in when used in TypeApplications</td></tr>
|
|
<td>QuantifiedConstraints don't kick in when used in TypeApplications</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14897">#14897</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14897">#14897</a></th>
|
|
<td>QuantifiedConstraints: Can't print type of quantified constraint</td></tr>
|
|
<td>QuantifiedConstraints: Can't print type of quantified constraint</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14942">#14942</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14942">#14942</a></th>
|
|
<td>QuantifiedConstraints: GHC can't infer</td></tr>
|
|
<td>QuantifiedConstraints: GHC can't infer</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14961">#14961</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14961">#14961</a></th>
|
|
<td>QuantifiedConstraints: introducing classes through equality constraints fails</td></tr>
|
|
<td>QuantifiedConstraints: introducing classes through equality constraints fails</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/14993">#14993</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/14993">#14993</a></th>
|
|
<td>QuantifiedConstraints and principal types</td></tr>
|
|
<td>QuantifiedConstraints and principal types</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15008">#15008</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15008">#15008</a></th>
|
|
<td>Type synonyms with hidden, determined type variables</td></tr>
|
|
<td>Type synonyms with hidden, determined type variables</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15231">#15231</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15231">#15231</a></th>
|
|
<td>UndecidableInstances validity checking is wrong in the presence of QuantifiedConstraints</td></tr>
|
|
<td>UndecidableInstances validity checking is wrong in the presence of QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15244">#15244</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15244">#15244</a></th>
|
|
<td>Ambiguity checks in QuantifiedConstraints</td></tr>
|
|
<td>Ambiguity checks in QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15290">#15290</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15290">#15290</a></th>
|
|
<td>QuantifiedConstraints: panic "addTcEvBind NoEvBindsVar"</td></tr>
|
|
<td>QuantifiedConstraints: panic "addTcEvBind NoEvBindsVar"</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15316">#15316</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15316">#15316</a></th>
|
|
<td>Regarding coherence and implication loops in presence of QuantifiedConstraints</td></tr>
|
|
<td>Regarding coherence and implication loops in presence of QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15334">#15334</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15334">#15334</a></th>
|
|
<td>(forall x. c x, forall x. d x) is not equivalent to forall x. (c x, d x)</td></tr>
|
|
<td>(forall x. c x, forall x. d x) is not equivalent to forall x. (c x, d x)</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15359">#15359</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15359">#15359</a></th>
|
|
<td>Quantified constraints do not work with equality constraints</td></tr>
|
|
<td>Quantified constraints do not work with equality constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15507">#15507</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15507">#15507</a></th>
|
|
<td>Deriving with QuantifiedConstraints is unable to penetrate type families</td></tr>
|
|
<td>Deriving with QuantifiedConstraints is unable to penetrate type families</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15593">#15593</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15593">#15593</a></th>
|
|
<td>QuantifiedConstraints: trouble with type family</td></tr>
|
|
<td>QuantifiedConstraints: trouble with type family</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15625">#15625</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15625">#15625</a></th>
|
|
<td>GHC panic, with QuantifiedConstraints</td></tr>
|
|
<td>GHC panic, with QuantifiedConstraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15635">#15635</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15635">#15635</a></th>
|
|
<td>Implication introduction for quantified constraints</td></tr>
|
|
<td>Implication introduction for quantified constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15636">#15636</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15636">#15636</a></th>
|
|
<td>Implication constraint priority breaks default class implementations</td></tr>
|
|
<td>Implication constraint priority breaks default class implementations</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15943">#15943</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15943">#15943</a></th>
|
|
<td>"ASSERT failed" with quantified constraints</td></tr>
|
|
<td>"ASSERT failed" with quantified constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/15974">#15974</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/15974">#15974</a></th>
|
|
<td>QuantifiedConstraints: Spurious error involving superclass constraints</td></tr>
|
|
<td>QuantifiedConstraints: Spurious error involving superclass constraints</td></tr>
|
|
<tr><th><a href="https://gitlab.haskell.org//ghc/ghc/issues/16123">#16123</a></th>
|
|
<tr><th><a href="https://gitlab.haskell.org/ghc/ghc/issues/16123">#16123</a></th>
|
|
<td>QuantifiedConstraints fails to deduce trivial constraint</td></tr></table>
|
|
<td>QuantifiedConstraints fails to deduce trivial constraint</td></tr></table>
|
|
|
|
|
|
|
|
|
... | | ... | |