netwire-input-glfw-0.0.7: GLFW instance of netwire-input

Copyright(c) Pavel Krajcevski 2017
LicenseMIT
MaintainerKrajcevski@gmail.com
Stabilityexperimental
PortabilityPOSIX
Safe HaskellNone
LanguageHaskell2010

FRP.Netwire.Input.GLFW

Contents

Description

This module contains data types with instances needed to create wires that can be used with the netwire-input combinators. In particular, this package implements GLFWInputT which has instances of MonadKeyboard and MonadMouse

Synopsis

GLFW Input

Basic Input Monad

type GLFWInput = GLFWInputT Identity Source #

The GLFWInput monad is simply the GLFWInputT transformer around the identity monad.

Monad Transformer

data GLFWInputT m a Source #

The GLFWInputT monad transformer is simply a state monad transformer using GLFWInputState

Instances

MonadTrans GLFWInputT Source # 

Methods

lift :: Monad m => m a -> GLFWInputT m a #

MonadWriter w m => MonadWriter w (GLFWInputT m) Source # 

Methods

writer :: (a, w) -> GLFWInputT m a #

tell :: w -> GLFWInputT m () #

listen :: GLFWInputT m a -> GLFWInputT m (a, w) #

pass :: GLFWInputT m (a, w -> w) -> GLFWInputT m a #

MonadState s m => MonadState s (GLFWInputT m) Source # 

Methods

get :: GLFWInputT m s #

put :: s -> GLFWInputT m () #

state :: (s -> (a, s)) -> GLFWInputT m a #

MonadReader r m => MonadReader r (GLFWInputT m) Source # 

Methods

ask :: GLFWInputT m r #

local :: (r -> r) -> GLFWInputT m a -> GLFWInputT m a #

reader :: (r -> a) -> GLFWInputT m a #

MonadError e m => MonadError e (GLFWInputT m) Source # 

Methods

throwError :: e -> GLFWInputT m a #

catchError :: GLFWInputT m a -> (e -> GLFWInputT m a) -> GLFWInputT m a #

Monad m => MonadMouse MouseButton (GLFWInputT m) Source # 
Monad m => MonadKeyboard Key (GLFWInputT m) Source # 
Monad m => Monad (GLFWInputT m) Source # 

Methods

(>>=) :: GLFWInputT m a -> (a -> GLFWInputT m b) -> GLFWInputT m b #

(>>) :: GLFWInputT m a -> GLFWInputT m b -> GLFWInputT m b #

return :: a -> GLFWInputT m a #

fail :: String -> GLFWInputT m a #

Functor m => Functor (GLFWInputT m) Source # 

Methods

fmap :: (a -> b) -> GLFWInputT m a -> GLFWInputT m b #

(<$) :: a -> GLFWInputT m b -> GLFWInputT m a #

MonadFix m => MonadFix (GLFWInputT m) Source # 

Methods

mfix :: (a -> GLFWInputT m a) -> GLFWInputT m a #

Monad m => Applicative (GLFWInputT m) Source # 

Methods

pure :: a -> GLFWInputT m a #

(<*>) :: GLFWInputT m (a -> b) -> GLFWInputT m a -> GLFWInputT m b #

liftA2 :: (a -> b -> c) -> GLFWInputT m a -> GLFWInputT m b -> GLFWInputT m c #

(*>) :: GLFWInputT m a -> GLFWInputT m b -> GLFWInputT m b #

(<*) :: GLFWInputT m a -> GLFWInputT m b -> GLFWInputT m a #

MonadIO m => MonadIO (GLFWInputT m) Source # 

Methods

liftIO :: IO a -> GLFWInputT m a #

MonadPlus m => Alternative (GLFWInputT m) Source # 

Methods

empty :: GLFWInputT m a #

(<|>) :: GLFWInputT m a -> GLFWInputT m a -> GLFWInputT m a #

some :: GLFWInputT m a -> GLFWInputT m [a] #

many :: GLFWInputT m a -> GLFWInputT m [a] #

MonadPlus m => MonadPlus (GLFWInputT m) Source # 

Methods

mzero :: GLFWInputT m a #

mplus :: GLFWInputT m a -> GLFWInputT m a -> GLFWInputT m a #

MonadCont m => MonadCont (GLFWInputT m) Source # 

Methods

callCC :: ((a -> GLFWInputT m b) -> GLFWInputT m a) -> GLFWInputT m a #

runGLFWInputT :: GLFWInputT m a -> GLFWInputState -> m (a, GLFWInputState) Source #

To execute a computation with the current input snapshot, we need to give supply the current GLFWInputState. This comes from the GLFWInputControl associated with the given window.

State Types

data GLFWInputControl Source #

This is an STM variable that holds the current input state. It cannot be manipulated directly, but it is updated by GLFW each time pollGLFW is called.

data GLFWInputState Source #

The GLFW input state is a record that keeps track of which buttons and keys are currently pressed. Because GLFW works with callbacks, a call to pollEvents must be made in order to process any of the events. At this time, all of the appropriate callbacks are fired in order of the events received, and this record is updated to reflect the most recent input state.

getInput :: GLFWInputControl -> IO GLFWInputState Source #

Returns a current snapshot of the input

mkInputControl :: Window -> IO GLFWInputControl Source #

Creates and returns an STM variable for the window that holds all of the most recent input state information

pollGLFW :: GLFWInputState -> GLFWInputControl -> IO GLFWInputState Source #

Allows GLFW to interact with the windowing system to update the current state. The old state must be passed in order to properly reset certain properties such as the scroll wheel. The returned input state is identical to a subsequent call to getInput right after a call to pollEvents

Orphan instances