{-# LANGUAGE
ForeignFunctionInterface,
MultiParamTypeClasses,
UndecidableInstances
#-}
module LLVM.Internal.FFI.GlobalAlias where
import LLVM.Prelude
import Foreign.Ptr
import LLVM.Internal.FFI.PtrHierarchy
foreign import ccall unsafe "LLVMIsAGlobalAlias" isAGlobalAlias ::
Ptr Value -> IO (Ptr GlobalAlias)
foreign import ccall unsafe "LLVM_Hs_GetAliasee" getAliasee ::
Ptr GlobalAlias -> IO (Ptr Constant)
foreign import ccall unsafe "LLVM_Hs_SetAliasee" setAliasee ::
Ptr GlobalAlias -> Ptr Constant -> IO ()