affection-0.0.0.9: A simple Game Engine using SDL

Safe HaskellNone
LanguageHaskell2010

Affection.MessageBus.Message.MouseMessage

Synopsis

Documentation

data MouseMessage Source #

Constructors

MsgMouseMotion

Mouse motion event

Fields

MsgMouseButton

Mouse button event

Fields

MsgMouseWheel

Mouse wheel 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 MouseDevice #

Identifies what kind of mouse-like device this is.

Instances
Eq MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Data MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Methods

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

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

toConstr :: MouseDevice -> Constr #

dataTypeOf :: MouseDevice -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Read MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Show MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Generic MouseDevice 
Instance details

Defined in SDL.Input.Mouse

Associated Types

type Rep MouseDevice :: * -> * #

FromNumber MouseDevice Word32 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseDevice 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseDevice = D1 (MetaData "MouseDevice" "SDL.Input.Mouse" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" False) (C1 (MetaCons "Mouse" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int)) :+: C1 (MetaCons "Touch" PrefixI False) (U1 :: * -> *))

data MouseButton #

Instances
Eq MouseButton 
Instance details

Defined in SDL.Input.Mouse

Data MouseButton 
Instance details

Defined in SDL.Input.Mouse

Methods

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

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

toConstr :: MouseButton -> Constr #

dataTypeOf :: MouseButton -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord MouseButton 
Instance details

Defined in SDL.Input.Mouse

Read MouseButton 
Instance details

Defined in SDL.Input.Mouse

Show MouseButton 
Instance details

Defined in SDL.Input.Mouse

Generic MouseButton 
Instance details

Defined in SDL.Input.Mouse

Associated Types

type Rep MouseButton :: * -> * #

FromNumber MouseButton Word8 
Instance details

Defined in SDL.Input.Mouse

ToNumber MouseButton Word8 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseButton 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseButton = D1 (MetaData "MouseButton" "SDL.Input.Mouse" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" False) ((C1 (MetaCons "ButtonLeft" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "ButtonMiddle" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ButtonRight" PrefixI False) (U1 :: * -> *))) :+: (C1 (MetaCons "ButtonX1" PrefixI False) (U1 :: * -> *) :+: (C1 (MetaCons "ButtonX2" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ButtonExtra" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedUnpack) (Rec0 Int)))))

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 MouseScrollDirection #

Identifies mouse scroll direction.

Instances
Bounded MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Enum MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Eq MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Data MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Methods

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

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

toConstr :: MouseScrollDirection -> Constr #

dataTypeOf :: MouseScrollDirection -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Read MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Show MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Generic MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

Associated Types

type Rep MouseScrollDirection :: * -> * #

FromNumber MouseScrollDirection Word32 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseScrollDirection 
Instance details

Defined in SDL.Input.Mouse

type Rep MouseScrollDirection = D1 (MetaData "MouseScrollDirection" "SDL.Input.Mouse" "sdl2-2.4.1.0-JfGLkN9ODDEI4y1RAyJJ9B" False) (C1 (MetaCons "ScrollNormal" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "ScrollFlipped" PrefixI False) (U1 :: * -> *))