haskell-tools-daemon-0.6.0.0: Background process for Haskell-tools refactor that editors can connect to.

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.Tools.Refactor.Daemon

Contents

Synopsis

Documentation

updateClient :: (ResponseMsg -> IO ()) -> ClientMessage -> StateT DaemonSessionState Ghc Bool Source #

This function does the real job of acting upon client messages in a stateful environment of a client

data UndoRefactor Source #

type FileDiff = [(Int, Int, String)] Source #

createUndo :: Eq a => Int -> [Diff [a]] -> [(Int, Int, [a])] Source #

data ClientMessage Source #

Instances

Show ClientMessage Source # 
Generic ClientMessage Source # 

Associated Types

type Rep ClientMessage :: * -> * #

FromJSON ClientMessage Source # 
type Rep ClientMessage Source # 
type Rep ClientMessage = D1 (MetaData "ClientMessage" "Language.Haskell.Tools.Refactor.Daemon" "haskell-tools-daemon-0.6.0.0-7q3R8XpMtGEV7x8jCSxQK" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "KeepAlive" PrefixI False) U1) (C1 (MetaCons "SetPackageDB" PrefixI True) (S1 (MetaSel (Just Symbol "pkgDB") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PackageDB)))) ((:+:) (C1 (MetaCons "AddPackages" PrefixI True) (S1 (MetaSel (Just Symbol "addedPathes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]))) (C1 (MetaCons "RemovePackages" PrefixI True) (S1 (MetaSel (Just Symbol "removedPathes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]))))) ((:+:) ((:+:) (C1 (MetaCons "PerformRefactoring" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "refactoring") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) (S1 (MetaSel (Just Symbol "modulePath") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 FilePath))) ((:*:) (S1 (MetaSel (Just Symbol "editorSelection") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String)) (S1 (MetaSel (Just Symbol "details") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [String]))))) (C1 (MetaCons "Stop" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Disconnect" PrefixI False) U1) (C1 (MetaCons "ReLoad" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "addedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath])) ((:*:) (S1 (MetaSel (Just Symbol "changedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath])) (S1 (MetaSel (Just Symbol "removedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]))))))))

data ResponseMsg Source #

Instances

Show ResponseMsg Source # 
Generic ResponseMsg Source # 

Associated Types

type Rep ResponseMsg :: * -> * #

ToJSON ResponseMsg Source # 
type Rep ResponseMsg Source # 
type Rep ResponseMsg = D1 (MetaData "ResponseMsg" "Language.Haskell.Tools.Refactor.Daemon" "haskell-tools-daemon-0.6.0.0-7q3R8XpMtGEV7x8jCSxQK" False) ((:+:) ((:+:) (C1 (MetaCons "KeepAliveResponse" PrefixI False) U1) ((:+:) (C1 (MetaCons "ErrorMessage" PrefixI True) (S1 (MetaSel (Just Symbol "errorMsg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 String))) (C1 (MetaCons "CompilationProblem" PrefixI True) (S1 (MetaSel (Just Symbol "errorMarkers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(SrcSpan, String)]))))) ((:+:) ((:+:) (C1 (MetaCons "ModulesChanged" PrefixI True) (S1 (MetaSel (Just Symbol "undoChanges") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [UndoRefactor]))) (C1 (MetaCons "LoadedModules" PrefixI True) (S1 (MetaSel (Just Symbol "loadedModules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(FilePath, String)])))) ((:+:) (C1 (MetaCons "LoadingModules" PrefixI True) (S1 (MetaSel (Just Symbol "modulesToLoad") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]))) (C1 (MetaCons "Disconnected" PrefixI False) U1))))

Orphan instances