affection-0.0.0.9: A simple Game Engine using SDL

Safe HaskellNone
LanguageHaskell2010

Affection.MessageBus.Message.WindowMessage

Synopsis

Documentation

data WindowMessage Source #

Datatype for handling Window events handed down rom SDL2

Constructors

MsgWindowShow

Window show event

Fields

MsgWindowHide

Window hide event

Fields

MsgWindowExpose

Window expose event

Fields

MsgWindowMove

Window move event

Fields

MsgWindowResize

Window resize event

Fields

MsgWindowSizeChange

Window size change event

Fields

MsgWindowMinimize

Window minimize event

Fields

MsgWindowMaximize

Window maximize event

Fields

MsgWindowRestore

Window restore event

Fields

MsgWindowGainMouseFocus

Window gain mouse focus event

Fields

MsgWindowLoseMouseFocus

Window lose mouse focus event

Fields

MsgWindowGainKeyboardFocus

Window gain keyboard focus event

Fields

MsgWindowLoseKeyboardFocus

Window lose keyboard focus event

Fields

MsgWindowClose

Window close event

Fields

SDL reexports

data Window #

Instances
Eq Window 
Instance details

Defined in SDL.Internal.Types

Methods

(==) :: Window -> Window -> Bool #

(/=) :: Window -> Window -> Bool #

Data Window 
Instance details

Defined in SDL.Internal.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Window -> c Window #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Window #

toConstr :: Window -> Constr #

dataTypeOf :: Window -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Window) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Window) #

gmapT :: (forall b. Data b => b -> b) -> Window -> Window #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Window -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Window -> r #

gmapQ :: (forall d. Data d => d -> u) -> Window -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Window -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Window -> m Window #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Window -> m Window #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Window -> m Window #

Ord Window 
Instance details

Defined in SDL.Internal.Types

Show Window 
Instance details

Defined in SDL.Internal.Types

Generic Window 
Instance details

Defined in SDL.Internal.Types

Associated Types

type Rep Window :: * -> * #

Methods

from :: Window -> Rep Window x #

to :: Rep Window x -> Window #

type Rep Window 
Instance details

Defined in SDL.Internal.Types

type Rep Window = D1 (MetaData "Window" "SDL.Internal.Types" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" True) (C1 (MetaCons "Window" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Window)))