Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data MouseMessage
- = MsgMouseMotion {
- msgMMWhen :: Double
- msgMMWindow :: Maybe Window
- msgMMWhich :: MouseDevice
- msgMMState :: [MouseButton]
- msgMMPos :: V2 Int32
- msgMMRelMotion :: V2 Int32
- | MsgMouseButton { }
- | MsgMouseWheel { }
- = MsgMouseMotion {
- data Window
- data MouseDevice
- data MouseButton
- data InputMotion
- data MouseScrollDirection
Documentation
data MouseMessage Source #
MsgMouseMotion | Mouse motion event |
| |
MsgMouseButton | Mouse button event |
| |
MsgMouseWheel | Mouse wheel event |
|
Instances
Show MouseMessage Source # | |
Defined in Affection.MessageBus.Message.MouseMessage showsPrec :: Int -> MouseMessage -> ShowS # show :: MouseMessage -> String # showList :: [MouseMessage] -> ShowS # | |
Message MouseMessage Source # | |
Defined in Affection.MessageBus.Message.MouseMessage msgTime :: MouseMessage -> Double Source # |
SDL reexports
Instances
Eq Window | |
Data Window | |
Defined in SDL.Internal.Types 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 | |
Show Window | |
Generic Window | |
type Rep Window | |
Defined in SDL.Internal.Types |
data MouseDevice #
Identifies what kind of mouse-like device this is.
Instances
data MouseButton #
Instances
data InputMotion #
Instances
data MouseScrollDirection #
Identifies mouse scroll direction.