{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.SGIX.IglooInterface (
gl_SGIX_igloo_interface
, glIglooInterfaceSGIX
) 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_SGIX_igloo_interface :: Bool
gl_SGIX_igloo_interface :: Bool
gl_SGIX_igloo_interface = String -> Set String -> Bool
forall a. Ord a => a -> Set a -> Bool
member String
"GL_SGIX_igloo_interface" Set String
extensions
{-# NOINLINE gl_SGIX_igloo_interface #-}
glIglooInterfaceSGIX :: MonadIO m => GLenum -> Ptr () -> m ()
glIglooInterfaceSGIX :: forall (m :: * -> *). MonadIO m => GLenum -> Ptr () -> m ()
glIglooInterfaceSGIX = FunPtr (GLenum -> Ptr () -> IO ()) -> GLenum -> Ptr () -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLenum -> Ptr () -> IO ()) -> GLenum -> Ptr () -> m ()
ffienumPtrVIOV FunPtr (GLenum -> Ptr () -> IO ())
glIglooInterfaceSGIXFunPtr
glIglooInterfaceSGIXFunPtr :: FunPtr (GLenum -> Ptr () -> IO ())
glIglooInterfaceSGIXFunPtr :: FunPtr (GLenum -> Ptr () -> IO ())
glIglooInterfaceSGIXFunPtr = IO (FunPtr (GLenum -> Ptr () -> IO ()))
-> FunPtr (GLenum -> Ptr () -> IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (GLenum -> Ptr () -> IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glIglooInterfaceSGIX")
{-# NOINLINE glIglooInterfaceSGIXFunPtr #-}