{-# LANGUAGE ForeignFunctionInterface, TypeFamilies,
  MultiParamTypeClasses, FlexibleInstances, TypeSynonymInstances,
  EmptyDataDecls, ExistentialQuantification, ScopedTypeVariables #-}
module HROOT.Graf.TLine.RawType where
import Foreign.Ptr
import FFICXX.Runtime.Cast

data RawTLine

newtype TLine = TLine (Ptr RawTLine)
                  deriving (TLine -> TLine -> Bool
(TLine -> TLine -> Bool) -> (TLine -> TLine -> Bool) -> Eq TLine
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TLine -> TLine -> Bool
== :: TLine -> TLine -> Bool
$c/= :: TLine -> TLine -> Bool
/= :: TLine -> TLine -> Bool
Eq, Eq TLine
Eq TLine
-> (TLine -> TLine -> Ordering)
-> (TLine -> TLine -> Bool)
-> (TLine -> TLine -> Bool)
-> (TLine -> TLine -> Bool)
-> (TLine -> TLine -> Bool)
-> (TLine -> TLine -> TLine)
-> (TLine -> TLine -> TLine)
-> Ord TLine
TLine -> TLine -> Bool
TLine -> TLine -> Ordering
TLine -> TLine -> TLine
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: TLine -> TLine -> Ordering
compare :: TLine -> TLine -> Ordering
$c< :: TLine -> TLine -> Bool
< :: TLine -> TLine -> Bool
$c<= :: TLine -> TLine -> Bool
<= :: TLine -> TLine -> Bool
$c> :: TLine -> TLine -> Bool
> :: TLine -> TLine -> Bool
$c>= :: TLine -> TLine -> Bool
>= :: TLine -> TLine -> Bool
$cmax :: TLine -> TLine -> TLine
max :: TLine -> TLine -> TLine
$cmin :: TLine -> TLine -> TLine
min :: TLine -> TLine -> TLine
Ord, Int -> TLine -> ShowS
[TLine] -> ShowS
TLine -> String
(Int -> TLine -> ShowS)
-> (TLine -> String) -> ([TLine] -> ShowS) -> Show TLine
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TLine -> ShowS
showsPrec :: Int -> TLine -> ShowS
$cshow :: TLine -> String
show :: TLine -> String
$cshowList :: [TLine] -> ShowS
showList :: [TLine] -> ShowS
Show)

instance () => FPtr (TLine) where
        type Raw TLine = RawTLine
        get_fptr :: TLine -> Ptr (Raw TLine)
get_fptr (TLine Ptr RawTLine
ptr) = Ptr (Raw TLine)
Ptr RawTLine
ptr
        cast_fptr_to_obj :: Ptr (Raw TLine) -> TLine
cast_fptr_to_obj = Ptr (Raw TLine) -> TLine
Ptr RawTLine -> TLine
TLine