haskell-tools-demo-1.0.0.4: A web-based demo for Haskell-tools Refactor.

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.Tools.Demo

Synopsis

Documentation

runDemo :: [String] -> IO () Source #

app :: MVar [Int] -> FilePath -> Application Source #

The application that is evoked for each incoming request

updateClient :: FilePath -> ClientMessage -> StateT RefactorSessionState Ghc (Maybe ResponseMsg) Source #

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

data ClientMessage Source #

Instances

Show ClientMessage Source # 
Generic ClientMessage Source # 

Associated Types

type Rep ClientMessage :: * -> * #

FromJSON ClientMessage Source # 
type Rep ClientMessage Source # 

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.Demo" "haskell-tools-demo-1.0.0.4-BXpwIvSj2vS2Oo8VhiFBHN" False) ((:+:) * ((:+:) * (C1 * (MetaCons "RefactorChanges" PrefixI True) (S1 * (MetaSel (Just Symbol "moduleChanges") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * [(String, Maybe String)]))) (C1 * (MetaCons "ASTViewContent" PrefixI True) (S1 * (MetaSel (Just Symbol "astContent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String)))) ((:+:) * (C1 * (MetaCons "ErrorMessage" PrefixI True) (S1 * (MetaSel (Just Symbol "errorMsg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String))) ((:+:) * (C1 * (MetaCons "CompilationProblem" PrefixI True) (S1 * (MetaSel (Just Symbol "errorMsg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String))) (C1 * (MetaCons "Disconnected" PrefixI False) (U1 *)))))