hls-tactics-plugin-1.0.0.0: Wingman plugin for Haskell Language Server
Safe HaskellNone
LanguageHaskell2010

Ide.Plugin.Tactic.LanguageServer

Synopsis

Documentation

tcCommandName :: TacticCommand -> Text Source #

The name of the command for the LS.

runStaleIde :: forall a r. (r ~ RuleResult a, Eq a, Hashable a, Binary a, Show a, Typeable a, NFData a, Show r, Typeable r, NFData r) => IdeState -> NormalizedFilePath -> a -> MaybeT IO (r, PositionMapping) Source #

getFeatureSet :: MonadLsp Config m => ShakeExtras -> m FeatureSet Source #

Get the current feature set from the plugin config.

judgementForHole :: IdeState -> NormalizedFilePath -> Range -> FeatureSet -> MaybeT IO (Range, Judgement, Context, DynFlags) Source #

Find the last typechecked module, and find the most specific span, as well as the judgement at the given range.

liftMaybe :: Monad m => Maybe a -> MaybeT m a Source #

getRhsPosVals :: RealSrcSpan -> TypecheckedSource -> Map OccName Provenance Source #

Compute top-level position vals of a function

isRhsHole :: RealSrcSpan -> TypecheckedSource -> Bool Source #

Is this hole immediately to the right of an equals sign?