{-
We expect to get a suggestion to add 'type' keyword
and enable TypeOperators extension.
-}

{-# LANGUAGE TypeOperators #-}
module T11432 ((-.->)(..)) where

newtype (f -.-> g) a = Fn { apFn :: f a -> g a }