module OpenCascade.GeomFill.Trihedron
( Trihedron (..)
) where
data Trihedron = IsCorrectedFrenet | IsFixed | IsFrenet | IsConstantNormal |
IsDarboux | IsGuideAC | IsGuidePlan | IsGuideACWithContact |
IsGuidePlanWithContact | IsDiscreteTrihedron deriving (Int -> Trihedron -> ShowS
[Trihedron] -> ShowS
Trihedron -> String
(Int -> Trihedron -> ShowS)
-> (Trihedron -> String)
-> ([Trihedron] -> ShowS)
-> Show Trihedron
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Trihedron -> ShowS
showsPrec :: Int -> Trihedron -> ShowS
$cshow :: Trihedron -> String
show :: Trihedron -> String
$cshowList :: [Trihedron] -> ShowS
showList :: [Trihedron] -> ShowS
Show, Trihedron -> Trihedron -> Bool
(Trihedron -> Trihedron -> Bool)
-> (Trihedron -> Trihedron -> Bool) -> Eq Trihedron
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Trihedron -> Trihedron -> Bool
== :: Trihedron -> Trihedron -> Bool
$c/= :: Trihedron -> Trihedron -> Bool
/= :: Trihedron -> Trihedron -> Bool
Eq, Int -> Trihedron
Trihedron -> Int
Trihedron -> [Trihedron]
Trihedron -> Trihedron
Trihedron -> Trihedron -> [Trihedron]
Trihedron -> Trihedron -> Trihedron -> [Trihedron]
(Trihedron -> Trihedron)
-> (Trihedron -> Trihedron)
-> (Int -> Trihedron)
-> (Trihedron -> Int)
-> (Trihedron -> [Trihedron])
-> (Trihedron -> Trihedron -> [Trihedron])
-> (Trihedron -> Trihedron -> [Trihedron])
-> (Trihedron -> Trihedron -> Trihedron -> [Trihedron])
-> Enum Trihedron
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: Trihedron -> Trihedron
succ :: Trihedron -> Trihedron
$cpred :: Trihedron -> Trihedron
pred :: Trihedron -> Trihedron
$ctoEnum :: Int -> Trihedron
toEnum :: Int -> Trihedron
$cfromEnum :: Trihedron -> Int
fromEnum :: Trihedron -> Int
$cenumFrom :: Trihedron -> [Trihedron]
enumFrom :: Trihedron -> [Trihedron]
$cenumFromThen :: Trihedron -> Trihedron -> [Trihedron]
enumFromThen :: Trihedron -> Trihedron -> [Trihedron]
$cenumFromTo :: Trihedron -> Trihedron -> [Trihedron]
enumFromTo :: Trihedron -> Trihedron -> [Trihedron]
$cenumFromThenTo :: Trihedron -> Trihedron -> Trihedron -> [Trihedron]
enumFromThenTo :: Trihedron -> Trihedron -> Trihedron -> [Trihedron]
Enum)