Skip to content
Snippets Groups Projects
Commit 6a1393f1 authored by Ross Paterson's avatar Ross Paterson
Browse files

Further backward compatability fix

parent f863cc0b
No related branches found
No related tags found
No related merge requests found
......@@ -146,7 +146,7 @@ instance (Monad m) => MonadPlus (ListT m) where
instance (MonadFix m) => MonadFix (ListT m) where
mfix f = ListT $ mfix (runListT . f . head) >>= \ xs -> case xs of
[] -> return []
x:_ -> liftM (x:) (runListT (mfix (mapListT (fmap tail) . f)))
x:_ -> liftM (x:) (runListT (mfix (mapListT (liftM tail) . f)))
{-# INLINE mfix #-}
instance MonadTrans ListT where
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment