-- This file was automatically generated.
{-# LANGUAGE ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Raw.Extension.SGIX.IglooInterface (
  -- * Extension Support
    gl_SGIX_igloo_interface

  -- * GL_SGIX_igloo_interface
  , glIglooInterfaceSGIX
) where

import Control.Monad.IO.Class
import Data.Set
import Foreign.Ptr
import Graphics.GL.Raw.Internal.FFI
import Graphics.GL.Raw.Internal.Proc
import Graphics.GL.Raw.Types
import System.IO.Unsafe

gl_SGIX_igloo_interface :: Bool
gl_SGIX_igloo_interface = member "GL_SGIX_igloo_interface" extensions

glIglooInterfaceSGIX :: MonadIO m => GLenum -> Ptr () -> m ()
glIglooInterfaceSGIX = ffienumPtrVIOV glIglooInterfaceSGIXFunPtr

glIglooInterfaceSGIXFunPtr :: FunPtr (GLenum -> Ptr () -> IO ())
glIglooInterfaceSGIXFunPtr = unsafePerformIO (getProcAddress "glIglooInterfaceSGIX")

{-# NOINLINE glIglooInterfaceSGIXFunPtr #-}