module Signet.Unstable.Extra.Maybe where

note :: e -> Maybe a -> Either e a
note :: forall e a. e -> Maybe a -> Either e a
note = (Either e a -> (a -> Either e a) -> Maybe a -> Either e a)
-> (a -> Either e a) -> Either e a -> Maybe a -> Either e a
forall a b c. (a -> b -> c) -> b -> a -> c
flip Either e a -> (a -> Either e a) -> Maybe a -> Either e a
forall b a. b -> (a -> b) -> Maybe a -> b
maybe a -> Either e a
forall a b. b -> Either a b
Right (Either e a -> Maybe a -> Either e a)
-> (e -> Either e a) -> e -> Maybe a -> Either e a
forall b c a. (b -> c) -> (a -> b) -> a -> c
. e -> Either e a
forall a b. a -> Either a b
Left