-- This file was automatically generated.
{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.GREMEDY.FrameTerminator (
  -- * Extension Support
    gl_GREMEDY_frame_terminator

  -- * GL_GREMEDY_frame_terminator
  , glFrameTerminatorGREMEDY
) where

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

-- | Checks that the <https://cvs.khronos.org/svn/repos/ogl/trunk/doc/registry/public/specs/GREMEDY/frame_terminator.txt GL_GREMEDY_frame_terminator> extension is available.

gl_GREMEDY_frame_terminator :: Bool
gl_GREMEDY_frame_terminator :: Bool
gl_GREMEDY_frame_terminator = String -> Set String -> Bool
forall a. Ord a => a -> Set a -> Bool
member String
"GL_GREMEDY_frame_terminator" Set String
extensions
{-# NOINLINE gl_GREMEDY_frame_terminator #-}

-- | Usage: @'glFrameTerminatorGREMEDY'@


glFrameTerminatorGREMEDY :: MonadIO m => m ()
glFrameTerminatorGREMEDY :: forall (m :: * -> *). MonadIO m => m ()
glFrameTerminatorGREMEDY = FunPtr (IO ()) -> m ()
forall (m :: * -> *). MonadIO m => FunPtr (IO ()) -> m ()
ffiIOV FunPtr (IO ())
glFrameTerminatorGREMEDYFunPtr

glFrameTerminatorGREMEDYFunPtr :: FunPtr (IO ())
glFrameTerminatorGREMEDYFunPtr :: FunPtr (IO ())
glFrameTerminatorGREMEDYFunPtr = IO (FunPtr (IO ())) -> FunPtr (IO ())
forall a. IO a -> a
unsafePerformIO (String -> IO (FunPtr (IO ()))
forall a. String -> IO (FunPtr a)
getProcAddress String
"glFrameTerminatorGREMEDY")

{-# NOINLINE glFrameTerminatorGREMEDYFunPtr #-}