{-# LANGUAGE EmptyDataDecls, FlexibleContexts, FlexibleInstances, ForeignFunctionInterface, IncoherentInstances, MultiParamTypeClasses, OverlappingInstances, TemplateHaskell, TypeFamilies, TypeSynonymInstances #-} module OGDF.Color.Implementation where import Data.Monoid import Data.Word import Data.Int import Foreign.C import Foreign.Ptr import Language.Haskell.TH import Language.Haskell.TH.Syntax import System.IO.Unsafe import FFICXX.Runtime.Cast import FFICXX.Runtime.CodeGen.Cxx import FFICXX.Runtime.TH import OGDF.Color.RawType import OGDF.Color.FFI import OGDF.Color.Interface import OGDF.Color.Cast import OGDF.Color.RawType import OGDF.Color.Cast import OGDF.Color.Interface import STD.CppString.RawType import STD.CppString.Cast import STD.CppString.Interface import STD.Deletable.RawType import STD.Deletable.Cast import STD.Deletable.Interface instance () => IColor (Color) where instance () => IDeletable (Color) where delete :: Color -> IO () delete = (Ptr RawColor -> IO ()) -> Color -> IO () forall a ca y cy. (Castable a ca, Castable y cy) => (ca -> IO cy) -> a -> IO y xform0 Ptr RawColor -> IO () c_color_delete newColor :: (ICppString c0, FPtr c0) => c0 -> IO Color newColor :: forall c0. (ICppString c0, FPtr c0) => c0 -> IO Color newColor = (Ptr RawCppString -> IO (Ptr RawColor)) -> c0 -> IO Color forall a ca y cy. (Castable a ca, Castable y cy) => (ca -> IO cy) -> a -> IO y xform0 Ptr RawCppString -> IO (Ptr RawColor) c_color_newcolor color_fromString :: (ICppString c0, FPtr c0) => Color -> c0 -> IO CBool color_fromString :: forall c0. (ICppString c0, FPtr c0) => Color -> c0 -> IO CBool color_fromString = (Ptr RawColor -> Ptr RawCppString -> IO CBool) -> Color -> c0 -> IO CBool forall a ca x1 cx1 y cy. (Castable a ca, Castable x1 cx1, Castable y cy) => (ca -> cx1 -> IO cy) -> a -> x1 -> IO y xform1 Ptr RawColor -> Ptr RawCppString -> IO CBool c_color_color_fromstring