Skip to content
Snippets Groups Projects
Commit c72c369b authored by Vladislav Zavialov's avatar Vladislav Zavialov Committed by Ben Gamari
Browse files

Add a minimized regression test for #12928

parent 5cf8032e
No related merge requests found
{-# LANGUAGE DataKinds, PolyKinds #-}
module T12928 where
data P (a::k) = MkP
data FffSym0 (l :: P a)
-- Make sure that the kind of 'k' is not defaulted:
--
-- data FffSym0 (l :: P (a :: Type))
--
-- We expect kind polymorphism:
--
-- data FffSym0 (l :: P (a :: k))
--
type Inst (a :: P Either) (b :: P Maybe) = (FffSym0 a, FffSym0 b)
......@@ -673,3 +673,4 @@ test('T13951', normal, compile, [''])
test('T16411', normal, compile, [''])
test('T16609', normal, compile, [''])
test('T505', normal, compile, [''])
test('T12928', 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