fltkhs-0.2.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

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 TextModifyCb = Int -> Int -> Int -> Int -> String -> 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 [String] 

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