
11 Jul
2018
11 Jul
'18
7:42 p.m.
It seems to work with the latest GHC (8.4.3). GHC 7.4.2 is six years old :) On 07/11/2018 02:15 PM, Olaf Klinke wrote:
{-# LANGUAGE MultiParamTypeClasses #-} {-# LANGUAGE FunctionalDependencies #-} {-# LANGUAGE KindSignatures #-} {-# LANGUAGE PolyKinds #-}
newtype Heading (f :: k) (p :: * -> *) = Heading (p String)
class Config (p :: * -> *) (f :: (* -> *) -> *) | f -> p where foo :: Heading f p -> String