-- This file was automatically generated.
{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.SGIS.FogFunction (
  -- * Extension Support
    gl_SGIS_fog_function

  -- * GL_SGIS_fog_function
  , glFogFuncSGIS
  , glGetFogFuncSGIS
  , pattern GL_FOG_FUNC_POINTS_SGIS
  , pattern GL_FOG_FUNC_SGIS
  , pattern GL_MAX_FOG_FUNC_POINTS_SGIS
) 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

-- | Checks that the GL_SGIS_fog_function extension is available.

gl_SGIS_fog_function :: Bool
gl_SGIS_fog_function :: Bool
gl_SGIS_fog_function = [Char] -> Set [Char] -> Bool
forall a. Ord a => a -> Set a -> Bool
member "GL_SGIS_fog_function" Set [Char]
extensions
{-# NOINLINE gl_SGIS_fog_function #-}

-- | Usage: @'glFogFuncSGIS' n points@
--
-- The length of @points@ should be @n*2@.


glFogFuncSGIS :: MonadIO m => GLsizei -> Ptr GLfloat -> m ()
glFogFuncSGIS :: GLsizei -> Ptr GLfloat -> m ()
glFogFuncSGIS = FunPtr (GLsizei -> Ptr GLfloat -> IO ())
-> GLsizei -> Ptr GLfloat -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (GLsizei -> Ptr GLfloat -> IO ())
-> GLsizei -> Ptr GLfloat -> m ()
ffisizeiPtrfloatIOV FunPtr (GLsizei -> Ptr GLfloat -> IO ())
glFogFuncSGISFunPtr

glFogFuncSGISFunPtr :: FunPtr (GLsizei -> Ptr GLfloat -> IO ())
glFogFuncSGISFunPtr :: FunPtr (GLsizei -> Ptr GLfloat -> IO ())
glFogFuncSGISFunPtr = IO (FunPtr (GLsizei -> Ptr GLfloat -> IO ()))
-> FunPtr (GLsizei -> Ptr GLfloat -> IO ())
forall a. IO a -> a
unsafePerformIO ([Char] -> IO (FunPtr (GLsizei -> Ptr GLfloat -> IO ()))
forall a. [Char] -> IO (FunPtr a)
getProcAddress "glFogFuncSGIS")

{-# NOINLINE glFogFuncSGISFunPtr #-}

-- | Usage: @'glGetFogFuncSGIS' points@
--
-- The length of @points@ should be @COMPSIZE()@.


glGetFogFuncSGIS :: MonadIO m => Ptr GLfloat -> m ()
glGetFogFuncSGIS :: Ptr GLfloat -> m ()
glGetFogFuncSGIS = FunPtr (Ptr GLfloat -> IO ()) -> Ptr GLfloat -> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr (Ptr GLfloat -> IO ()) -> Ptr GLfloat -> m ()
ffiPtrfloatIOV FunPtr (Ptr GLfloat -> IO ())
glGetFogFuncSGISFunPtr

glGetFogFuncSGISFunPtr :: FunPtr (Ptr GLfloat -> IO ())
glGetFogFuncSGISFunPtr :: FunPtr (Ptr GLfloat -> IO ())
glGetFogFuncSGISFunPtr = IO (FunPtr (Ptr GLfloat -> IO ())) -> FunPtr (Ptr GLfloat -> IO ())
forall a. IO a -> a
unsafePerformIO ([Char] -> IO (FunPtr (Ptr GLfloat -> IO ()))
forall a. [Char] -> IO (FunPtr a)
getProcAddress "glGetFogFuncSGIS")

{-# NOINLINE glGetFogFuncSGISFunPtr #-}

pattern $bGL_FOG_FUNC_POINTS_SGIS :: a
$mGL_FOG_FUNC_POINTS_SGIS :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_FOG_FUNC_POINTS_SGIS = 0x812B

pattern $bGL_FOG_FUNC_SGIS :: a
$mGL_FOG_FUNC_SGIS :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_FOG_FUNC_SGIS = 0x812A

pattern $bGL_MAX_FOG_FUNC_POINTS_SGIS :: a
$mGL_MAX_FOG_FUNC_POINTS_SGIS :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_MAX_FOG_FUNC_POINTS_SGIS = 0x812C