fltkhs-0.5.2.9: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.SysMenuBar

Contents

Synopsis

Documentation

sysMenuBarCustom Source #

Arguments

:: Rectangle

The bounds of this SysMenuBar

-> Maybe Text

The SysMenuBar label

-> Maybe (Ref SysMenuBar -> IO ())

Optional custom drawing function

-> Maybe (CustomWidgetFuncs SysMenuBar)

Optional custom widget functions

-> IO (Ref SysMenuBar) 

Hierarchy

Functions

add:: (Parent a MenuItem) => Ref SysMenuBar -> Text -> Maybe Shortcut -> Maybe (Ref a-> IO ()) -> MenuItemFlags -> IO (MenuItemIndex)

addName :: Ref SysMenuBar -> Text -> IO ()

clear :: Ref SysMenuBar -> IO ()

clearSubmenu :: Ref SysMenuBar -> Int -> IO (Int)

destroy :: Ref SysMenuBar -> IO ()

draw :: Ref SysMenuBar -> IO ()

drawSuper :: Ref SysMenuBar -> IO ()

getMode :: Ref SysMenuBar -> Int -> IO (Maybe MenuItemFlags)

global :: Ref SysMenuBar -> IO ()

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

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

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

hide :: Ref SysMenuBar -> IO ()

hideSuper :: Ref SysMenuBar -> IO ()

insert:: (Parent a MenuPrim) => Ref SysMenuBar -> Int -> Text -> Maybe Shortcut -> (Ref a -> IO ()) -> MenuItemFlags -> IO (MenuItemIndex)

remove :: Ref SysMenuBar -> Int -> IO ()

replace :: Ref SysMenuBar -> Int -> Text -> IO ()

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

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

setMenu :: Ref SysMenuBar -> [Ref MenuItem] -> IO ()

setMode :: Ref SysMenuBar -> Int -> MenuItemFlags -> IO ()

setShortcut :: Ref SysMenuBar -> Int -> ShortcutKeySequence -> IO ()

showWidget :: Ref SysMenuBar -> IO ()

showWidgetSuper :: Ref SysMenuBar -> IO ()

Orphan instances

(~) * impl (Int -> IO (Maybe MenuItemFlags)) => Op (GetMode ()) SysMenuBar orig impl Source # 

Methods

runOp :: GetMode () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (Int -> MenuItemFlags -> IO ()) => Op (SetMode ()) SysMenuBar orig impl Source # 

Methods

runOp :: SetMode () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (Int -> IO ()) => Op (Remove ()) SysMenuBar orig impl Source # 

Methods

runOp :: Remove () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (Int -> Text -> IO ()) => Op (Replace ()) SysMenuBar orig impl Source # 

Methods

runOp :: Replace () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (Text -> IO ()) => Op (AddName ()) SysMenuBar orig impl Source # 

Methods

runOp :: AddName () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (Int -> IO Int) => Op (ClearSubmenu ()) SysMenuBar orig impl Source # 

Methods

runOp :: ClearSubmenu () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl ([Ref MenuItem] -> IO ()) => Op (SetMenu ()) SysMenuBar orig impl Source # 

Methods

runOp :: SetMenu () -> orig -> Ref SysMenuBar -> impl Source #

(~) * impl (IO ()) => Op (Global ()) SysMenuBar orig impl Source # 

Methods

runOp :: Global () -> orig -> Ref SysMenuBar -> impl Source #

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

Methods

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

(~) * impl (Int -> ShortcutKeySequence -> IO ()) => Op (SetShortcut ()) SysMenuBar orig impl Source # 

Methods

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

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

Methods

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

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

Methods

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

(~) * impl (IO ()) => Op (Clear ()) SysMenuBar orig impl Source # 

Methods

runOp :: Clear () -> orig -> Ref SysMenuBar -> impl Source #

(Parent a MenuPrim, (~) * impl (Int -> Text -> Maybe Shortcut -> (Ref a -> IO ()) -> MenuItemFlags -> IO MenuItemIndex)) => Op (Insert ()) SysMenuBar orig impl Source # 

Methods

runOp :: Insert () -> orig -> Ref SysMenuBar -> impl Source #

(Parent a MenuItem, (~) * impl (Text -> Maybe Shortcut -> Maybe (Ref a -> IO ()) -> MenuItemFlags -> IO MenuItemIndex)) => Op (Add ()) SysMenuBar orig impl Source # 

Methods

runOp :: Add () -> orig -> Ref SysMenuBar -> impl Source #

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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

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

Methods

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