affection-0.0.0.9: A simple Game Engine using SDL

Safe HaskellNone
LanguageHaskell2010

Affection.MessageBus.Message.KeyboardMessage

Synopsis

Documentation

data KeyboardMessage Source #

Dataatype for handling all keyboard events haded down from SDL2

Constructors

MsgKeyboardEvent

Arbitrary Keyboard 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)))

data InputMotion #

Instances
Bounded InputMotion 
Instance details

Defined in SDL.Event

Enum InputMotion 
Instance details

Defined in SDL.Event

Eq InputMotion 
Instance details

Defined in SDL.Event

Data InputMotion 
Instance details

Defined in SDL.Event

Methods

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

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

toConstr :: InputMotion -> Constr #

dataTypeOf :: InputMotion -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord InputMotion 
Instance details

Defined in SDL.Event

Read InputMotion 
Instance details

Defined in SDL.Event

Show InputMotion 
Instance details

Defined in SDL.Event

Generic InputMotion 
Instance details

Defined in SDL.Event

Associated Types

type Rep InputMotion :: * -> * #

type Rep InputMotion 
Instance details

Defined in SDL.Event

type Rep InputMotion = D1 (MetaData "InputMotion" "SDL.Event" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" False) (C1 (MetaCons "Released" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "Pressed" PrefixI False) (U1 :: * -> *))

data Keysym #

Information about a key press or key release event.

Instances
Eq Keysym 
Instance details

Defined in SDL.Input.Keyboard

Methods

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

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

Data Keysym 
Instance details

Defined in SDL.Input.Keyboard

Methods

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

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

toConstr :: Keysym -> Constr #

dataTypeOf :: Keysym -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Keysym 
Instance details

Defined in SDL.Input.Keyboard

Read Keysym 
Instance details

Defined in SDL.Input.Keyboard

Show Keysym 
Instance details

Defined in SDL.Input.Keyboard

Generic Keysym 
Instance details

Defined in SDL.Input.Keyboard

Associated Types

type Rep Keysym :: * -> * #

Methods

from :: Keysym -> Rep Keysym x #

to :: Rep Keysym x -> Keysym #

type Rep Keysym 
Instance details

Defined in SDL.Input.Keyboard

type Rep Keysym = D1 (MetaData "Keysym" "SDL.Input.Keyboard" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" False) (C1 (MetaCons "Keysym" PrefixI True) (S1 (MetaSel (Just "keysymScancode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Scancode) :*: (S1 (MetaSel (Just "keysymKeycode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Keycode) :*: S1 (MetaSel (Just "keysymModifier") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 KeyModifier))))