Skip to content
Snippets Groups Projects
Commit c6462ab0 authored by Ryan Scott's avatar Ryan Scott
Browse files

Add test for #14101

I forgot to do this in
0bb1e840.
parent 0bb1e840
No related merge requests found
{-# LANGUAGE RoleAnnotations #-}
module T14101 where
type role Array representational
data Array a
type Arr = Array
data Foo a = Foo (Arr a)
type role Foo representational
......@@ -7,3 +7,4 @@ test('Roles14', only_ways('normal'), compile, ['-ddump-tc -dsuppress-uniques'])
test('T8958', [normalise_fun(normalise_errmsg), only_ways('normal')], compile, ['-ddump-tc -dsuppress-uniques -fprint-typechecker-elaboration'])
test('T10263', normal, compile, [''])
test('T9204b', [], multimod_compile, ['T9204b', '-v0'])
test('T14101', 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