summaryrefslogtreecommitdiff
path: root/ghc/tests/rename/should_fail/rnfail020.hs
blob: b434fa4609e6b8a05517acd037122d92cf9c95dc (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
{-# OPTIONS -fglasgow-exts #-}

-- !!! Error messages with scoped type variables

module Foo where

data Set a = Set a

unionSetB :: Eq a => Set a -> Set a -> Set a
unionSetB (s1 :: Set a) s2 = unionSets s1 s2
 where
   unionSets :: Eq a => Set a -> Set a -> Set a
   unionSets a b = a


{- In GHC 4.04 this gave the terrible message:

    None of the type variable(s) in the constraint `Eq a'
	appears in the type `Set a -> Set a -> Set a'
    In the type signature for `unionSets'
-}