Hey, the hint provided by Ben worked like a charm.

I've also tried Ivan suggestions both on my windows and linux installations.
DrIFT-cabalized couldn't install at all at windows since I don't use MinGW.
So, I ghc'ed --make  DrIFT.

Both, windows and linux, refused to complete work with this error:
drift: can't find module Control/Monad

Thank you.

> {-# LANGUAGE DeriveDataTypeable, StandaloneDeriving #-}
>
> import Data.Typeable
> import Language.Haskell.TH
>
> deriving instance Typeable1 Q



-- 

Leonel Fonseca.
_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to