fltkhs-0.5.0.0: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.Fl_Types

Contents

Synopsis

Documentation

data GLUTproc Source

Constructors

GLUTproc (FunPtr (IO ())) 

Instances

newtype GLUTIdleFunction Source

Constructors

GLUTIdleFunction (FunPtr (IO ())) 

type ID = Ptr () Source

data Ref a Source

Constructors

Ref !(ForeignPtr (Ptr ())) 

Instances

Eq (Ref a) Source 
Show (Ref a) Source 

data FunRef Source

Constructors

FunRef !(FunPtr ()) 

The FLTK widget hierarchy

data CBase parent Source

Instances

type Functions Base = () Source 
type Functions FileInput Source 
type Functions PNMImage = () Source 
type Functions PNGImage = () Source 
type Functions XPMImage = () Source 
type Functions XBMImage = () Source 
type Functions GIFImage = () Source 
type Functions BMPImage = () Source 
type Functions JPEGImage = () Source 
type Functions RGBImage Source 
type Functions FileBrowser Source 
type Functions ColorChooser Source 
type Functions Spinner Source 
type Functions Tabs Source 
type Functions Scrolled Source 
type Functions Pack Source 
type Functions Tile Source 
type Functions NativeFileChooser Source 
type Functions TextEditor Source 
type Functions TextDisplay Source 
type Functions TextBuffer Source 
type Functions TextSelection Source 
type Functions Tree Source 
type Functions TreeItem Source 
type Functions TreePrefs Source 
type Functions Clock Source 
type Functions IntInput = () Source 
type Functions SelectBrowser = () Source 
type Functions Browser Source 
type Functions Box = () Source 
type Functions GlWindow Source 
type Functions TableRow Source 
type Functions Table Source 
type Functions Wizard Source 
type Functions Positioner Source 
type Functions Progress Source 
type Functions ValueTimer = () Source 
type Functions HiddenTimer = () Source 
type Functions Timer Source 
type Functions ValueOutput Source 
type Functions ValueInput Source 
type Functions Output Source 
type Functions Input Source 
type Functions HorValueSlider = () Source 
type Functions ValueSlider Source 
type Functions Scrollbar Source 
type Functions SimpleCounter = () Source 
type Functions Counter Source 
type Functions Roller Source 
type Functions LineDial = () Source 
type Functions FillDial = () Source 
type Functions Dial Source 
type Functions Adjuster Source 
type Functions ImageSurface Source 
type Functions CopySurface Source 
type Functions Pixmap Source 
type Functions Bitmap Source 
type Functions Image Source 
type Functions MenuButton Source 
type Functions Choice Source 
type Functions SysMenuBar Source 
type Functions MenuBar Source 
type Functions MenuPrim Source 
type Functions MenuItem Source 
type Functions HorNiceSlider = () Source 
type Functions NiceSlider = () Source 
type Functions HorFillSlider = () Source 
type Functions HorSlider = () Source 
type Functions FillSlider = () Source 
type Functions Slider Source 
type Functions Valuator Source 
type Functions ToggleButton Source 
type Functions RepeatButton Source 
type Functions RoundButton Source 
type Functions ReturnButton Source 
type Functions CheckButton Source 
type Functions RadioLightButton = () Source 
type Functions LightButton Source 
type Functions Button Source 
type Functions OverlayWindow Source 
type Functions DoubleWindow Source 
type Functions SingleWindow Source 
type Functions Window Source 
type Functions Group Source 
type Functions Widget = WidgetFuncs Source 
type Functions GlContext = () Source 
type Functions Region = () Source 

type Base = CBase () Source

type CallbackWithUserDataPrim = Ptr () -> Ptr () -> IO () Source

type CallbackPrim = Ptr () -> IO () Source

type ImageDrawCallbackPrim = Ptr () -> CInt -> CInt -> CInt -> CInt -> CInt -> CInt -> IO () Source

type ImageCopyCallbackPrim = Ptr () -> CInt -> CInt -> IO (Ptr ()) Source

type FileChooserCallback = FunPtr (Ptr () -> Ptr () -> IO ()) Source

type BoxDrawF = Rectangle -> Color -> IO () Source

type BoxDrawFPrim = CInt -> CInt -> CInt -> CInt -> FlColor -> IO () Source

type FDHandlerPrim = CInt -> Ptr () -> IO () Source

type FDHandler = CInt -> IO () Source

type TextModifyCb = Int -> Int -> Int -> Int -> Text -> IO () Source

type TextModifyCbPrim = CInt -> CInt -> CInt -> CInt -> Ptr CChar -> Ptr () -> IO () Source

type TextPredeleteCbPrim = CInt -> CInt -> Ptr () -> IO () Source

newtype Width Source

Constructors

Width Int 

newtype Height Source

Constructors

Height Int 

newtype Depth Source

Constructors

Depth Int 

Instances

newtype LineSize Source

Constructors

LineSize Int 

Instances

newtype X Source

Constructors

X Int 

Instances

newtype Y Source

Constructors

Y Int 

Instances

newtype ByX Source

Constructors

ByX Double 

Instances

newtype ByY Source

Constructors

ByY Double 

Instances

newtype Angle Source

Constructors

Angle CShort 

Instances

data Position Source

Constructors

Position X Y 

data DPI Source

Constructors

DPI Float Float 

Instances

newtype BufferOffset Source

Constructors

BufferOffset Int 

data ByXY Source

Constructors

ByXY ByX ByY 

Instances

data Size Source

Constructors

Size Width Height 

newtype FontSize Source

Constructors

FontSize CInt 

Instances

newtype PixmapHs Source

Constructors

PixmapHs [Text] 

Instances

data NotFound Source

Constructors

NotFound 

Instances

data OutOfRange Source

Constructors

OutOfRange 

successOrOutOfRange :: a -> Bool -> (a -> IO b) -> IO (Either OutOfRange b) Source

data NoChange Source

Constructors

NoChange 

Instances

withForeignPtrs :: [ForeignPtr a] -> ([Ptr a] -> IO c) -> IO c Source

toRefPtr :: (?loc :: CallStack) => Ptr (Ptr a) -> IO (Ptr a) Source

withRef :: (?loc :: CallStack) => Ref a -> (Ptr b -> IO c) -> IO c Source

withRefs :: [Ref a] -> (Ptr (Ptr b) -> IO c) -> IO c Source

withMaybeRef :: Maybe (Ref a) -> (Ptr () -> IO c) -> IO c Source

swapRef :: Ref a -> (Ptr b -> IO (Ptr ())) -> IO () Source