Skip to content
Snippets Groups Projects
Commit 854fd123 authored by Austin Seipp's avatar Austin Seipp
Browse files

testsuite: add test for #10177

parent 1cc46b1f
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE FlexibleContexts #-}
module T10177 where
import Data.Typeable
newtype V n a = V [a]
class Typeable a => C a
instance (Typeable (V n), Typeable a) => C (V n a)
......@@ -444,3 +444,4 @@ test('T10031', normal, compile, [''])
test('T10072', normal, compile_fail, [''])
test('T10100', normal, compile, [''])
test('T10156', normal, compile, [''])
test('T10177', 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