{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.OES.SinglePrecision (
gl_OES_single_precision
, glClearDepthfOES
, glClipPlanefOES
, glDepthRangefOES
, glFrustumfOES
, glGetClipPlanefOES
, glOrthofOES
) where
import Control.Monad.IO.Class
import Data.Set
import Foreign.Ptr
import Graphics.GL.Internal.FFI
import Graphics.GL.Internal.Proc
import Graphics.GL.Types
import System.IO.Unsafe
gl_OES_single_precision :: Bool
gl_OES_single_precision :: Bool
gl_OES_single_precision = String -> Set String -> Bool
forall a. Ord a => a -> Set a -> Bool
member String
"GL_OES_single_precision" Set String
extensions
{-# NOINLINE gl_OES_single_precision #-}
glClearDepthfOES :: MonadIO m => GLclampf -> m ()
glClearDepthfOES :: forall (m :: * -> *). MonadIO m => GLclampf -> m ()
glClearDepthfOES = FunPtr (GLclampf -> IO ()) -> GLclampf -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLclampf -> IO ()) -> GLclampf -> m ()
fficlampfIOV FunPtr (GLclampf -> IO ())
glClearDepthfOESFunPtr
glClearDepthfOESFunPtr :: FunPtr (GLclampf -> IO ())
glClearDepthfOESFunPtr :: FunPtr (GLclampf -> IO ())
glClearDepthfOESFunPtr = IO (FunPtr (GLclampf -> IO ())) -> FunPtr (GLclampf -> IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (GLclampf -> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glClearDepthfOES")
{-# NOINLINE glClearDepthfOESFunPtr #-}
glClipPlanefOES :: MonadIO m => GLenum -> Ptr GLfloat -> m ()
glClipPlanefOES :: forall (m :: * -> *). MonadIO m => GLenum -> Ptr GLclampf -> m ()
glClipPlanefOES = FunPtr (GLenum -> Ptr GLclampf -> IO ())
-> GLenum -> Ptr GLclampf -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLenum -> Ptr GLclampf -> IO ())
-> GLenum -> Ptr GLclampf -> m ()
ffienumPtrfloatIOV FunPtr (GLenum -> Ptr GLclampf -> IO ())
glClipPlanefOESFunPtr
glClipPlanefOESFunPtr :: FunPtr (GLenum -> Ptr GLfloat -> IO ())
glClipPlanefOESFunPtr :: FunPtr (GLenum -> Ptr GLclampf -> IO ())
glClipPlanefOESFunPtr = IO (FunPtr (GLenum -> Ptr GLclampf -> IO ()))
-> FunPtr (GLenum -> Ptr GLclampf -> IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (GLenum -> Ptr GLclampf -> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glClipPlanefOES")
{-# NOINLINE glClipPlanefOESFunPtr #-}
glDepthRangefOES :: MonadIO m => GLclampf -> GLclampf -> m ()
glDepthRangefOES :: forall (m :: * -> *). MonadIO m => GLclampf -> GLclampf -> m ()
glDepthRangefOES = FunPtr (GLclampf -> GLclampf -> IO ())
-> GLclampf -> GLclampf -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLclampf -> GLclampf -> IO ())
-> GLclampf -> GLclampf -> m ()
fficlampfclampfIOV FunPtr (GLclampf -> GLclampf -> IO ())
glDepthRangefOESFunPtr
glDepthRangefOESFunPtr :: FunPtr (GLclampf -> GLclampf -> IO ())
glDepthRangefOESFunPtr :: FunPtr (GLclampf -> GLclampf -> IO ())
glDepthRangefOESFunPtr = IO (FunPtr (GLclampf -> GLclampf -> IO ()))
-> FunPtr (GLclampf -> GLclampf -> IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (GLclampf -> GLclampf -> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glDepthRangefOES")
{-# NOINLINE glDepthRangefOESFunPtr #-}
glFrustumfOES :: MonadIO m => GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> m ()
glFrustumfOES :: forall (m :: * -> *).
MonadIO m =>
GLclampf
-> GLclampf -> GLclampf -> GLclampf -> GLclampf -> GLclampf -> m ()
glFrustumfOES = FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> m ()
ffifloatfloatfloatfloatfloatfloatIOV FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
glFrustumfOESFunPtr
glFrustumfOESFunPtr :: FunPtr (GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> IO ())
glFrustumfOESFunPtr :: FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
glFrustumfOESFunPtr = IO
(FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ()))
-> FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
forall a. IO a -> a
unsafePerformIO (String
-> IO
(FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glFrustumfOES")
{-# NOINLINE glFrustumfOESFunPtr #-}
glGetClipPlanefOES :: MonadIO m => GLenum -> Ptr GLfloat -> m ()
glGetClipPlanefOES :: forall (m :: * -> *). MonadIO m => GLenum -> Ptr GLclampf -> m ()
glGetClipPlanefOES = FunPtr (GLenum -> Ptr GLclampf -> IO ())
-> GLenum -> Ptr GLclampf -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLenum -> Ptr GLclampf -> IO ())
-> GLenum -> Ptr GLclampf -> m ()
ffienumPtrfloatIOV FunPtr (GLenum -> Ptr GLclampf -> IO ())
glGetClipPlanefOESFunPtr
glGetClipPlanefOESFunPtr :: FunPtr (GLenum -> Ptr GLfloat -> IO ())
glGetClipPlanefOESFunPtr :: FunPtr (GLenum -> Ptr GLclampf -> IO ())
glGetClipPlanefOESFunPtr = IO (FunPtr (GLenum -> Ptr GLclampf -> IO ()))
-> FunPtr (GLenum -> Ptr GLclampf -> IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (GLenum -> Ptr GLclampf -> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glGetClipPlanefOES")
{-# NOINLINE glGetClipPlanefOESFunPtr #-}
glOrthofOES :: MonadIO m => GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> m ()
glOrthofOES :: forall (m :: * -> *).
MonadIO m =>
GLclampf
-> GLclampf -> GLclampf -> GLclampf -> GLclampf -> GLclampf -> m ()
glOrthofOES = FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> m ()
ffifloatfloatfloatfloatfloatfloatIOV FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
glOrthofOESFunPtr
glOrthofOESFunPtr :: FunPtr (GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> IO ())
glOrthofOESFunPtr :: FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
glOrthofOESFunPtr = IO
(FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ()))
-> FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ())
forall a. IO a -> a
unsafePerformIO (String
-> IO
(FunPtr
(GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> GLclampf
-> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glOrthofOES")
{-# NOINLINE glOrthofOESFunPtr #-}