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

data RawFMMMLayout

newtype FMMMLayout = FMMMLayout (Ptr RawFMMMLayout)
                       deriving (FMMMLayout -> FMMMLayout -> Bool
(FMMMLayout -> FMMMLayout -> Bool)
-> (FMMMLayout -> FMMMLayout -> Bool) -> Eq FMMMLayout
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: FMMMLayout -> FMMMLayout -> Bool
== :: FMMMLayout -> FMMMLayout -> Bool
$c/= :: FMMMLayout -> FMMMLayout -> Bool
/= :: FMMMLayout -> FMMMLayout -> Bool
Eq, Eq FMMMLayout
Eq FMMMLayout
-> (FMMMLayout -> FMMMLayout -> Ordering)
-> (FMMMLayout -> FMMMLayout -> Bool)
-> (FMMMLayout -> FMMMLayout -> Bool)
-> (FMMMLayout -> FMMMLayout -> Bool)
-> (FMMMLayout -> FMMMLayout -> Bool)
-> (FMMMLayout -> FMMMLayout -> FMMMLayout)
-> (FMMMLayout -> FMMMLayout -> FMMMLayout)
-> Ord FMMMLayout
FMMMLayout -> FMMMLayout -> Bool
FMMMLayout -> FMMMLayout -> Ordering
FMMMLayout -> FMMMLayout -> FMMMLayout
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 :: FMMMLayout -> FMMMLayout -> Ordering
compare :: FMMMLayout -> FMMMLayout -> Ordering
$c< :: FMMMLayout -> FMMMLayout -> Bool
< :: FMMMLayout -> FMMMLayout -> Bool
$c<= :: FMMMLayout -> FMMMLayout -> Bool
<= :: FMMMLayout -> FMMMLayout -> Bool
$c> :: FMMMLayout -> FMMMLayout -> Bool
> :: FMMMLayout -> FMMMLayout -> Bool
$c>= :: FMMMLayout -> FMMMLayout -> Bool
>= :: FMMMLayout -> FMMMLayout -> Bool
$cmax :: FMMMLayout -> FMMMLayout -> FMMMLayout
max :: FMMMLayout -> FMMMLayout -> FMMMLayout
$cmin :: FMMMLayout -> FMMMLayout -> FMMMLayout
min :: FMMMLayout -> FMMMLayout -> FMMMLayout
Ord, Int -> FMMMLayout -> ShowS
[FMMMLayout] -> ShowS
FMMMLayout -> String
(Int -> FMMMLayout -> ShowS)
-> (FMMMLayout -> String)
-> ([FMMMLayout] -> ShowS)
-> Show FMMMLayout
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> FMMMLayout -> ShowS
showsPrec :: Int -> FMMMLayout -> ShowS
$cshow :: FMMMLayout -> String
show :: FMMMLayout -> String
$cshowList :: [FMMMLayout] -> ShowS
showList :: [FMMMLayout] -> ShowS
Show)

instance () => FPtr (FMMMLayout) where
        type Raw FMMMLayout = RawFMMMLayout
        get_fptr :: FMMMLayout -> Ptr (Raw FMMMLayout)
get_fptr (FMMMLayout Ptr RawFMMMLayout
ptr) = Ptr (Raw FMMMLayout)
Ptr RawFMMMLayout
ptr
        cast_fptr_to_obj :: Ptr (Raw FMMMLayout) -> FMMMLayout
cast_fptr_to_obj = Ptr (Raw FMMMLayout) -> FMMMLayout
Ptr RawFMMMLayout -> FMMMLayout
FMMMLayout