Skip to content
Snippets Groups Projects
Commit 9431e195 authored by Simon Peyton Jones's avatar Simon Peyton Jones Committed by Marge Bot
Browse files

Add test for #22238

parent 50c78779
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE ImpredicativeTypes #-}
{-# LANGUAGE GADTs #-}
module T22238 where
import Data.Kind (Constraint)
data Dict (c :: Constraint) where
MkDict :: c => Dict c
forallListEqDict :: Dict (forall a. Eq a => Eq [a])
forallListEqDict = MkDict
......@@ -44,3 +44,4 @@ test('T19690', normal, compile_fail, [''])
test('T23143', normal, compile, [''])
test('T23333', normal, compile, [''])
test('T23323', normal, compile, [''])
test('T22238', normal, compile, [''])
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment