module Development.IDE.Core.LookupMod (lookupMod, LookupModule) where
import Control.Monad.Trans.Maybe (MaybeT (MaybeT))
import Development.IDE.Core.Shake (HieDbWriter, IdeAction)
import Development.IDE.GHC.Compat.Core (ModuleName, Unit)
import Development.IDE.Types.Location (Uri)
type LookupModule m = FilePath -> ModuleName -> Unit -> Bool -> MaybeT m Uri
lookupMod ::
HieDbWriter ->
FilePath ->
ModuleName ->
Unit ->
Bool ->
MaybeT IdeAction Uri
lookupMod :: HieDbWriter
-> FilePath -> ModuleName -> Unit -> Bool -> MaybeT IdeAction Uri
lookupMod HieDbWriter
_dbchan FilePath
_hie_f ModuleName
_mod Unit
_uid Bool
_boot = IdeAction (Maybe Uri) -> MaybeT IdeAction Uri
forall (m :: * -> *) a. m (Maybe a) -> MaybeT m a
MaybeT (IdeAction (Maybe Uri) -> MaybeT IdeAction Uri)
-> IdeAction (Maybe Uri) -> MaybeT IdeAction Uri
forall a b. (a -> b) -> a -> b
$ Maybe Uri -> IdeAction (Maybe Uri)
forall a. a -> IdeAction a
forall (f :: * -> *) a. Applicative f => a -> f a
pure Maybe Uri
forall a. Maybe a
Nothing