leksah-0.15.2.0: Haskell IDE written in Haskell

Safe HaskellNone
LanguageHaskell2010

IDE.Core.Types

Description

The core state of ide. This module is imported from every other module, | and all data structures of the state are declared here, to avoid circular | module dependencies.

Synopsis

Documentation

data IDE Source

The IDE state

Constructors

IDE 

Fields

frameState :: FrameState IDEM

state of the windows framework

recentPanes :: [PaneName]

a list of panes which were selected last

specialKeys :: SpecialKeyTable IDERef

a structure for emacs like keystrokes

specialKey :: SpecialKeyCons IDERef

the first of a double keystroke

candy :: CandyTable

table for source candy

prefs :: Prefs

configuration preferences

workspace :: Maybe Workspace

may be a workspace (set of packages)

activePack :: Maybe IDEPackage
 
activeExe :: Maybe Text
 
bufferProjCache :: Map FilePath [IDEPackage]

cache the associated packages for a file

allLogRefs :: Seq LogRef
 
currentEBC :: (Maybe LogRef, Maybe LogRef, Maybe LogRef)
 
currentHist :: Int
 
systemInfo :: Maybe GenScope

the system scope

packageInfo :: Maybe (GenScope, GenScope)

the second are the imports

workspaceInfo :: Maybe (GenScope, GenScope)

the second are the imports

workspInfoCache :: PackageDescrCache
 
handlers :: Map Text [(Unique, IDEEvent -> IDEM IDEEvent)]

event handling table

currentState :: IDEState
 
guiHistory :: (Bool, [GUIHistory], Int)
 
findbar :: (Bool, Maybe (Toolbar, ListStore Text))
 
toolbar :: (Bool, Maybe Toolbar)
 
recentFiles :: [FilePath]
 
recentWorkspaces :: [FilePath]
 
runningTool :: Maybe ProcessHandle
 
debugState :: Maybe (IDEPackage, ToolState)
 
completion :: ((Int, Int), Maybe CompletionWindow)
 
yiControl :: Control
 
serverQueue :: Maybe (MVar (ServerCommand, ServerAnswer -> IDEM ()))
 
server :: Maybe Handle
 
hlintQueue :: Maybe (TVar [Either FilePath FilePath])
 
vcsData :: (Map FilePath MenuItem, Maybe (Maybe Text))
 
logLaunches :: Map Text LogLaunchData
 
autoCommand :: IDEAction
 
autoURI :: Maybe Text
 

data IDEState Source

Constructors

IsStartingUp

Leksah is in startup mode

IsShuttingDown

Leksah is about to go down

IsRunning

Leksah is running

IsFlipping TreeView

The flipper is used to switch between sources

IsCompleting Connections

The completion feature is used

type IDERef = IORef IDE Source

A mutable reference to the IDE state

type IDEM = ReaderT IDERef IO Source

The IDE Monad

type IDEAction = IDEM () Source

A shorthand for a reader monad for a mutable reference to the IDE state which does not return a value

(?>>=) :: Monad m => m (Maybe a) -> (a -> m ()) -> m () Source

ipdPackageDir :: IDEPackage -> FilePath Source

The directory of the cabal file

ipdAllDirs :: IDEPackage -> [FilePath] Source

All directory of the package and those of all its source dependencies

ipdLib :: IDEPackage -> Maybe Text Source

Gets the library name if the package has a library component

ipdPackageName :: IDEPackage -> Text Source

Gets the package name

wsAllPackages :: Workspace -> [IDEPackage] Source

Includes sandbox sources

data ActionDescr alpha Source

ActionDescr is a data structure from which GtkActions are build, which are used for menus, toolbars, and accelerator keystrokes

Constructors

AD 

data Prefs Source

Preferences is a data structure to hold configuration data

Constructors

Prefs 

Fields

prefsFormat :: Int
 
prefsSaveTime :: Text
 
showLineNumbers :: Bool
 
rightMargin :: (Bool, Int)
 
tabWidth :: Int
 
wrapLines :: Bool
 
sourceCandy :: (Bool, Text)
 
darkUserInterface :: Bool
 
saveSessionOnClose :: Bool
 
keymapName :: Text
 
forceLineEnds :: Bool
 
removeTBlanks :: Bool
 
textviewFont :: Maybe Text
 
sourceStyle :: (Bool, Text)
 
foundBackgroundLight :: Color
 
matchBackgroundLight :: Color
 
contextBackgroundLight :: Color
 
breakpointBackgroundLight :: Color
 
lintBackgroundLight :: Color
 
foundBackgroundDark :: Color
 
matchBackgroundDark :: Color
 
contextBackgroundDark :: Color
 
breakpointBackgroundDark :: Color
 
lintBackgroundDark :: Color
 
autoLoad :: Bool
 
textEditorType :: Text
 
logviewFont :: Maybe Text
 
defaultSize :: (Int, Int)
 
browser :: Text
 
pathForCategory :: [(Text, PanePath)]
 
defaultPath :: PanePath
 
categoryForPane :: [(Text, Text)]
 
packageBlacklist :: [Dependency]
 
collectAtStart :: Bool
 
useCtrlTabFlipping :: Bool
 
docuSearchURL :: Text
 
completeRestricted :: Bool
 
saveAllBeforeBuild :: Bool
 
jumpToWarnings :: Bool
 
useVado :: Bool
 
useCabalDev :: Bool
 
backgroundBuild :: Bool
 
runUnitTests :: Bool
 
makeMode :: Bool
 
singleBuildWithoutLinking :: Bool
 
dontInstallLast :: Bool
 
printEvldWithShow :: Bool
 
breakOnException :: Bool
 
breakOnError :: Bool
 
printBindResult :: Bool
 
serverIP :: Text
 
showHiddenFiles :: Bool
 
showWorkspaceIcons :: Bool
 
hlintOnSave :: Bool
 
serverPort :: Int
 
sourceDirectories :: [FilePath]
 
unpackDirectory :: Maybe FilePath
 
retrieveURL :: Text
 
retrieveStrategy :: RetrieveStrategy
 
endWithLastConn :: Bool
 

data LogRef Source

Represents a message about a part of the source code

logRefFullFilePath Source

Arguments

:: LogRef

The log ref

-> FilePath

the result

data LogLaunch Source

Constructors

LogLaunch 

data LogLaunchData Source

Other types

type GUIHistory = (GUIHistory', GUIHistory') Source

the first one is the new and the second the old state