fltkhs-0.8.0.2: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.Base.TextDisplay

Contents

Synopsis

Documentation

textDisplayCustom Source #

Arguments

:: Rectangle

The bounds of this TextDisplay

-> Maybe Text

The TextDisplay label

-> Maybe (Ref TextDisplay -> IO ())

Optional custom drawing function

-> Maybe (CustomWidgetFuncs TextDisplay)

Optional custom widget functions

-> IO (Ref TextDisplay) 

Hierarchy

Functions

colToX :: Ref TextDisplayBase -> Double -> IO (Double)

countLines :: Ref TextDisplayBase -> IndexRange -> Bool -> IO (Int)

destroy :: Ref TextDisplayBase -> IO ()

draw :: Ref TextDisplayBase -> IO ()

getBuffer :: Ref TextDisplayBase -> IO (Maybe (Ref TextBuffer))

getCursorColor :: Ref TextDisplayBase -> IO (Color)

getInsertPosition :: Ref TextDisplayBase -> IO AtIndex

getLinenumberAlign :: Ref TextDisplayBase -> IO (AlignType)

getLinenumberBgcolor :: Ref TextDisplayBase -> IO (Color)

getLinenumberFgcolor :: Ref TextDisplayBase -> IO (Color)

getLinenumberFont :: Ref TextDisplayBase -> IO (Font)

getLinenumberFormat :: Ref TextDisplayBase -> IO Text

getLinenumberSize :: Ref TextDisplayBase -> IO (FontSize)

getLinenumberWidth :: Ref TextDisplayBase -> IO (Width)

getScrollbarAlign :: Ref TextDisplayBase -> IO (AlignType)

getScrollbarWidth :: Ref TextDisplayBase -> IO (Width)

getShortcut :: Ref TextDisplayBase -> IO (Maybe ShortcutKeySequence)

getTextcolor :: Ref TextDisplayBase -> IO (Color)

getTextfont :: Ref TextDisplayBase -> IO (Font)

getTextsize :: Ref TextDisplayBase -> IO (FontSize)

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

hide :: Ref TextDisplayBase -> IO ()

highlightData:: (Parent a TextBuffer) => Ref TextDisplayBase -> Ref a -> [(Char, StyleTableEntry]) -> 'Maybe(Char,UnfinishedStyleCb') -> IO ()

inSelection :: Ref TextDisplayBase -> Position -> IO (Bool)

lineEnd :: Ref TextDisplayBase -> AtIndex -> Bool -> IO (AtIndex)

lineStart :: Ref TextDisplayBase -> AtIndex -> IO (AtIndex)

moveDown :: Ref TextDisplayBase -> IO (Either OutOfRange ())

moveLeft :: Ref TextDisplayBase -> IO (Either OutOfRange ())

moveRight :: Ref TextDisplayBase -> IO (Either OutOfRange ())

moveUp :: Ref TextDisplayBase -> IO (Either OutOfRange ())

nextWord :: Ref TextDisplayBase -> IO ()

overstrike :: Ref TextDisplayBase -> Text -> IO ()

positionStyle :: Ref TextDisplayBase -> AtIndex -> Int -> LineNumber -> IO TextDisplayStyle

positionToXy :: Ref TextDisplayBase -> AtIndex -> IO (Either OutOfRange Position)

previousWord :: Ref TextDisplayBase -> IO ()

redisplayRange :: Ref TextDisplayBase -> IndexRange -> IO ()

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

rewindLines :: Ref TextDisplayBase -> AtIndex -> Int -> IO (AtIndex)

scroll :: Ref TextDisplayBase -> LineNumber -> AtIndex -> IO ()

setBuffer:: (Parent a TextBuffer) => Ref TextDisplayBase -> Maybe ( Ref a ) -> IO ()

setCursorColor :: Ref TextDisplayBase -> Color -> IO ()

setCursorStyle :: Ref TextDisplayBase -> CursorType -> IO ()

setInsertPosition :: Ref TextDisplayBase -> AtIndex -> IO ()

setLinenumberAlign :: Ref TextDisplayBase -> AlignType -> IO ()

setLinenumberBgcolor :: Ref TextDisplayBase -> Color -> IO ()

setLinenumberFgcolor :: Ref TextDisplayBase -> Color -> IO ()

setLinenumberFont :: Ref TextDisplayBase -> Font -> IO ()

setLinenumberFormat :: Ref TextDisplayBase -> Text -> IO ()

setLinenumberSize :: Ref TextDisplayBase -> FontSize -> IO ()

setLinenumberWidth :: Ref TextDisplayBase -> Width -> IO ()

setScrollbarAlign :: Ref TextDisplayBase -> AlignType -> IO ()

setScrollbarWidth :: Ref TextDisplayBase -> Width -> IO ()

setShortcut :: Ref TextDisplayBase -> ShortcutKeySequence -> IO ()

setTextcolor :: Ref TextDisplayBase -> Color -> IO ()

setTextfont :: Ref TextDisplayBase -> Font -> IO ()

setTextsize :: Ref TextDisplayBase -> FontSize -> IO ()

showCursor :: Ref TextDisplayBase -> Bool -> IO ()

showInsertPosition :: Ref TextDisplayBase -> IO ()

showWidget :: Ref TextDisplayBase -> IO ()

skipLines :: Ref TextDisplayBase -> AtIndex -> Int -> Bool -> IO (AtIndex)

wordEnd :: Ref TextDisplayBase -> AtIndex -> IO (AtIndex)

wordStart :: Ref TextDisplayBase -> AtIndex -> IO (AtIndex)

wrapMode :: Ref TextDisplayBase -> WrapType -> IO ()

xToCol :: Ref TextDisplayBase -> Double -> IO (Double)

xyToPosition :: Ref TextDisplayBase -> Position -> Maybe PositionType -> IO AtIndex

Orphan instances

impl ~ (WrapType -> IO ()) => Op (WrapMode ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: WrapMode () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Text => Op (GetLinenumberFormat ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberFormat () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Text -> IO ()) => Op (SetLinenumberFormat ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberFormat () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO AlignType => Op (GetLinenumberAlign ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberAlign () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AlignType -> IO ()) => Op (SetLinenumberAlign ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberAlign () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Color => Op (GetLinenumberBgcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberBgcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Color -> IO ()) => Op (SetLinenumberBgcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberBgcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Color => Op (GetLinenumberFgcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberFgcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Color -> IO ()) => Op (SetLinenumberFgcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberFgcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO FontSize => Op (GetLinenumberSize ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberSize () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (FontSize -> IO ()) => Op (SetLinenumberSize ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberSize () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Font => Op (GetLinenumberFont ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberFont () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Font -> IO ()) => Op (SetLinenumberFont ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberFont () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Width => Op (GetLinenumberWidth ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetLinenumberWidth () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Width -> IO ()) => Op (SetLinenumberWidth ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetLinenumberWidth () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Double -> IO Double) => Op (ColToX ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: ColToX () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Double -> IO Double) => Op (XToCol ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: XToCol () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> Int -> LineNumber -> IO TextDisplayStyle) => Op (PositionStyle ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: PositionStyle () -> orig -> Ref TextDisplayBase -> impl Source #

(Parent a TextBuffer, impl ~ (Ref a -> [(Char, StyleTableEntry)] -> Maybe (Char, UnfinishedStyleCb) -> IO ())) => Op (HighlightData ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: HighlightData () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AlignType -> IO ()) => Op (SetScrollbarAlign ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetScrollbarAlign () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO AlignType => Op (GetScrollbarAlign ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetScrollbarAlign () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (CursorType -> IO ()) => Op (SetCursorStyle ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetCursorStyle () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Bool -> IO ()) => Op (ShowCursor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: ShowCursor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO () => Op (PreviousWord ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: PreviousWord () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO () => Op (NextWord ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: NextWord () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Either OutOfRange ()) => Op (MoveDown ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: MoveDown () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Either OutOfRange ()) => Op (MoveUp ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: MoveUp () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Either OutOfRange ()) => Op (MoveLeft ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: MoveLeft () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Either OutOfRange ()) => Op (MoveRight ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: MoveRight () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO () => Op (ShowInsertPosition ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: ShowInsertPosition () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Position -> IO Bool) => Op (InSelection ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: InSelection () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> IO (Either OutOfRange Position)) => Op (PositionToXy ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: PositionToXy () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Position -> Maybe PositionType -> IO AtIndex) => Op (XyToPosition ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: XyToPosition () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO AtIndex => Op (GetInsertPosition ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetInsertPosition () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> IO ()) => Op (SetInsertPosition ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetInsertPosition () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Text -> IO ()) => Op (Overstrike ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: Overstrike () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (LineNumber -> AtIndex -> IO ()) => Op (Scroll ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: Scroll () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (IndexRange -> IO ()) => Op (RedisplayRange ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: RedisplayRange () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Maybe (Ref TextBuffer)) => Op (GetBuffer ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetBuffer () -> orig -> Ref TextDisplayBase -> impl Source #

(Parent a TextBuffer, impl ~ (Maybe (Ref a) -> IO ())) => Op (SetBuffer ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetBuffer () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> Int -> IO AtIndex) => Op (RewindLines ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: RewindLines () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> Int -> Bool -> IO AtIndex) => Op (SkipLines ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SkipLines () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (IndexRange -> Bool -> IO Int) => Op (CountLines ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: CountLines () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> IO AtIndex) => Op (WordEnd ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: WordEnd () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> IO AtIndex) => Op (WordStart ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: WordStart () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> Bool -> IO AtIndex) => Op (LineEnd ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: LineEnd () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (AtIndex -> IO AtIndex) => Op (LineStart ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: LineStart () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Width -> IO ()) => Op (SetScrollbarWidth ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetScrollbarWidth () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Width => Op (GetScrollbarWidth ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetScrollbarWidth () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Color -> IO ()) => Op (SetCursorColor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetCursorColor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Color => Op (GetCursorColor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetCursorColor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Color -> IO ()) => Op (SetTextcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetTextcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Color => Op (GetTextcolor ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetTextcolor () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (FontSize -> IO ()) => Op (SetTextsize ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetTextsize () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO FontSize => Op (GetTextsize ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetTextsize () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Font -> IO ()) => Op (SetTextfont ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetTextfont () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO Font => Op (GetTextfont ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetTextfont () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO () => Op (Draw ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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

impl ~ (ShortcutKeySequence -> IO ()) => Op (SetShortcut ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: SetShortcut () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ IO (Maybe ShortcutKeySequence) => Op (GetShortcut ()) TextDisplayBase orig impl Source # 
Instance details

Methods

runOp :: GetShortcut () -> orig -> Ref TextDisplayBase -> impl Source #

impl ~ (Rectangle -> IO ()) => Op (Resize ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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

impl ~ IO () => Op (Hide ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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

impl ~ IO () => Op (ShowWidget ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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

impl ~ (Event -> IO (Either UnknownEvent ())) => Op (Handle ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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

impl ~ IO () => Op (Destroy ()) TextDisplayBase orig impl Source # 
Instance details

Methods

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