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

Test Trac #5821

And rename the wrongly named rebindable/T5821 to T5908 (Trac #5908)
parent 78841329
No related branches found
No related tags found
No related merge requests found
......@@ -4,7 +4,7 @@
ExplicitForAll
, GADTs
, RebindableSyntax #-}
module T5821a
module T5908
( Writer
, runWriter
, execWriter
......
......@@ -30,4 +30,4 @@ test('DoParamM', reqlib('mtl'), compile_fail, [''])
test('T5038', normal, compile_and_run, [''])
test('T4851', normal, compile, [''])
test('T5821', normal, compile, [''])
test('T5908', normal, compile, [''])
{-# LANGUAGE TypeFamilies #-}
{-# OPTIONS_GHC -fno-warn-redundant-constraints #-}
module T5821 where
type family T a
type instance T Int = Bool
foo :: Num a => a -> T a
foo = undefined
{-# SPECIALISE foo :: Int -> Bool #-}
......@@ -209,3 +209,4 @@ test('T6056', only_ways(['optasm']), multimod_compile, ['T6056', '-v0 -ddump-rul
test('T9400', only_ways(['optasm']), compile, ['-O0 -ddump-simpl -dsuppress-uniques'])
test('T9583', only_ways(['optasm']), compile, [''])
test('T9565', only_ways(['optasm']), compile, [''])
test('T5821', only_ways(['optasm']), 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