-- This file was automatically generated.
{-# LANGUAGE ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Raw.Extension.APPLE.CopyTextureLevels (
  -- * Extension Support
    gl_APPLE_copy_texture_levels

  -- * GL_APPLE_copy_texture_levels
  , glCopyTextureLevelsAPPLE
) 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_APPLE_copy_texture_levels :: Bool
gl_APPLE_copy_texture_levels = member "GL_APPLE_copy_texture_levels" extensions

glCopyTextureLevelsAPPLE :: MonadIO m => GLuint -> GLuint -> GLint -> GLsizei -> m ()
glCopyTextureLevelsAPPLE = ffiuintuintintsizeiIOV glCopyTextureLevelsAPPLEFunPtr

glCopyTextureLevelsAPPLEFunPtr :: FunPtr (GLuint -> GLuint -> GLint -> GLsizei -> IO ())
glCopyTextureLevelsAPPLEFunPtr = unsafePerformIO (getProcAddress "glCopyTextureLevelsAPPLE")

{-# NOINLINE glCopyTextureLevelsAPPLEFunPtr #-}