Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Graphics.UI.SDL.Types
Contents
- type AudioCallback = FunPtr (Ptr () -> Ptr Word8 -> CInt -> IO ())
- type AudioDeviceID = Word32
- type AudioFormat = Word16
- type Cond = Ptr ()
- type Cursor = Ptr ()
- type EventFilter = FunPtr (Ptr () -> Ptr Event -> IO CInt)
- type FingerID = Int64
- type GameController = Ptr ()
- type GestureID = Int64
- type GLContext = Ptr ()
- type Haptic = Ptr ()
- type HintCallback = FunPtr (Ptr () -> CString -> CString -> CString -> IO ())
- type Joystick = Ptr ()
- type JoystickID = Int32
- type Keycode = Int32
- type LogOutputFunction = FunPtr (Ptr () -> CInt -> LogPriority -> CString -> IO ())
- type Mutex = Ptr ()
- type Renderer = Ptr ()
- type Sem = Ptr ()
- type SpinLock = CInt
- type SysWMinfo = Ptr ()
- type SysWMmsg = Ptr ()
- type Texture = Ptr ()
- type Thread = Ptr ()
- type ThreadFunction = FunPtr (Ptr () -> IO CInt)
- type ThreadID = CULong
- type TimerCallback = FunPtr (Word32 -> Ptr () -> IO Word32)
- type TimerID = CInt
- type TLSID = CUInt
- type TouchID = Int64
- type Window = Ptr ()
- data Atomic = Atomic {
- atomicValue :: CInt
- data AudioCVT = AudioCVT {}
- data AudioSpec = AudioSpec {}
- data Color = Color {}
- data DisplayMode = DisplayMode {}
- data Event
- = WindowEvent { }
- | KeyboardEvent { }
- | TextEditingEvent { }
- | TextInputEvent { }
- | MouseMotionEvent { }
- | MouseButtonEvent { }
- | MouseWheelEvent { }
- | JoyAxisEvent { }
- | JoyBallEvent { }
- | JoyHatEvent { }
- | JoyButtonEvent { }
- | JoyDeviceEvent { }
- | ControllerAxisEvent { }
- | ControllerButtonEvent { }
- | ControllerDeviceEvent { }
- | QuitEvent { }
- | UserEvent {
- eventType :: Word32
- eventTimestamp :: Word32
- userEventWindowID :: Word32
- userEventCode :: Int32
- userEventData1 :: Ptr ()
- userEventData2 :: Ptr ()
- | SysWMEvent { }
- | TouchFingerEvent { }
- | MultiGestureEvent { }
- | DollarGestureEvent { }
- | DropEvent { }
- | ClipboardUpdateEvent { }
- | UnknownEvent { }
- data Finger = Finger {}
- data GameControllerButtonBind
- data HapticDirection = HapticDirection {}
- data HapticEffect
- = HapticConstant {
- hapticEffectType :: Word16
- hapticConstantDirection :: HapticDirection
- hapticConstantLength :: Word32
- hapticConstantDelay :: Word16
- hapticConstantButton :: Word16
- hapticConstantInterval :: Word16
- hapticConstantLevel :: Int16
- hapticConstantAttackLength :: Word16
- hapticConstantAttackLevel :: Word16
- hapticConstantFadeLength :: Word16
- hapticConstantFadeLevel :: Word16
- | HapticPeriodic {
- hapticEffectType :: Word16
- hapticPeriodicDirection :: HapticDirection
- hapticPeriodicLength :: Word32
- hapticPeriodicDelay :: Word16
- hapticPeriodicButton :: Word16
- hapticPeriodicInterval :: Word16
- hapticPeriodicPeriod :: Word16
- hapticPeriodicMagnitude :: Int16
- hapticPeriodicOffset :: Int16
- hapticPeriodicPhase :: Word16
- hapticPeriodicAttackLength :: Word16
- hapticPeriodicAttackLevel :: Word16
- hapticPeriodicFadeLength :: Word16
- hapticPeriodicFadeLevel :: Word16
- | HapticCondition {
- hapticEffectType :: Word16
- hapticConditionLength :: Word32
- hapticConditionDelay :: Word16
- hapticConditionButton :: Word16
- hapticConditionInterval :: Word16
- hapticConditionRightSat :: [Word16]
- hapticConditionLeftSat :: [Word16]
- hapticConditionRightCoeff :: [Int16]
- hapticConditionLeftCoeff :: [Int16]
- hapticConditionDeadband :: [Word16]
- hapticConditionCenter :: [Int16]
- | HapticRamp {
- hapticEffectType :: Word16
- hapticRampDirection :: HapticDirection
- hapticRampLength :: Word32
- hapticRampDelay :: Word16
- hapticRampButton :: Word16
- hapticRampInterval :: Word16
- hapticRampStart :: Int16
- hapticRampEnd :: Int16
- hapticRampAttackLength :: Word16
- hapticRampAttackLevel :: Word16
- hapticRampFadeLength :: Word16
- hapticRampFadeLevel :: Word16
- | HapticLeftRight { }
- | HapticCustom {
- hapticEffectType :: Word16
- hapticCustomDirection :: HapticDirection
- hapticCustomLength :: Word32
- hapticCustomDelay :: Word16
- hapticCustomButton :: Word16
- hapticCustomInterval :: Word16
- hapticCustomChannels :: Word8
- hapticCustomPeriod :: Word16
- hapticCustomSamples :: Word16
- hapticCustomData :: Ptr Word16
- hapticCustomAttackLength :: Word16
- hapticCustomAttackLevel :: Word16
- hapticCustomFadeLength :: Word16
- hapticCustomFadeLevel :: Word16
- = HapticConstant {
- data JoystickGUID = JoystickGUID {
- joystickGUID :: [Word8]
- data Keysym = Keysym {}
- data MessageBoxButtonData = MessageBoxButtonData {}
- data MessageBoxColor = MessageBoxColor {}
- data MessageBoxColorScheme = MessageBoxColorScheme {}
- data MessageBoxData = MessageBoxData {}
- data Palette = Palette {}
- data PixelFormat = PixelFormat {}
- data Point = Point {}
- data Rect = Rect {}
- data RendererInfo = RendererInfo {}
- data RWops = RWops {
- rwopsSize :: FunPtr (Ptr RWops -> IO Int64)
- rwopsSeek :: FunPtr (Ptr RWops -> Int64 -> CInt -> IO Int64)
- rwopsRead :: FunPtr (Ptr RWops -> Ptr () -> CSize -> CSize -> IO CSize)
- rwopsWrite :: FunPtr (Ptr RWops -> Ptr () -> CSize -> CSize -> IO CSize)
- rwopsClose :: FunPtr (Ptr RWops -> IO CInt)
- rwopsType :: Word32
- data Surface = Surface {
- surfaceFormat :: Ptr PixelFormat
- surfaceW :: CInt
- surfaceH :: CInt
- surfacePixels :: Ptr ()
- surfaceUserdata :: Ptr ()
- surfaceClipRect :: Rect
- surfaceRefcount :: CInt
- data Version = Version {}
Type Aliases
type AudioDeviceID = Word32
type AudioFormat = Word16
type GameController = Ptr ()
type JoystickID = Int32
type LogOutputFunction = FunPtr (Ptr () -> CInt -> LogPriority -> CString -> IO ())
type ThreadFunction = FunPtr (Ptr () -> IO CInt)
Data Structures
data Atomic
Constructors
Atomic | |
Fields
|
data Color
data DisplayMode
Constructors
DisplayMode | |
Fields
|
Instances
data Event
Constructors
WindowEvent | |
Fields | |
KeyboardEvent | |
Fields | |
TextEditingEvent | |
Fields | |
TextInputEvent | |
Fields | |
MouseMotionEvent | |
MouseButtonEvent | |
MouseWheelEvent | |
Fields | |
JoyAxisEvent | |
Fields | |
JoyBallEvent | |
Fields | |
JoyHatEvent | |
Fields | |
JoyButtonEvent | |
Fields | |
JoyDeviceEvent | |
Fields | |
ControllerAxisEvent | |
ControllerButtonEvent | |
ControllerDeviceEvent | |
Fields | |
QuitEvent | |
Fields
| |
UserEvent | |
Fields
| |
SysWMEvent | |
Fields
| |
TouchFingerEvent | |
MultiGestureEvent | |
DollarGestureEvent | |
DropEvent | |
Fields
| |
ClipboardUpdateEvent | |
Fields
| |
UnknownEvent | |
Fields
|
data HapticDirection
Constructors
HapticDirection | |
Fields |
data HapticEffect
Constructors
Instances
data MessageBoxButtonData
Constructors
MessageBoxButtonData | |
data MessageBoxColor
Constructors
MessageBoxColor | |
Fields |
Constructors
MessageBoxColorScheme | |
data Palette
Constructors
Palette | |
Fields
|
data Point
data Rect
data RWops
Constructors
RWops | |
Fields
|
data Surface
Constructors
Surface | |
Fields
|
data Version
Constructors
Version | |
Fields
|