{-# LINE 1 "LLVM/FFI/Support.hsc" #-}
{-# LANGUAGE CPP, ForeignFunctionInterface #-}
{-# LINE 2 "LLVM/FFI/Support.hsc" #-}

module LLVM.FFI.Support
    (
      createStandardModulePasses
    , createStandardFunctionPasses
    ) where


{-# LINE 10 "LLVM/FFI/Support.hsc" #-}
import Foreign.C.Types (CInt(..), CUInt(..))

{-# LINE 14 "LLVM/FFI/Support.hsc" #-}
import LLVM.FFI.Core (PassManagerRef)

foreign import ccall unsafe "LLVMCreateStandardFunctionPasses" createStandardFunctionPasses
    :: PassManagerRef -> CUInt -> IO ()

foreign import ccall unsafe "LLVMCreateStandardModulePasses" createStandardModulePasses
    :: PassManagerRef -> CUInt -> CInt -> CInt -> CInt -> CInt -> CInt -> CInt -> IO ()