Skip to content
Snippets Groups Projects
Commit 7973bfb8 authored by Simon Peyton Jones's avatar Simon Peyton Jones
Browse files

Test Trac #8893

parent 28e8d878
No related branches found
No related tags found
No related merge requests found
{-# OPTIONS_GHC -Wall #-}
{-# Language DeriveFunctor #-}
{-# Language PolyKinds #-}
module T8893 where
data V a = V [a] deriving Functor
data C x a = C (V (P x a)) deriving Functor
data P x a = P (x a) deriving Functor
......@@ -46,3 +46,4 @@ test('T8631', normal, compile, [''])
test('T8758', extra_clean(['T8758a.o', 'T8758a.hi']), multimod_compile, ['T8758a', '-v0'])
test('T8678', normal, compile, [''])
test('T8865', normal, compile, [''])
test('T8893', 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