fltkhs-0.8.0.3: FLTK bindings
Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.Base.Group

Synopsis

Constructor

Hierarchy

Group functions

add:: (Parent a WidgetBase) => Ref GroupBase -> Ref a-> IO ()

addResizable:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

begin :: Ref GroupBase -> IO ()

children :: Ref GroupBase -> IO (Int)

clear :: Ref GroupBase -> IO ()

clipChildren :: Ref GroupBase -> IO (Bool)

ddfdesignKludge :: Ref GroupBase -> IO (Maybe (Ref WidgetBase))

destroy :: Ref GroupBase -> IO ()

drawChild:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

drawChildren :: Ref GroupBase -> IO ()

drawOutsideLabel:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

end :: Ref GroupBase -> IO ()

find:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO (AtIndex)

focus:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

getArray :: Ref GroupBase -> IO [Ref WidgetBase]

getChild :: Ref GroupBase -> AtIndex -> IO (Maybe (Ref WidgetBase))

getResizable :: Ref GroupBase -> IO (Maybe (Ref WidgetBase))

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

initSizes :: Ref GroupBase -> IO ()

insert:: (Parent a WidgetBase) => Ref GroupBase -> Ref a-> AtIndex -> IO ()

insertBefore:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> Ref b -> IO ()

removeIndex :: Ref GroupBase -> AtIndex -> IO ()

removeWidget:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

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

setClipChildren :: Ref GroupBase -> Bool -> IO ()

setNotResizable :: Ref GroupBase -> IO ()

setResizable:: (Parent a WidgetBase) => Ref GroupBase -> Maybe ( Ref a ) -> IO ()

updateChild:: (Parent a WidgetBase) => Ref GroupBase -> Ref a -> IO ()

within:: (Match obj ~ FindOp orig orig (Begin ()), Match obj ~ FindOp orig orig (End ()), Op (Begin ()) obj orig (IO ()), Op (End ()) obj orig (IO ()),) => Ref GroupBase -> IO a -> IO a

Orphan instances

impl ~ (AtIndex -> IO (Maybe (Ref WidgetBase))) => Op (GetChild ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: GetChild () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO [Ref WidgetBase] => Op (GetArray ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: GetArray () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> Ref b -> IO ())) => Op (InsertBefore ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: InsertBefore () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO (Maybe (Ref WidgetBase)) => Op (DdfdesignKludge ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: DdfdesignKludge () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (Focus ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: Focus () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO Bool => Op (ClipChildren ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: ClipChildren () -> orig -> Ref GroupBase -> impl Source #

impl ~ (Bool -> IO ()) => Op (SetClipChildren ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: SetClipChildren () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO Int => Op (Children ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: Children () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (InitSizes ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: InitSizes () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (AddResizable ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: AddResizable () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO (Maybe (Ref WidgetBase)) => Op (GetResizable ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: GetResizable () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (SetNotResizable ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: SetNotResizable () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Maybe (Ref a) -> IO ())) => Op (SetResizable ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: SetResizable () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (Clear ()) GroupBase orig impl Source # 
Instance details

Methods

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

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (RemoveWidget ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: RemoveWidget () -> orig -> Ref GroupBase -> impl Source #

impl ~ (AtIndex -> IO ()) => Op (RemoveIndex ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: RemoveIndex () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> AtIndex -> IO ())) => Op (Insert ()) GroupBase orig impl Source # 
Instance details

Methods

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

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (Add ()) GroupBase orig impl Source # 
Instance details

Methods

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

(Parent a WidgetBase, impl ~ (Ref a -> IO AtIndex)) => Op (Find ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: Find () -> orig -> Ref GroupBase -> impl Source #

(Match obj ~ FindOp orig orig (Begin ()), Match obj ~ FindOp orig orig (End ()), Op (Begin ()) obj orig (IO ()), Op (End ()) obj orig (IO ()), impl ~ (IO a -> IO a)) => Op (Within ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: Within () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (End ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: End () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (Begin ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: Begin () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (UpdateChild ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: UpdateChild () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (DrawOutsideLabel ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: DrawOutsideLabel () -> orig -> Ref GroupBase -> impl Source #

impl ~ IO () => Op (DrawChildren ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: DrawChildren () -> orig -> Ref GroupBase -> impl Source #

(Parent a WidgetBase, impl ~ (Ref a -> IO ())) => Op (DrawChild ()) GroupBase orig impl Source # 
Instance details

Methods

runOp :: DrawChild () -> orig -> Ref GroupBase -> impl Source #

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

Methods

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

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

Methods

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

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

Methods

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