{-# LINE 1 "src/ArrayFire/Internal/Exception.hsc" #-}
{-# LANGUAGE CPP #-}
module ArrayFire.Internal.Exception where

import ArrayFire.Internal.Defines

import Foreign.Ptr
import Foreign.C.Types


foreign import ccall unsafe "af_get_last_error"
    af_get_last_error :: Ptr (Ptr CChar) -> Ptr DimT -> IO ()
foreign import ccall unsafe "af_err_to_string"
    af_err_to_string :: AFErr -> IO (Ptr CChar)