-- This file was automatically generated.
{-# LANGUAGE ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Raw.Extension.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.Raw.Internal.FFI
import Graphics.GL.Raw.Internal.Proc
import System.IO.Unsafe

gl_GREMEDY_frame_terminator :: Bool
gl_GREMEDY_frame_terminator = member "GL_GREMEDY_frame_terminator" extensions

glFrameTerminatorGREMEDY :: MonadIO m => m ()
glFrameTerminatorGREMEDY = ffiIOV glFrameTerminatorGREMEDYFunPtr

glFrameTerminatorGREMEDYFunPtr :: FunPtr (IO ())
glFrameTerminatorGREMEDYFunPtr = unsafePerformIO (getProcAddress "glFrameTerminatorGREMEDY")

{-# NOINLINE glFrameTerminatorGREMEDYFunPtr #-}