module Streamly.Internal.Control.Monad
( discard
)
where
import Control.Monad (void)
import Control.Monad.Catch (MonadCatch, catch, SomeException)
{-# INLINE discard #-}
discard :: MonadCatch m => m b -> m ()
discard :: forall (m :: * -> *) b. MonadCatch m => m b -> m ()
discard m b
action = forall (f :: * -> *) a. Functor f => f a -> f ()
void m b
action forall (m :: * -> *) e a.
(MonadCatch m, Exception e) =>
m a -> (e -> m a) -> m a
`catch` (\(SomeException
_ :: SomeException) -> forall (m :: * -> *) a. Monad m => a -> m a
return ())