{-# LINE 1 "src/OGDF/Color/FFI.hsc" #-}
{-# LANGUAGE ForeignFunctionInterface, InterruptibleFFI #-}
module OGDF.Color.FFI where
import Data.Word
import Data.Int
import Foreign.C
import Foreign.Ptr
import OGDF.Color.RawType
import OGDF.Color.RawType
import STD.CppString.RawType

foreign import ccall interruptible "OGDFColor.h Color_delete"
               c_color_delete :: Ptr RawColor -> IO ()

foreign import ccall interruptible "OGDFColor.h Color_newColor"
               c_color_newcolor :: Ptr RawCppString -> IO (Ptr RawColor)

foreign import ccall interruptible
               "OGDFColor.h Color_color_fromString" c_color_color_fromstring ::
               Ptr RawColor -> Ptr RawCppString -> IO CBool