{-# LINE 1 "src/Graphics/ImageMagick/MagickCore/Types/FFI/AlphaChannelType.hsc" #-}
{-# LANGUAGE CPP                      #-}
{-# LINE 2 "src/Graphics/ImageMagick/MagickCore/Types/FFI/AlphaChannelType.hsc" #-}
{-# LANGUAGE ForeignFunctionInterface #-}
module Graphics.ImageMagick.MagickCore.Types.FFI.AlphaChannelType
    where

import           Foreign.C.Types

{-# LINE 8 "src/Graphics/ImageMagick/MagickCore/Types/FFI/AlphaChannelType.hsc" #-}
newtype AlphaChannelType = AlphaChannelType { unAlphaChannelType :: CInt }
  deriving (Eq, Show)

undefinedAlphaChannel  :: AlphaChannelType
undefinedAlphaChannel  = AlphaChannelType 0
activateAlphaChannel  :: AlphaChannelType
activateAlphaChannel  = AlphaChannelType 1
backgroundAlphaChannel  :: AlphaChannelType
backgroundAlphaChannel  = AlphaChannelType 2
copyAlphaChannel  :: AlphaChannelType
copyAlphaChannel  = AlphaChannelType 3
deactivateAlphaChannel  :: AlphaChannelType
deactivateAlphaChannel  = AlphaChannelType 4
extractAlphaChannel  :: AlphaChannelType
extractAlphaChannel  = AlphaChannelType 5
opaqueAlphaChannel  :: AlphaChannelType
opaqueAlphaChannel  = AlphaChannelType 6
resetAlphaChannel  :: AlphaChannelType
resetAlphaChannel  = AlphaChannelType 7
setAlphaChannel  :: AlphaChannelType
setAlphaChannel  = AlphaChannelType 8
shapeAlphaChannel  :: AlphaChannelType
shapeAlphaChannel  = AlphaChannelType 9
transparentAlphaChannel  :: AlphaChannelType
transparentAlphaChannel  = AlphaChannelType 10
lattenAlphaChannel  :: AlphaChannelType
lattenAlphaChannel  = AlphaChannelType 11
removeAlphaChannel  :: AlphaChannelType
removeAlphaChannel  = AlphaChannelType 12

{-# LINE 26 "src/Graphics/ImageMagick/MagickCore/Types/FFI/AlphaChannelType.hsc" #-}