{-# LANGUAGE TupleSections #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE BlockArguments #-}
module Control.Churro.Prelude where
import Control.Churro.Types
import Prelude hiding (id, (.))
import Control.Arrow (arr)
import Control.Category (id, (.), (>>>))
import Control.Concurrent (threadDelay)
import Control.Concurrent.Async (Async, wait)
import Control.Exception (Exception, SomeException, try)
import Control.Monad (replicateM_, when)
import Data.Foldable (for_)
import Data.IORef (newIORef, readIORef, writeIORef)
import Data.Maybe (isJust)
import Data.Time (NominalDiffTime)
import Data.Void (Void)
import GHC.Natural (Natural)
runWait :: Transport t => Churro t Void Void -> IO ()
runWait :: Churro t Void Void -> IO ()
runWait Churro t Void Void
x = Async () -> IO ()
forall a. Async a -> IO a
wait (Async () -> IO ()) -> IO (Async ()) -> IO ()
forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< Churro t Void Void -> IO (Async ())
forall (t :: * -> *).
Transport t =>
Churro t Void Void -> IO (Async ())
run Churro t Void Void
x
runWaitList :: Transport t => Churro t Void o -> IO [o]
runWaitList :: Churro t Void o -> IO [o]
runWaitList Churro t Void o
x = do
IORef [o]
t <- [o] -> IO (IORef [o])
forall a. a -> IO (IORef a)
newIORef []
let
c :: Churro t o o
c = (t (Maybe o) -> t (Maybe o) -> IO ()) -> Churro t o o
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe o)
i t (Maybe o)
_o -> do
[o]
l <- t (Maybe o) -> IO [o]
forall (t :: * -> *) a. Transport t => t (Maybe a) -> IO [a]
yankList t (Maybe o)
i
IORef [o] -> [o] -> IO ()
forall a. IORef a -> a -> IO ()
writeIORef IORef [o]
t [o]
l
Churro t Void Void -> IO ()
forall (t :: * -> *). Transport t => Churro t Void Void -> IO ()
runWait (Churro t Void Void -> IO ()) -> Churro t Void Void -> IO ()
forall a b. (a -> b) -> a -> b
$ Churro t Void o
x Churro t Void o -> Churro t o Void -> Churro t Void Void
forall k (cat :: k -> k -> *) (a :: k) (b :: k) (c :: k).
Category cat =>
cat a b -> cat b c -> cat a c
>>> Churro t o Void
forall o. Churro t o o
c
IORef [o] -> IO [o]
forall a. IORef a -> IO a
readIORef IORef [o]
t
run :: Transport t => Churro t Void Void -> IO (Async ())
run :: Churro t Void Void -> IO (Async ())
run = Churro t Void Void -> IO (Async ())
forall (t :: * -> *) i o.
Transport t =>
Churro t i o -> IO (Async ())
run'
run' :: Transport t => Churro t i o -> IO (Async ())
run' :: Churro t i o -> IO (Async ())
run' Churro t i o
c = do
(t (Maybe Void)
_i,t (Maybe o)
_o,Async ()
a) <- Churro t Void o -> IO (t (Maybe Void), t (Maybe o), Async ())
forall (t :: * -> *) i o.
Churro t i o -> IO (t (Maybe i), t (Maybe o), Async ())
runChurro ([i] -> Churro t Void i
forall (t :: * -> *) (f :: * -> *) o.
(Transport t, Foldable f) =>
f o -> Churro t Void o
sourceList [] Churro t Void i -> Churro t i o -> Churro t Void o
forall k (cat :: k -> k -> *) (a :: k) (b :: k) (c :: k).
Category cat =>
cat a b -> cat b c -> cat a c
>>> Churro t i o
c)
Async () -> IO (Async ())
forall (m :: * -> *) a. Monad m => a -> m a
return Async ()
a
sourceSingleton :: Transport t => o -> Churro t Void o
sourceSingleton :: o -> Churro t Void o
sourceSingleton o
x = [o] -> Churro t Void o
forall (t :: * -> *) (f :: * -> *) o.
(Transport t, Foldable f) =>
f o -> Churro t Void o
sourceList [o
x]
sourceList :: (Transport t, Foldable f) => f o -> Churro t Void o
sourceList :: f o -> Churro t Void o
sourceList = ((o -> IO ()) -> IO ()) -> Churro t Void o
forall (t :: * -> *) o.
Transport t =>
((o -> IO ()) -> IO ()) -> Churro t Void o
sourceIO (((o -> IO ()) -> IO ()) -> Churro t Void o)
-> (f o -> (o -> IO ()) -> IO ()) -> f o -> Churro t Void o
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. f o -> (o -> IO ()) -> IO ()
forall (t :: * -> *) (f :: * -> *) a b.
(Foldable t, Applicative f) =>
t a -> (a -> f b) -> f ()
for_
sourceIO :: Transport t => ((o -> IO ()) -> IO ()) -> Churro t Void o
sourceIO :: ((o -> IO ()) -> IO ()) -> Churro t Void o
sourceIO (o -> IO ()) -> IO ()
cb =
(t (Maybe Void) -> t (Maybe o) -> IO ()) -> Churro t Void o
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe Void)
_i t (Maybe o)
o -> do
(o -> IO ()) -> IO ()
cb (t (Maybe o) -> Maybe o -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe o)
o (Maybe o -> IO ()) -> (o -> Maybe o) -> o -> IO ()
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. o -> Maybe o
forall a. a -> Maybe a
Just)
t (Maybe o) -> Maybe o -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe o)
o Maybe o
forall a. Maybe a
Nothing
sink :: Transport t => Churro t b Void
sink :: Churro t b Void
sink = (b -> IO ()) -> Churro t b Void
forall (t :: * -> *) o.
Transport t =>
(o -> IO ()) -> Churro t o Void
sinkIO (IO () -> b -> IO ()
forall a b. a -> b -> a
const (() -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()))
sinkIO :: Transport t => (o -> IO ()) -> Churro t o Void
sinkIO :: (o -> IO ()) -> Churro t o Void
sinkIO o -> IO ()
cb = (t (Maybe o) -> t (Maybe Void) -> IO ()) -> Churro t o Void
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe o)
i t (Maybe Void)
_o -> t (Maybe o) -> (o -> IO ()) -> IO ()
forall (t :: * -> *) i a.
Transport t =>
t (Maybe i) -> (i -> IO a) -> IO ()
yankAll t (Maybe o)
i o -> IO ()
cb
sinkPrint :: (Transport t, Show a) => Churro t a Void
sinkPrint :: Churro t a Void
sinkPrint = (a -> IO ()) -> Churro t a Void
forall (t :: * -> *) o.
Transport t =>
(o -> IO ()) -> Churro t o Void
sinkIO a -> IO ()
forall a. Show a => a -> IO ()
print
process :: Transport t => (a -> IO b) -> Churro t a b
process :: (a -> IO b) -> Churro t a b
process a -> IO b
f = (a -> IO [b]) -> Churro t a b
forall (t :: * -> *) a b.
Transport t =>
(a -> IO [b]) -> Churro t a b
processN ((b -> [b]) -> IO b -> IO [b]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap b -> [b]
forall (f :: * -> *) a. Applicative f => a -> f a
pure (IO b -> IO [b]) -> (a -> IO b) -> a -> IO [b]
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. a -> IO b
f)
processPrint :: (Transport t, Show b) => Churro t b b
processPrint :: Churro t b b
processPrint = (b -> IO b) -> Churro t b b
forall (t :: * -> *) a b.
Transport t =>
(a -> IO b) -> Churro t a b
process \b
x -> do b -> IO ()
forall a. Show a => a -> IO ()
print b
x IO () -> IO b -> IO b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> b -> IO b
forall (m :: * -> *) a. Monad m => a -> m a
return b
x
processDebug :: (Transport t, Show b) => String -> Churro t b b
processDebug :: String -> Churro t b b
processDebug String
d = (b -> IO b) -> Churro t b b
forall (t :: * -> *) a b.
Transport t =>
(a -> IO b) -> Churro t a b
process \b
x -> String -> IO ()
putStrLn (String
"Debugging [" String -> String -> String
forall a. Semigroup a => a -> a -> a
<> String
d String -> String -> String
forall a. Semigroup a => a -> a -> a
<> String
"]: " String -> String -> String
forall a. Semigroup a => a -> a -> a
<> b -> String
forall a. Show a => a -> String
show b
x) IO () -> IO b -> IO b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> b -> IO b
forall (m :: * -> *) a. Monad m => a -> m a
return b
x
processN :: Transport t => (a -> IO [b]) -> Churro t a b
processN :: (a -> IO [b]) -> Churro t a b
processN a -> IO [b]
f =
(t (Maybe a) -> t (Maybe b) -> IO ()) -> Churro t a b
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe a)
i t (Maybe b)
o -> do
t (Maybe a) -> (a -> IO ()) -> IO ()
forall (t :: * -> *) i a.
Transport t =>
t (Maybe i) -> (i -> IO a) -> IO ()
yankAll t (Maybe a)
i \a
x -> do (b -> IO ()) -> [b] -> IO ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (t (Maybe b) -> Maybe b -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe b)
o (Maybe b -> IO ()) -> (b -> Maybe b) -> b -> IO ()
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. b -> Maybe b
forall a. a -> Maybe a
Just) ([b] -> IO ()) -> IO [b] -> IO ()
forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< a -> IO [b]
f a
x
t (Maybe b) -> Maybe b -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe b)
o Maybe b
forall a. Maybe a
Nothing
justs :: Transport t => Churro t (Maybe a) a
justs :: Churro t (Maybe a) a
justs = (Maybe a -> [a]) -> Churro t (Maybe a) a
forall (t :: * -> *) a b. Transport t => (a -> [b]) -> Churro t a b
mapN ([a] -> (a -> [a]) -> Maybe a -> [a]
forall b a. b -> (a -> b) -> Maybe a -> b
maybe [] a -> [a]
forall (f :: * -> *) a. Applicative f => a -> f a
pure)
lefts :: Transport t => Churro t (Either a b) a
lefts :: Churro t (Either a b) a
lefts = (Either a b -> [a]) -> Churro t (Either a b) a
forall (t :: * -> *) a b. Transport t => (a -> [b]) -> Churro t a b
mapN ((a -> [a]) -> (b -> [a]) -> Either a b -> [a]
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either a -> [a]
forall (f :: * -> *) a. Applicative f => a -> f a
pure ([a] -> b -> [a]
forall a b. a -> b -> a
const []))
rights :: Transport t => Churro t (Either a b) b
rights :: Churro t (Either a b) b
rights = (Either a b -> [b]) -> Churro t (Either a b) b
forall (t :: * -> *) a b. Transport t => (a -> [b]) -> Churro t a b
mapN ((a -> [b]) -> (b -> [b]) -> Either a b -> [b]
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either ([b] -> a -> [b]
forall a b. a -> b -> a
const []) b -> [b]
forall (f :: * -> *) a. Applicative f => a -> f a
pure)
takeC :: (Transport t, Integral n) => n -> Churro t a a
takeC :: n -> Churro t a a
takeC n
n = (t (Maybe a) -> t (Maybe a) -> IO ()) -> Churro t a a
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe a)
i t (Maybe a)
o -> n -> t (Maybe a) -> t (Maybe a) -> IO ()
forall t (t :: * -> *) (t :: * -> *) a.
(Ord t, Num t, Transport t, Transport t, Enum t) =>
t -> t (Maybe a) -> t (Maybe a) -> IO ()
go n
n t (Maybe a)
i t (Maybe a)
o
where
go :: t -> t (Maybe a) -> t (Maybe a) -> IO ()
go t
t t (Maybe a)
i t (Maybe a)
o
| t
t t -> t -> Bool
forall a. Ord a => a -> a -> Bool
<= t
0 = t (Maybe a) -> Maybe a -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe a)
o Maybe a
forall a. Maybe a
Nothing
| Bool
otherwise = do
Maybe a
x <- t (Maybe a) -> IO (Maybe a)
forall (t :: * -> *) a. Transport t => t a -> IO a
yank t (Maybe a)
i
t (Maybe a) -> Maybe a -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe a)
o Maybe a
x
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Maybe a -> Bool
forall a. Maybe a -> Bool
isJust Maybe a
x) do t -> t (Maybe a) -> t (Maybe a) -> IO ()
go (t -> t
forall a. Enum a => a -> a
pred t
t) t (Maybe a)
i t (Maybe a)
o
dropC :: (Transport t, Integral n) => n -> Churro t a a
dropC :: n -> Churro t a a
dropC n
n = (t (Maybe a) -> t (Maybe a) -> IO ()) -> Churro t a a
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe a)
i t (Maybe a)
o -> do
Int -> IO (Maybe a) -> IO ()
forall (m :: * -> *) a. Applicative m => Int -> m a -> m ()
replicateM_ (n -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral n
n) (t (Maybe a) -> IO (Maybe a)
forall (t :: * -> *) a. Transport t => t a -> IO a
yank t (Maybe a)
i)
(a -> a) -> t (Maybe a) -> t (Maybe a) -> IO ()
forall (t :: * -> *) a1 a2.
Transport t =>
(a1 -> a2) -> t (Maybe a1) -> t (Maybe a2) -> IO ()
c2c a -> a
forall k (cat :: k -> k -> *) (a :: k). Category cat => cat a a
id t (Maybe a)
i t (Maybe a)
o
filterC :: Transport t => (a -> Bool) -> Churro t a a
filterC :: (a -> Bool) -> Churro t a a
filterC a -> Bool
p = (a -> [a]) -> Churro t a a
forall (t :: * -> *) a b. Transport t => (a -> [b]) -> Churro t a b
mapN ((a -> Bool) -> [a] -> [a]
forall a. (a -> Bool) -> [a] -> [a]
filter a -> Bool
p ([a] -> [a]) -> (a -> [a]) -> a -> [a]
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. a -> [a]
forall (f :: * -> *) a. Applicative f => a -> f a
pure)
mapN :: Transport t => (a -> [b]) -> Churro t a b
mapN :: (a -> [b]) -> Churro t a b
mapN a -> [b]
f = (a -> IO [b]) -> Churro t a b
forall (t :: * -> *) a b.
Transport t =>
(a -> IO [b]) -> Churro t a b
processN ([b] -> IO [b]
forall (m :: * -> *) a. Monad m => a -> m a
return ([b] -> IO [b]) -> (a -> [b]) -> a -> IO [b]
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. a -> [b]
f)
delay :: Transport t => NominalDiffTime -> Churro t a a
delay :: NominalDiffTime -> Churro t a a
delay = Int -> Churro t a a
forall (t :: * -> *) a. Transport t => Int -> Churro t a a
delayMicro (Int -> Churro t a a)
-> (NominalDiffTime -> Int) -> NominalDiffTime -> Churro t a a
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. forall b. (RealFrac Double, Integral b) => Double -> b
forall a b. (RealFrac a, Integral b) => a -> b
ceiling @Double (Double -> Int)
-> (NominalDiffTime -> Double) -> NominalDiffTime -> Int
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Rational -> Double
forall a. Fractional a => Rational -> a
fromRational (Rational -> Double)
-> (NominalDiffTime -> Rational) -> NominalDiffTime -> Double
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. (Rational -> Rational -> Rational
forall a. Num a => a -> a -> a
*Rational
1000000) (Rational -> Rational)
-> (NominalDiffTime -> Rational) -> NominalDiffTime -> Rational
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. NominalDiffTime -> Rational
forall a. Real a => a -> Rational
toRational
delayMicro :: Transport t => Int -> Churro t a a
delayMicro :: Int -> Churro t a a
delayMicro Int
d = (a -> IO a) -> Churro t a a
forall (t :: * -> *) a b.
Transport t =>
(a -> IO b) -> Churro t a b
process \a
x -> do
Int -> IO ()
threadDelay Int
d
a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return a
x
withPrevious :: Transport t => Churro t a (a,a)
withPrevious :: Churro t a (a, a)
withPrevious = (t (Maybe a) -> t (Maybe (a, a)) -> IO ()) -> Churro t a (a, a)
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe a)
i t (Maybe (a, a))
o -> do
Maybe a -> t (Maybe a) -> t (Maybe (a, a)) -> IO ()
forall (t :: * -> *) (t :: * -> *) a.
(Transport t, Transport t) =>
Maybe a -> t (Maybe a) -> t (Maybe (a, a)) -> IO ()
prog Maybe a
forall a. Maybe a
Nothing t (Maybe a)
i t (Maybe (a, a))
o
t (Maybe (a, a)) -> Maybe (a, a) -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe (a, a))
o Maybe (a, a)
forall a. Maybe a
Nothing
where
prog :: Maybe a -> t (Maybe a) -> t (Maybe (a, a)) -> IO ()
prog Maybe a
x t (Maybe a)
i t (Maybe (a, a))
o = do
Maybe a
y <- t (Maybe a) -> IO (Maybe a)
forall (t :: * -> *) a. Transport t => t a -> IO a
yank t (Maybe a)
i
case (Maybe a
x,Maybe a
y) of
(Just a
x', Just a
y') -> t (Maybe (a, a)) -> Maybe (a, a) -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe (a, a))
o ((a, a) -> Maybe (a, a)
forall a. a -> Maybe a
Just (a
x',a
y')) IO () -> IO () -> IO ()
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Maybe a -> t (Maybe a) -> t (Maybe (a, a)) -> IO ()
prog Maybe a
y t (Maybe a)
i t (Maybe (a, a))
o
(Maybe a
Nothing, Just a
y') -> Maybe a -> t (Maybe a) -> t (Maybe (a, a)) -> IO ()
prog (a -> Maybe a
forall a. a -> Maybe a
Just a
y') t (Maybe a)
i t (Maybe (a, a))
o
(Maybe a, Maybe a)
_ -> () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
processRetry :: Transport t => Natural -> (i -> IO o) -> Churro t i o
processRetry :: Natural -> (i -> IO o) -> Churro t i o
processRetry Natural
retries i -> IO o
f = Natural -> (i -> IO o) -> Churro t i (Either SomeException o)
forall e (t :: * -> *) i o.
(Exception e, Transport t) =>
Natural -> (i -> IO o) -> Churro t i (Either e o)
processRetry' @SomeException Natural
retries i -> IO o
f Churro t i (Either SomeException o)
-> Churro t (Either SomeException o) o -> Churro t i o
forall k (cat :: k -> k -> *) (a :: k) (b :: k) (c :: k).
Category cat =>
cat a b -> cat b c -> cat a c
>>> Churro t (Either SomeException o) o
forall (t :: * -> *) a b. Transport t => Churro t (Either a b) b
rights
processRetry' :: (Exception e, Transport t) => Natural -> (i -> IO o) -> Churro t i (Either e o)
processRetry' :: Natural -> (i -> IO o) -> Churro t i (Either e o)
processRetry' Natural
retries i -> IO o
f = (i -> (Natural, i)) -> Churro t i (Natural, i)
forall (a :: * -> * -> *) b c. Arrow a => (b -> c) -> a b c
arr (Natural
0,) Churro t i (Natural, i)
-> Churro t (Natural, i) (Either e o) -> Churro t i (Either e o)
forall k (cat :: k -> k -> *) (a :: k) (b :: k) (c :: k).
Category cat =>
cat a b -> cat b c -> cat a c
>>> Natural -> (i -> IO o) -> Churro t (Natural, i) (Either e o)
forall e (t :: * -> *) a o.
(Exception e, Transport t) =>
Natural -> (a -> IO o) -> Churro t (Natural, a) (Either e o)
processRetry'' Natural
retries i -> IO o
f
processRetry'' :: (Exception e, Transport t) => Natural -> (a -> IO o) -> Churro t (Natural, a) (Either e o)
processRetry'' :: Natural -> (a -> IO o) -> Churro t (Natural, a) (Either e o)
processRetry'' Natural
retries a -> IO o
f =
(t (Maybe (Natural, a)) -> t (Maybe (Either e o)) -> IO ())
-> Churro t (Natural, a) (Either e o)
forall (t :: * -> *) i o.
Transport t =>
(t (Maybe i) -> t (Maybe o) -> IO ()) -> Churro t i o
buildChurro \t (Maybe (Natural, a))
i t (Maybe (Either e o))
o -> do
t (Maybe (Natural, a)) -> ((Natural, a) -> IO ()) -> IO ()
forall (t :: * -> *) i a.
Transport t =>
t (Maybe i) -> (i -> IO a) -> IO ()
yankAll t (Maybe (Natural, a))
i \(Natural
n, a
y) -> do
Either e o
r <- IO o -> IO (Either e o)
forall e a. Exception e => IO a -> IO (Either e a)
try do a -> IO o
f a
y
t (Maybe (Either e o)) -> Maybe (Either e o) -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe (Either e o))
o (Either e o -> Maybe (Either e o)
forall a. a -> Maybe a
Just Either e o
r)
case Either e o
r of
Right o
_ -> () -> IO ()
forall (m :: * -> *) a. Monad m => a -> m a
return ()
Left e
_ -> Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Natural
n Natural -> Natural -> Bool
forall a. Ord a => a -> a -> Bool
< Natural
retries) do t (Maybe (Natural, a)) -> Maybe (Natural, a) -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe (Natural, a))
i ((Natural, a) -> Maybe (Natural, a)
forall a. a -> Maybe a
Just (Natural -> Natural
forall a. Enum a => a -> a
succ Natural
n, a
y))
t (Maybe (Either e o)) -> Maybe (Either e o) -> IO ()
forall (t :: * -> *) a. Transport t => t a -> a -> IO ()
yeet t (Maybe (Either e o))
o Maybe (Either e o)
forall a. Maybe a
Nothing