Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- type VkGetInstanceProcAddrFunc = VkInstance -> CString -> IO (FunPtr ())
- type AudioCallback = FunPtr (Ptr () -> Ptr Word8 -> CInt -> IO ())
- type EventFilter = FunPtr (Ptr () -> Ptr Event -> IO CInt)
- type HintCallback = FunPtr (Ptr () -> CString -> CString -> CString -> IO ())
- type LogOutputFunction = FunPtr (Ptr () -> CInt -> LogPriority -> CString -> IO ())
- type ThreadFunction = FunPtr (Ptr () -> IO CInt)
- type TimerCallback = FunPtr (Word32 -> Ptr () -> IO Word32)
- mkAudioCallback :: (Ptr () -> Ptr Word8 -> CInt -> IO ()) -> IO AudioCallback
- mkEventFilter :: (Ptr () -> Ptr Event -> IO CInt) -> IO EventFilter
- mkHintCallback :: (Ptr () -> CString -> CString -> CString -> IO ()) -> IO HintCallback
- mkLogOutputFunction :: (Ptr () -> CInt -> LogPriority -> CString -> IO ()) -> IO LogOutputFunction
- mkThreadFunction :: (Ptr () -> IO CInt) -> IO ThreadFunction
- mkTimerCallback :: (Word32 -> Ptr () -> IO Word32) -> IO TimerCallback
- type AudioDeviceID = Word32
- type AudioFormat = Word16
- type Cond = Ptr ()
- type Cursor = Ptr ()
- type FingerID = Int64
- type GameController = Ptr ()
- type GestureID = Int64
- type GLContext = Ptr ()
- type Haptic = Ptr ()
- type Joystick = Ptr ()
- type JoystickID = Int32
- 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 ThreadID = CULong
- type TimerID = CInt
- type TLSID = CUInt
- type TouchID = Int64
- type VkInstance = Ptr ()
- type VkSurfaceKHR = Word64
- type Window = Ptr ()
- data Atomic = Atomic {
- atomicValue :: !CInt
- data AudioCVT = AudioCVT {
- audioCVTNeeded :: !CInt
- audioCVTSrcFormat :: !AudioFormat
- audioCVTDstFormat :: !AudioFormat
- audioCVTRateIncr :: !CDouble
- audioCVTBuf :: !(Ptr Word8)
- audioCVTLen :: !CInt
- audioCVTLenCvt :: !CInt
- audioCVTLenMult :: !CInt
- audioCVTLenRatio :: !CDouble
- data AudioSpec = AudioSpec {
- audioSpecFreq :: !CInt
- audioSpecFormat :: !AudioFormat
- audioSpecChannels :: !Word8
- audioSpecSilence :: !Word8
- audioSpecSamples :: !Word16
- audioSpecSize :: !Word32
- audioSpecCallback :: !AudioCallback
- audioSpecUserdata :: !(Ptr ())
- data Color = Color {}
- data DisplayMode = DisplayMode {
- displayModeFormat :: !Word32
- displayModeW :: !CInt
- displayModeH :: !CInt
- displayModeRefreshRate :: !CInt
- displayModeDriverData :: !(Ptr ())
- data Event
- = WindowEvent { }
- | KeyboardEvent { }
- | TextEditingEvent { }
- | TextInputEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- textInputEventWindowID :: !Word32
- textInputEventText :: ![CChar]
- | KeymapChangedEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- | MouseMotionEvent { }
- | MouseButtonEvent { }
- | MouseWheelEvent { }
- | JoyAxisEvent { }
- | JoyBallEvent { }
- | JoyHatEvent { }
- | JoyButtonEvent { }
- | JoyDeviceEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- joyDeviceEventWhich :: !Int32
- | ControllerAxisEvent { }
- | ControllerButtonEvent { }
- | ControllerDeviceEvent { }
- | AudioDeviceEvent { }
- | QuitEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- | UserEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- userEventWindowID :: !Word32
- userEventCode :: !Int32
- userEventData1 :: !(Ptr ())
- userEventData2 :: !(Ptr ())
- | SysWMEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- sysWMEventMsg :: !SysWMmsg
- | TouchFingerEvent { }
- | MultiGestureEvent { }
- | DollarGestureEvent { }
- | DropEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- dropEventFile :: !CString
- | ClipboardUpdateEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- | UnknownEvent {
- eventType :: !Word32
- eventTimestamp :: !Word32
- 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 {
- keysymScancode :: !Scancode
- keysymKeycode :: !Keycode
- keysymMod :: !Word16
- data MessageBoxButtonData = MessageBoxButtonData {}
- data MessageBoxColor = MessageBoxColor {}
- data MessageBoxColorScheme = MessageBoxColorScheme {}
- data MessageBoxData = MessageBoxData {}
- data Palette = Palette {
- paletteNColors :: !CInt
- paletteColors :: !(Ptr Color)
- data PixelFormat = PixelFormat {}
- data Point = Point {}
- data Rect = Rect {}
- data FPoint = FPoint {}
- data FRect = FRect {}
- data Vertex = Vertex {
- vertexPosition :: !FPoint
- vertexColor :: !Color
- vertexTexCoord :: !FPoint
- 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 {
- versionMajor :: !Word8
- versionMinor :: !Word8
- versionPatch :: !Word8
Type Aliases
Function Types
type VkGetInstanceProcAddrFunc = VkInstance -> CString -> IO (FunPtr ()) Source #
type LogOutputFunction = FunPtr (Ptr () -> CInt -> LogPriority -> CString -> IO ()) Source #
mkAudioCallback :: (Ptr () -> Ptr Word8 -> CInt -> IO ()) -> IO AudioCallback Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
mkEventFilter :: (Ptr () -> Ptr Event -> IO CInt) -> IO EventFilter Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
mkHintCallback :: (Ptr () -> CString -> CString -> CString -> IO ()) -> IO HintCallback Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
mkLogOutputFunction :: (Ptr () -> CInt -> LogPriority -> CString -> IO ()) -> IO LogOutputFunction Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
mkThreadFunction :: (Ptr () -> IO CInt) -> IO ThreadFunction Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
mkTimerCallback :: (Word32 -> Ptr () -> IO Word32) -> IO TimerCallback Source #
The storage associated with the resulting FunPtr
has to be released with
freeHaskellFunPtr
when it is no longer required.
Common Types
type AudioDeviceID = Word32 Source #
type AudioFormat = Word16 Source #
type GameController = Ptr () Source #
type JoystickID = Int32 Source #
type VkInstance = Ptr () Source #
type VkSurfaceKHR = Word64 Source #
Data Structures
Atomic | |
|
Instances
Storable Atomic Source # | |
Defined in SDL.Raw.Types sizeOf :: Atomic -> Int Source # alignment :: Atomic -> Int Source # peekElemOff :: Ptr Atomic -> Int -> IO Atomic Source # pokeElemOff :: Ptr Atomic -> Int -> Atomic -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Atomic Source # pokeByteOff :: Ptr b -> Int -> Atomic -> IO () Source # | |
Show Atomic Source # | |
Eq Atomic Source # | |
AudioCVT | |
|
Instances
Storable AudioCVT Source # | |
Defined in SDL.Raw.Types sizeOf :: AudioCVT -> Int Source # alignment :: AudioCVT -> Int Source # peekElemOff :: Ptr AudioCVT -> Int -> IO AudioCVT Source # pokeElemOff :: Ptr AudioCVT -> Int -> AudioCVT -> IO () Source # peekByteOff :: Ptr b -> Int -> IO AudioCVT Source # pokeByteOff :: Ptr b -> Int -> AudioCVT -> IO () Source # | |
Show AudioCVT Source # | |
Eq AudioCVT Source # | |
AudioSpec | |
|
Instances
Storable AudioSpec Source # | |
Defined in SDL.Raw.Types sizeOf :: AudioSpec -> Int Source # alignment :: AudioSpec -> Int Source # peekElemOff :: Ptr AudioSpec -> Int -> IO AudioSpec Source # pokeElemOff :: Ptr AudioSpec -> Int -> AudioSpec -> IO () Source # peekByteOff :: Ptr b -> Int -> IO AudioSpec Source # pokeByteOff :: Ptr b -> Int -> AudioSpec -> IO () Source # | |
Show AudioSpec Source # | |
Eq AudioSpec Source # | |
Instances
Storable Color Source # | |
Defined in SDL.Raw.Types sizeOf :: Color -> Int Source # alignment :: Color -> Int Source # peekElemOff :: Ptr Color -> Int -> IO Color Source # pokeElemOff :: Ptr Color -> Int -> Color -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Color Source # pokeByteOff :: Ptr b -> Int -> Color -> IO () Source # | |
Show Color Source # | |
Eq Color Source # | |
data DisplayMode Source #
DisplayMode | |
|
Instances
Storable DisplayMode Source # | |
Defined in SDL.Raw.Types sizeOf :: DisplayMode -> Int Source # alignment :: DisplayMode -> Int Source # peekElemOff :: Ptr DisplayMode -> Int -> IO DisplayMode Source # pokeElemOff :: Ptr DisplayMode -> Int -> DisplayMode -> IO () Source # peekByteOff :: Ptr b -> Int -> IO DisplayMode Source # pokeByteOff :: Ptr b -> Int -> DisplayMode -> IO () Source # peek :: Ptr DisplayMode -> IO DisplayMode Source # poke :: Ptr DisplayMode -> DisplayMode -> IO () Source # | |
Show DisplayMode Source # | |
Defined in SDL.Raw.Types | |
Eq DisplayMode Source # | |
Defined in SDL.Raw.Types (==) :: DisplayMode -> DisplayMode -> Bool Source # (/=) :: DisplayMode -> DisplayMode -> Bool Source # |
Instances
Storable Event Source # | |
Defined in SDL.Raw.Types sizeOf :: Event -> Int Source # alignment :: Event -> Int Source # peekElemOff :: Ptr Event -> Int -> IO Event Source # pokeElemOff :: Ptr Event -> Int -> Event -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Event Source # pokeByteOff :: Ptr b -> Int -> Event -> IO () Source # | |
Show Event Source # | |
Eq Event Source # | |
Instances
Storable Finger Source # | |
Defined in SDL.Raw.Types sizeOf :: Finger -> Int Source # alignment :: Finger -> Int Source # peekElemOff :: Ptr Finger -> Int -> IO Finger Source # pokeElemOff :: Ptr Finger -> Int -> Finger -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Finger Source # pokeByteOff :: Ptr b -> Int -> Finger -> IO () Source # | |
Show Finger Source # | |
Eq Finger Source # | |
data GameControllerButtonBind Source #
GameControllerButtonBindNone | |
GameControllerButtonBindButton | |
GameControllerButtonBindAxis | |
GameControllerButtonBindHat | |
Instances
Storable GameControllerButtonBind Source # | |
Defined in SDL.Raw.Types sizeOf :: GameControllerButtonBind -> Int Source # alignment :: GameControllerButtonBind -> Int Source # peekElemOff :: Ptr GameControllerButtonBind -> Int -> IO GameControllerButtonBind Source # pokeElemOff :: Ptr GameControllerButtonBind -> Int -> GameControllerButtonBind -> IO () Source # peekByteOff :: Ptr b -> Int -> IO GameControllerButtonBind Source # pokeByteOff :: Ptr b -> Int -> GameControllerButtonBind -> IO () Source # peek :: Ptr GameControllerButtonBind -> IO GameControllerButtonBind Source # poke :: Ptr GameControllerButtonBind -> GameControllerButtonBind -> IO () Source # | |
Show GameControllerButtonBind Source # | |
Defined in SDL.Raw.Types | |
Eq GameControllerButtonBind Source # | |
Defined in SDL.Raw.Types |
data HapticDirection Source #
HapticDirection | |
|
Instances
Storable HapticDirection Source # | |
Defined in SDL.Raw.Types sizeOf :: HapticDirection -> Int Source # alignment :: HapticDirection -> Int Source # peekElemOff :: Ptr HapticDirection -> Int -> IO HapticDirection Source # pokeElemOff :: Ptr HapticDirection -> Int -> HapticDirection -> IO () Source # peekByteOff :: Ptr b -> Int -> IO HapticDirection Source # pokeByteOff :: Ptr b -> Int -> HapticDirection -> IO () Source # peek :: Ptr HapticDirection -> IO HapticDirection Source # poke :: Ptr HapticDirection -> HapticDirection -> IO () Source # | |
Show HapticDirection Source # | |
Defined in SDL.Raw.Types | |
Eq HapticDirection Source # | |
Defined in SDL.Raw.Types (==) :: HapticDirection -> HapticDirection -> Bool Source # (/=) :: HapticDirection -> HapticDirection -> Bool Source # |
data HapticEffect Source #
Instances
Storable HapticEffect Source # | |
Defined in SDL.Raw.Types sizeOf :: HapticEffect -> Int Source # alignment :: HapticEffect -> Int Source # peekElemOff :: Ptr HapticEffect -> Int -> IO HapticEffect Source # pokeElemOff :: Ptr HapticEffect -> Int -> HapticEffect -> IO () Source # peekByteOff :: Ptr b -> Int -> IO HapticEffect Source # pokeByteOff :: Ptr b -> Int -> HapticEffect -> IO () Source # peek :: Ptr HapticEffect -> IO HapticEffect Source # poke :: Ptr HapticEffect -> HapticEffect -> IO () Source # | |
Show HapticEffect Source # | |
Defined in SDL.Raw.Types | |
Eq HapticEffect Source # | |
Defined in SDL.Raw.Types (==) :: HapticEffect -> HapticEffect -> Bool Source # (/=) :: HapticEffect -> HapticEffect -> Bool Source # |
data JoystickGUID Source #
JoystickGUID | |
|
Instances
Storable JoystickGUID Source # | |
Defined in SDL.Raw.Types sizeOf :: JoystickGUID -> Int Source # alignment :: JoystickGUID -> Int Source # peekElemOff :: Ptr JoystickGUID -> Int -> IO JoystickGUID Source # pokeElemOff :: Ptr JoystickGUID -> Int -> JoystickGUID -> IO () Source # peekByteOff :: Ptr b -> Int -> IO JoystickGUID Source # pokeByteOff :: Ptr b -> Int -> JoystickGUID -> IO () Source # peek :: Ptr JoystickGUID -> IO JoystickGUID Source # poke :: Ptr JoystickGUID -> JoystickGUID -> IO () Source # | |
Show JoystickGUID Source # | |
Defined in SDL.Raw.Types | |
Eq JoystickGUID Source # | |
Defined in SDL.Raw.Types (==) :: JoystickGUID -> JoystickGUID -> Bool Source # (/=) :: JoystickGUID -> JoystickGUID -> Bool Source # |
Keysym | |
|
Instances
Storable Keysym Source # | |
Defined in SDL.Raw.Types sizeOf :: Keysym -> Int Source # alignment :: Keysym -> Int Source # peekElemOff :: Ptr Keysym -> Int -> IO Keysym Source # pokeElemOff :: Ptr Keysym -> Int -> Keysym -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Keysym Source # pokeByteOff :: Ptr b -> Int -> Keysym -> IO () Source # | |
Show Keysym Source # | |
Eq Keysym Source # | |
data MessageBoxButtonData Source #
Instances
Storable MessageBoxButtonData Source # | |
Defined in SDL.Raw.Types sizeOf :: MessageBoxButtonData -> Int Source # alignment :: MessageBoxButtonData -> Int Source # peekElemOff :: Ptr MessageBoxButtonData -> Int -> IO MessageBoxButtonData Source # pokeElemOff :: Ptr MessageBoxButtonData -> Int -> MessageBoxButtonData -> IO () Source # peekByteOff :: Ptr b -> Int -> IO MessageBoxButtonData Source # pokeByteOff :: Ptr b -> Int -> MessageBoxButtonData -> IO () Source # peek :: Ptr MessageBoxButtonData -> IO MessageBoxButtonData Source # poke :: Ptr MessageBoxButtonData -> MessageBoxButtonData -> IO () Source # | |
Show MessageBoxButtonData Source # | |
Defined in SDL.Raw.Types | |
Eq MessageBoxButtonData Source # | |
Defined in SDL.Raw.Types (==) :: MessageBoxButtonData -> MessageBoxButtonData -> Bool Source # (/=) :: MessageBoxButtonData -> MessageBoxButtonData -> Bool Source # |
data MessageBoxColor Source #
Instances
Storable MessageBoxColor Source # | |
Defined in SDL.Raw.Types sizeOf :: MessageBoxColor -> Int Source # alignment :: MessageBoxColor -> Int Source # peekElemOff :: Ptr MessageBoxColor -> Int -> IO MessageBoxColor Source # pokeElemOff :: Ptr MessageBoxColor -> Int -> MessageBoxColor -> IO () Source # peekByteOff :: Ptr b -> Int -> IO MessageBoxColor Source # pokeByteOff :: Ptr b -> Int -> MessageBoxColor -> IO () Source # peek :: Ptr MessageBoxColor -> IO MessageBoxColor Source # poke :: Ptr MessageBoxColor -> MessageBoxColor -> IO () Source # | |
Show MessageBoxColor Source # | |
Defined in SDL.Raw.Types | |
Eq MessageBoxColor Source # | |
Defined in SDL.Raw.Types (==) :: MessageBoxColor -> MessageBoxColor -> Bool Source # (/=) :: MessageBoxColor -> MessageBoxColor -> Bool Source # |
data MessageBoxColorScheme Source #
Instances
Storable MessageBoxColorScheme Source # | |
Defined in SDL.Raw.Types sizeOf :: MessageBoxColorScheme -> Int Source # alignment :: MessageBoxColorScheme -> Int Source # peekElemOff :: Ptr MessageBoxColorScheme -> Int -> IO MessageBoxColorScheme Source # pokeElemOff :: Ptr MessageBoxColorScheme -> Int -> MessageBoxColorScheme -> IO () Source # peekByteOff :: Ptr b -> Int -> IO MessageBoxColorScheme Source # pokeByteOff :: Ptr b -> Int -> MessageBoxColorScheme -> IO () Source # peek :: Ptr MessageBoxColorScheme -> IO MessageBoxColorScheme Source # poke :: Ptr MessageBoxColorScheme -> MessageBoxColorScheme -> IO () Source # | |
Show MessageBoxColorScheme Source # | |
Defined in SDL.Raw.Types | |
Eq MessageBoxColorScheme Source # | |
Defined in SDL.Raw.Types |
data MessageBoxData Source #
Instances
Storable MessageBoxData Source # | |
Defined in SDL.Raw.Types sizeOf :: MessageBoxData -> Int Source # alignment :: MessageBoxData -> Int Source # peekElemOff :: Ptr MessageBoxData -> Int -> IO MessageBoxData Source # pokeElemOff :: Ptr MessageBoxData -> Int -> MessageBoxData -> IO () Source # peekByteOff :: Ptr b -> Int -> IO MessageBoxData Source # pokeByteOff :: Ptr b -> Int -> MessageBoxData -> IO () Source # peek :: Ptr MessageBoxData -> IO MessageBoxData Source # poke :: Ptr MessageBoxData -> MessageBoxData -> IO () Source # | |
Show MessageBoxData Source # | |
Defined in SDL.Raw.Types | |
Eq MessageBoxData Source # | |
Defined in SDL.Raw.Types (==) :: MessageBoxData -> MessageBoxData -> Bool Source # (/=) :: MessageBoxData -> MessageBoxData -> Bool Source # |
Palette | |
|
Instances
Storable Palette Source # | |
Defined in SDL.Raw.Types sizeOf :: Palette -> Int Source # alignment :: Palette -> Int Source # peekElemOff :: Ptr Palette -> Int -> IO Palette Source # pokeElemOff :: Ptr Palette -> Int -> Palette -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Palette Source # pokeByteOff :: Ptr b -> Int -> Palette -> IO () Source # | |
Show Palette Source # | |
Eq Palette Source # | |
data PixelFormat Source #
Instances
Storable PixelFormat Source # | |
Defined in SDL.Raw.Types sizeOf :: PixelFormat -> Int Source # alignment :: PixelFormat -> Int Source # peekElemOff :: Ptr PixelFormat -> Int -> IO PixelFormat Source # pokeElemOff :: Ptr PixelFormat -> Int -> PixelFormat -> IO () Source # peekByteOff :: Ptr b -> Int -> IO PixelFormat Source # pokeByteOff :: Ptr b -> Int -> PixelFormat -> IO () Source # peek :: Ptr PixelFormat -> IO PixelFormat Source # poke :: Ptr PixelFormat -> PixelFormat -> IO () Source # | |
Show PixelFormat Source # | |
Defined in SDL.Raw.Types | |
Eq PixelFormat Source # | |
Defined in SDL.Raw.Types (==) :: PixelFormat -> PixelFormat -> Bool Source # (/=) :: PixelFormat -> PixelFormat -> Bool Source # |
Instances
Storable Point Source # | |
Defined in SDL.Raw.Types sizeOf :: Point -> Int Source # alignment :: Point -> Int Source # peekElemOff :: Ptr Point -> Int -> IO Point Source # pokeElemOff :: Ptr Point -> Int -> Point -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Point Source # pokeByteOff :: Ptr b -> Int -> Point -> IO () Source # | |
Show Point Source # | |
Eq Point Source # | |
Instances
Storable Rect Source # | |
Defined in SDL.Raw.Types sizeOf :: Rect -> Int Source # alignment :: Rect -> Int Source # peekElemOff :: Ptr Rect -> Int -> IO Rect Source # pokeElemOff :: Ptr Rect -> Int -> Rect -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Rect Source # pokeByteOff :: Ptr b -> Int -> Rect -> IO () Source # | |
Show Rect Source # | |
Eq Rect Source # | |
Instances
Storable FPoint Source # | |
Defined in SDL.Raw.Types sizeOf :: FPoint -> Int Source # alignment :: FPoint -> Int Source # peekElemOff :: Ptr FPoint -> Int -> IO FPoint Source # pokeElemOff :: Ptr FPoint -> Int -> FPoint -> IO () Source # peekByteOff :: Ptr b -> Int -> IO FPoint Source # pokeByteOff :: Ptr b -> Int -> FPoint -> IO () Source # | |
Show FPoint Source # | |
Eq FPoint Source # | |
Instances
Storable FRect Source # | |
Defined in SDL.Raw.Types sizeOf :: FRect -> Int Source # alignment :: FRect -> Int Source # peekElemOff :: Ptr FRect -> Int -> IO FRect Source # pokeElemOff :: Ptr FRect -> Int -> FRect -> IO () Source # peekByteOff :: Ptr b -> Int -> IO FRect Source # pokeByteOff :: Ptr b -> Int -> FRect -> IO () Source # | |
Show FRect Source # | |
Eq FRect Source # | |
Vertex | |
|
Instances
Storable Vertex Source # | |
Defined in SDL.Raw.Types sizeOf :: Vertex -> Int Source # alignment :: Vertex -> Int Source # peekElemOff :: Ptr Vertex -> Int -> IO Vertex Source # pokeElemOff :: Ptr Vertex -> Int -> Vertex -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Vertex Source # pokeByteOff :: Ptr b -> Int -> Vertex -> IO () Source # | |
Show Vertex Source # | |
Eq Vertex Source # | |
data RendererInfo Source #
Instances
Storable RendererInfo Source # | |
Defined in SDL.Raw.Types sizeOf :: RendererInfo -> Int Source # alignment :: RendererInfo -> Int Source # peekElemOff :: Ptr RendererInfo -> Int -> IO RendererInfo Source # pokeElemOff :: Ptr RendererInfo -> Int -> RendererInfo -> IO () Source # peekByteOff :: Ptr b -> Int -> IO RendererInfo Source # pokeByteOff :: Ptr b -> Int -> RendererInfo -> IO () Source # peek :: Ptr RendererInfo -> IO RendererInfo Source # poke :: Ptr RendererInfo -> RendererInfo -> IO () Source # | |
Show RendererInfo Source # | |
Defined in SDL.Raw.Types | |
Eq RendererInfo Source # | |
Defined in SDL.Raw.Types (==) :: RendererInfo -> RendererInfo -> Bool Source # (/=) :: RendererInfo -> RendererInfo -> Bool Source # |
RWops | |
|
Instances
Storable RWops Source # | |
Defined in SDL.Raw.Types sizeOf :: RWops -> Int Source # alignment :: RWops -> Int Source # peekElemOff :: Ptr RWops -> Int -> IO RWops Source # pokeElemOff :: Ptr RWops -> Int -> RWops -> IO () Source # peekByteOff :: Ptr b -> Int -> IO RWops Source # pokeByteOff :: Ptr b -> Int -> RWops -> IO () Source # | |
Show RWops Source # | |
Eq RWops Source # | |
Surface | |
|
Instances
Storable Surface Source # | |
Defined in SDL.Raw.Types sizeOf :: Surface -> Int Source # alignment :: Surface -> Int Source # peekElemOff :: Ptr Surface -> Int -> IO Surface Source # pokeElemOff :: Ptr Surface -> Int -> Surface -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Surface Source # pokeByteOff :: Ptr b -> Int -> Surface -> IO () Source # | |
Show Surface Source # | |
Eq Surface Source # | |
Version | |
|
Instances
Storable Version Source # | |
Defined in SDL.Raw.Types sizeOf :: Version -> Int Source # alignment :: Version -> Int Source # peekElemOff :: Ptr Version -> Int -> IO Version Source # pokeElemOff :: Ptr Version -> Int -> Version -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Version Source # pokeByteOff :: Ptr b -> Int -> Version -> IO () Source # | |
Show Version Source # | |
Eq Version Source # | |