Skip to content
Snippets Groups Projects
Commit 43d71373 authored by Joachim Breitner's avatar Joachim Breitner
Browse files

Rename new T9858c to T9858d to avoid test name clash

parent 932f0867
No related merge requests found
{-# LANGUAGE ImpredicativeTypes, FlexibleContexts #-}
module T9858b where
module T9858d where
import Data.Typeable
i :: (Typeable a, Typeable b) => Proxy (a b) -> TypeRep
......
T9858c.hs:9:8: error:
T9858d.hs:9:8: error:
Couldn't match type ‘Eq Int => Int’ with ‘a0 b0’
Expected type: Proxy (a0 b0)
Actual type: Proxy (Eq Int => Int)
......
......@@ -358,4 +358,4 @@ test('T10194', normal, compile_fail, [''])
test('T8030', normal, compile_fail, [''])
test('T9858a', normal, compile_fail, [''])
test('T9858b', normal, compile_fail, [''])
test('T9858c', normal, compile_fail, [''])
test('T9858d', normal, compile_fail, [''])
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