Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
Instances
Data Window | |
Defined in Graphics.UI.GLFW.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 :: forall r r'. (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 # | |
Generic Window | |
Show Window | |
Eq Window | |
Ord Window | |
type Rep Window | |
Defined in Graphics.UI.GLFW.Types type Rep Window = D1 ('MetaData "Window" "Graphics.UI.GLFW.Types" "GLFW-b-3.3.0.0-7f7f9fc75c14f672eb4b66ff738bd73279d4b8e9403ce112e015cfc3c20e5cac" 'True) (C1 ('MetaCons "Window" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWindow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ptr C'GLFWwindow)))) |
allocate :: (MonadUnliftIO m, MonadReader env m, HasLogFunc env, MonadResource m) => Bool -> Natural -> SizePicker -> Text -> m ([InstanceRequirement], Window) Source #
createWindow :: (MonadIO m, MonadReader env m, HasLogFunc env) => Bool -> Natural -> SizePicker -> Text -> m ([InstanceRequirement], Window) Source #
destroyWindow :: (MonadIO m, MonadReader env m, HasLogFunc env) => Window -> m () Source #
type SizePicker = NonEmpty (Monitor, VideoMode) -> (Monitor, VideoMode) Source #
data SurfaceKHR #
Instances
allocateSurface :: MonadResource m => Window -> Instance -> m (ReleaseKey, SurfaceKHR) Source #
createSurface :: MonadIO m => Window -> Instance -> m SurfaceKHR Source #
getExtent2D :: Window -> IO Extent2D Source #
Instances
Exception GLFWError Source # | |
Defined in Engine.Setup.Window toException :: GLFWError -> SomeException # fromException :: SomeException -> Maybe GLFWError # displayException :: GLFWError -> String # | |
Show GLFWError Source # | |
Eq GLFWError Source # | |
Ord GLFWError Source # | |
Defined in Engine.Setup.Window |
Instances
Data Error | |
Defined in Graphics.UI.GLFW.Types gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Error -> c Error # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Error # dataTypeOf :: Error -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Error) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Error) # gmapT :: (forall b. Data b => b -> b) -> Error -> Error # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Error -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Error -> r # gmapQ :: (forall d. Data d => d -> u) -> Error -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Error -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Error -> m Error # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Error -> m Error # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Error -> m Error # | |
Bounded Error | |
Enum Error | |
Defined in Graphics.UI.GLFW.Types | |
Generic Error | |
Read Error | |
Show Error | |
NFData Error | |
Defined in Graphics.UI.GLFW.Types | |
Eq Error | |
Ord Error | |
type Rep Error | |
Defined in Graphics.UI.GLFW.Types type Rep Error = D1 ('MetaData "Error" "Graphics.UI.GLFW.Types" "GLFW-b-3.3.0.0-7f7f9fc75c14f672eb4b66ff738bd73279d4b8e9403ce112e015cfc3c20e5cac" 'False) (((C1 ('MetaCons "Error'NotInitialized" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'NoCurrentContext" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Error'InvalidEnum" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'InvalidValue" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Error'OutOfMemory" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'ApiUnavailable" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Error'VersionUnavailable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Error'PlatformError" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'FormatUnavailable" 'PrefixI 'False) (U1 :: Type -> Type))))) |