fltkhs-0.3.0.1: FLTK bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.UI.FLTK.LowLevel.Fl_Types

Contents

Synopsis

Documentation

newtype MenuItemFlags

Constructors

MenuItemFlags [MenuItemFlag] 

Instances

data GLUTproc

Constructors

GLUTproc (FunPtr (IO ())) 

Instances

newtype GLUTIdleFunction

Constructors

GLUTIdleFunction (FunPtr (IO ())) 

newtype GLUTMenuStatusFunction

Constructors

GLUTMenuStatusFunction (FunPtr (CInt -> CInt -> CInt -> IO ())) 

type FlColor = CUInt

type FlFont = CInt

type FlAlign = CUInt

type Delta = Maybe Int

type ID = Ptr ()

data Ref a

Constructors

Ref !(ForeignPtr (Ptr ())) 

Instances

Eq (Ref a) 
Show (Ref a) 

data FunRef

Constructors

FunRef !(FunPtr ()) 

The FLTK widget hierarchy

type Base = CBase ()

type GlobalCallback = IO ()

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

type CallbackPrim = Ptr () -> IO ()

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

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

type DrawCallback = String -> Position -> IO ()

type DrawCallbackPrim = CString -> CInt -> CInt -> CInt -> IO ()

type TextBufferCallback = FunPtr (Ptr () -> IO ())

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

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

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

type TextModifyCb = Int -> Int -> Int -> Int -> String -> IO ()

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

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

type UnfinishedStyleCbPrim = CInt -> Ptr () -> IO ()

newtype Width

Constructors

Width Int 

Instances

newtype Height

Constructors

Height Int 

Instances

newtype Depth

Constructors

Depth Int 

Instances

newtype LineSize

Constructors

LineSize Int 

Instances

newtype X

Constructors

X Int 

Instances

Eq X 
Show X 

newtype Y

Constructors

Y Int 

Instances

Eq Y 
Show Y 

newtype ByX

Constructors

ByX Double 

Instances

newtype ByY

Constructors

ByY Double 

Instances

newtype Angle

Constructors

Angle CShort 

Instances

data Position

Constructors

Position X Y 

Instances

data CountDirection

Constructors

CountUp 
CountDown 

Instances

data DPI

Constructors

DPI Float Float 

Instances

newtype BufferOffset

Constructors

BufferOffset Int 

Instances

data Rectangle

Constructors

Rectangle Position Size 

data ByXY

Constructors

ByXY ByX ByY 

Instances

data Intersection

Constructors

Contained 
Partial 

Instances

data Size

Constructors

Size Width Height 

Instances

newtype Between0And1

Constructors

Between0And1 Double 

Instances

newtype Between0And6

Constructors

Between0And6 Double 

Instances

newtype FontSize

Constructors

FontSize CInt 

Instances

newtype PixmapHs

Constructors

PixmapHs [String] 

Instances

data BitmapHs

Constructors

BitmapHs ByteString Size 

Instances

data UnknownError

Constructors

UnknownError 

Instances

data NotFound

Constructors

NotFound 

Instances

data OutOfRange

Constructors

OutOfRange 

Instances

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

data NoChange

Constructors

NoChange 

Instances

toSize :: (Int, Int) -> Size

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

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

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

isNull :: Ref a -> IO Bool

unsafeRefToPtr :: Ref a -> IO (Ptr ())

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

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

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