fltkhs-0.5.3.4: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.TextEditor

Contents

Synopsis

Documentation

textEditorCustom Source #

Arguments

:: Rectangle

The bounds of this TextEditor

-> Maybe Text

The TextEditor label

-> Maybe (Ref TextEditor -> IO ())

Optional custom drawing function

-> Maybe (CustomWidgetFuncs TextEditor)

Optional custom widget functions

-> IO (Ref TextEditor) 

data KeyFunc Source #

Constructors

Parent a TextEditor => KeyFunc (Ref a -> Char -> IO ()) 

type KeyFuncPrim = CInt -> Ptr () -> IO () Source #

Hierarchy

Functions

destroy :: Ref TextEditor -> IO ()

draw :: Ref TextEditor -> IO ()

drawSuper :: Ref TextEditor -> IO ()

getDefaultKeyBindings :: Ref TextEditor -> IO [KeyBinding]

getInsertMode :: Ref TextEditor -> IO (Bool)

handle :: Ref TextEditor -> Event -> IO (Either UnknownEvent ())

handleSuper :: Ref TextEditor -> Event -> IO (Either UnknownEvent ())

hide :: Ref TextEditor -> IO ()

hideSuper :: Ref TextEditor -> IO ()

replaceKeyBindings :: Ref TextEditor -> [KeyBinding] -> IO ()

resize :: Ref TextEditor -> Rectangle -> IO ()

resizeSuper :: Ref TextEditor -> Rectangle -> IO ()

setInsertMode :: Ref TextEditor -> Bool -> IO ()

showWidget :: Ref TextEditor -> IO ()

showWidgetSuper :: Ref TextEditor -> IO ()

Orphan instances

(~) * impl ([KeyBinding] -> IO ()) => Op (ReplaceKeyBindings ()) TextEditor orig impl Source # 

Methods

runOp :: ReplaceKeyBindings () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO [KeyBinding]) => Op (GetDefaultKeyBindings ()) TextEditor orig impl Source # 

Methods

runOp :: GetDefaultKeyBindings () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO Bool) => Op (GetInsertMode ()) TextEditor orig impl Source # 

Methods

runOp :: GetInsertMode () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (Bool -> IO ()) => Op (SetInsertMode ()) TextEditor orig impl Source # 

Methods

runOp :: SetInsertMode () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (Draw ()) TextEditor orig impl Source # 

Methods

runOp :: Draw () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (Event -> IO (Either UnknownEvent ())) => Op (HandleSuper ()) TextEditor orig impl Source # 

Methods

runOp :: HandleSuper () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (DrawSuper ()) TextEditor orig impl Source # 

Methods

runOp :: DrawSuper () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (Rectangle -> IO ()) => Op (Resize ()) TextEditor orig impl Source # 

Methods

runOp :: Resize () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (Rectangle -> IO ()) => Op (ResizeSuper ()) TextEditor orig impl Source # 

Methods

runOp :: ResizeSuper () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (Hide ()) TextEditor orig impl Source # 

Methods

runOp :: Hide () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (HideSuper ()) TextEditor orig impl Source # 

Methods

runOp :: HideSuper () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (ShowWidget ()) TextEditor orig impl Source # 

Methods

runOp :: ShowWidget () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (ShowWidgetSuper ()) TextEditor orig impl Source # 

Methods

runOp :: ShowWidgetSuper () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (Event -> IO (Either UnknownEvent ())) => Op (Handle ()) TextEditor orig impl Source # 

Methods

runOp :: Handle () -> orig -> Ref TextEditor -> impl Source #

(~) * impl (IO ()) => Op (Destroy ()) TextEditor orig impl Source # 

Methods

runOp :: Destroy () -> orig -> Ref TextEditor -> impl Source #