Skip to content
Snippets Groups Projects
Commit f3f45895 authored by Simon Peyton Jones's avatar Simon Peyton Jones Committed by Austin Seipp
Browse files

Test Trac #9222

(cherry picked from commit 127c45ea)

Conflicts:
	testsuite/tests/polykinds/all.T
parent 030cba65
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE RankNTypes, GADTs, DataKinds, PolyKinds, TypeOperators, TypeFamilies #-}
module T9222 where
import Data.Proxy
data Want :: (i,j) -> * where
Want :: (a ~ '(b,c) => Proxy b) -> Want a
...@@ -101,3 +101,4 @@ test('T7481', normal, compile_fail,['']) ...@@ -101,3 +101,4 @@ test('T7481', normal, compile_fail,[''])
test('T8705', normal, compile, ['']) test('T8705', normal, compile, [''])
test('T8985', normal, compile, ['']) test('T8985', normal, compile, [''])
test('T9106', normal, compile_fail, ['']) test('T9106', normal, compile_fail, [''])
test('T9222', 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