[Haskell-cafe] type families and type signatures

Ganesh Sittampalam ganesh at earth.li
Sun Apr 6 15:04:47 EDT 2008


Hi,

The following program doesn't compile in latest GHC HEAD, although it does 
if I remove the signature on foo'. Is this expected?

Cheers,

Ganesh

{-# LANGUAGE TypeFamilies #-}
module Test7 where

type family Id a

type instance Id Int = Int

foo :: Id a -> Id a
foo = id

foo' :: Id a -> Id a
foo' = foo


More information about the Haskell-Cafe mailing list