{-# LANGUAGE PatternSynonyms #-}
module Codec.Wavefront.Face where
data FaceIndex = FaceIndex {
FaceIndex -> Int
faceLocIndex :: {-# UNPACK #-} !Int
, FaceIndex -> Maybe Int
faceTexCoordIndex :: !(Maybe Int)
, FaceIndex -> Maybe Int
faceNorIndex :: !(Maybe Int)
} deriving (FaceIndex -> FaceIndex -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: FaceIndex -> FaceIndex -> Bool
$c/= :: FaceIndex -> FaceIndex -> Bool
== :: FaceIndex -> FaceIndex -> Bool
$c== :: FaceIndex -> FaceIndex -> Bool
Eq,Int -> FaceIndex -> ShowS
[FaceIndex] -> ShowS
FaceIndex -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [FaceIndex] -> ShowS
$cshowList :: [FaceIndex] -> ShowS
show :: FaceIndex -> String
$cshow :: FaceIndex -> String
showsPrec :: Int -> FaceIndex -> ShowS
$cshowsPrec :: Int -> FaceIndex -> ShowS
Show)
data Face = Face FaceIndex FaceIndex FaceIndex [FaceIndex] deriving (Face -> Face -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Face -> Face -> Bool
$c/= :: Face -> Face -> Bool
== :: Face -> Face -> Bool
$c== :: Face -> Face -> Bool
Eq,Int -> Face -> ShowS
[Face] -> ShowS
Face -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Face] -> ShowS
$cshowList :: [Face] -> ShowS
show :: Face -> String
$cshow :: Face -> String
showsPrec :: Int -> Face -> ShowS
$cshowsPrec :: Int -> Face -> ShowS
Show)
pattern Triangle :: FaceIndex -> FaceIndex -> FaceIndex -> Face
pattern $bTriangle :: FaceIndex -> FaceIndex -> FaceIndex -> Face
$mTriangle :: forall {r}.
Face
-> (FaceIndex -> FaceIndex -> FaceIndex -> r) -> ((# #) -> r) -> r
Triangle a b c = Face a b c []
pattern Quad :: FaceIndex -> FaceIndex -> FaceIndex -> FaceIndex -> Face
pattern $bQuad :: FaceIndex -> FaceIndex -> FaceIndex -> FaceIndex -> Face
$mQuad :: forall {r}.
Face
-> (FaceIndex -> FaceIndex -> FaceIndex -> FaceIndex -> r)
-> ((# #) -> r)
-> r
Quad a b c d = Face a b c [d]