module StackageToHackage.Prelude where

import Control.Applicative (Alternative, empty)


hoistMaybe :: Alternative m => Maybe a -> m a
hoistMaybe :: Maybe a -> m a
hoistMaybe = m a -> (a -> m a) -> Maybe a -> m a
forall b a. b -> (a -> b) -> Maybe a -> b
maybe m a
forall (f :: * -> *) a. Alternative f => f a
empty a -> m a
forall (f :: * -> *) a. Applicative f => a -> f a
pure