On Mon, Feb 16, 2015 at 2:22 PM, C Maeder <c.maeder@jacobs-university.de> wrote:
Hi Ivan,

could you make a new release of fgl that works with ghc-7.10?

I could compile it locally after the following changes:

  Data/Graph/Inductive/Query/Monad.hs

+import Control.Applicative
+import Control.Monad (ap, liftM)

+instance Monad m => Functor (GT m g) where
+    fmap = liftM
+
+instance Monad m => Applicative (GT m g) where
+    pure = return
+    (<*>) = ap

  Data/Graph/Inductive/Monad/IOArray.hs

-{-# LANGUAGE MultiParamTypeClasses, FlexibleInstances #-}
+{-# LANGUAGE MultiParamTypeClasses, FlexibleInstances, FlexibleContexts #-}

I'm not sure why FlexibleContexts is now needed and I'm not sure how the package version number should change.

Assuming the package defines GT this is a minor (third component) bump according to the newish PVP rules. Major if it's an orphan instance.
 

Cheers Christian
_______________________________________________
Libraries mailing list
Libraries@haskell.org
http://mail.haskell.org/cgi-bin/mailman/listinfo/libraries