module CabalGild.Unstable.Extra.Either where

-- | Converts an 'Either' to a 'Maybe'.
hush :: Either x a -> Maybe a
hush :: forall x a. Either x a -> Maybe a
hush = (x -> Maybe a) -> (a -> Maybe a) -> Either x a -> Maybe a
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either (Maybe a -> x -> Maybe a
forall a b. a -> b -> a
const Maybe a
forall a. Maybe a
Nothing) a -> Maybe a
forall a. a -> Maybe a
Just