module Graphics.GL.Ext.SUN.GlobalAlpha (
gl_SUN_global_alpha
, glGlobalAlphaFactorbSUN
, glGlobalAlphaFactordSUN
, glGlobalAlphaFactorfSUN
, glGlobalAlphaFactoriSUN
, glGlobalAlphaFactorsSUN
, glGlobalAlphaFactorubSUN
, glGlobalAlphaFactoruiSUN
, glGlobalAlphaFactorusSUN
, pattern GL_GLOBAL_ALPHA_FACTOR_SUN
, pattern GL_GLOBAL_ALPHA_SUN
) 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_SUN_global_alpha :: Bool
gl_SUN_global_alpha = member "GL_SUN_global_alpha" extensions
glGlobalAlphaFactorbSUN :: MonadIO m => GLbyte -> m ()
glGlobalAlphaFactorbSUN = ffibyteIOV glGlobalAlphaFactorbSUNFunPtr
glGlobalAlphaFactorbSUNFunPtr :: FunPtr (GLbyte -> IO ())
glGlobalAlphaFactorbSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactorbSUN")
glGlobalAlphaFactordSUN :: MonadIO m => GLdouble -> m ()
glGlobalAlphaFactordSUN = ffidoubleIOV glGlobalAlphaFactordSUNFunPtr
glGlobalAlphaFactordSUNFunPtr :: FunPtr (GLdouble -> IO ())
glGlobalAlphaFactordSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactordSUN")
glGlobalAlphaFactorfSUN :: MonadIO m => GLfloat -> m ()
glGlobalAlphaFactorfSUN = ffifloatIOV glGlobalAlphaFactorfSUNFunPtr
glGlobalAlphaFactorfSUNFunPtr :: FunPtr (GLfloat -> IO ())
glGlobalAlphaFactorfSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactorfSUN")
glGlobalAlphaFactoriSUN :: MonadIO m => GLint -> m ()
glGlobalAlphaFactoriSUN = ffiintIOV glGlobalAlphaFactoriSUNFunPtr
glGlobalAlphaFactoriSUNFunPtr :: FunPtr (GLint -> IO ())
glGlobalAlphaFactoriSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactoriSUN")
glGlobalAlphaFactorsSUN :: MonadIO m => GLshort -> m ()
glGlobalAlphaFactorsSUN = ffishortIOV glGlobalAlphaFactorsSUNFunPtr
glGlobalAlphaFactorsSUNFunPtr :: FunPtr (GLshort -> IO ())
glGlobalAlphaFactorsSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactorsSUN")
glGlobalAlphaFactorubSUN :: MonadIO m => GLubyte -> m ()
glGlobalAlphaFactorubSUN = ffiubyteIOV glGlobalAlphaFactorubSUNFunPtr
glGlobalAlphaFactorubSUNFunPtr :: FunPtr (GLubyte -> IO ())
glGlobalAlphaFactorubSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactorubSUN")
glGlobalAlphaFactoruiSUN :: MonadIO m => GLuint -> m ()
glGlobalAlphaFactoruiSUN = ffiuintIOV glGlobalAlphaFactoruiSUNFunPtr
glGlobalAlphaFactoruiSUNFunPtr :: FunPtr (GLuint -> IO ())
glGlobalAlphaFactoruiSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactoruiSUN")
glGlobalAlphaFactorusSUN :: MonadIO m => GLushort -> m ()
glGlobalAlphaFactorusSUN = ffiushortIOV glGlobalAlphaFactorusSUNFunPtr
glGlobalAlphaFactorusSUNFunPtr :: FunPtr (GLushort -> IO ())
glGlobalAlphaFactorusSUNFunPtr = unsafePerformIO (getProcAddress "glGlobalAlphaFactorusSUN")
pattern GL_GLOBAL_ALPHA_FACTOR_SUN = 0x81DA
pattern GL_GLOBAL_ALPHA_SUN = 0x81D9