Skip to content
Snippets Groups Projects
Commit f07567c1 authored by Ryan Scott's avatar Ryan Scott
Browse files

Remove outdated monad-validate patch

The latest Hackage version supports HEAD.
parent 50980fa4
No related branches found
No related tags found
No related merge requests found
diff --git a/src/Control/Monad/Validate/Internal.hs b/src/Control/Monad/Validate/Internal.hs
index cfb1d6b..96aee8e 100644
--- a/src/Control/Monad/Validate/Internal.hs
+++ b/src/Control/Monad/Validate/Internal.hs
@@ -296,7 +296,7 @@ instance (Monad m) => Applicative (ValidateT e m) where
{-# INLINABLE (<*>) #-}
instance (Monad m) => Monad (ValidateT e m) where
- ValidateT x >>= f = ValidateT (x >>= (getValidateT . f))
+ ValidateT x >>= f = ValidateT (x >>= (\a -> getValidateT (f a)))
{-# INLINE (>>=) #-}
instance MonadTrans (ValidateT e) 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