module Codec.GlTF.Scene
  ( SceneIx(..)
  , Scene(..)
  ) where
import Codec.GlTF.Prelude
import Codec.GlTF.Node (NodeIx)
newtype SceneIx = SceneIx { SceneIx -> Int
unSceneIx :: Int }
  deriving (SceneIx -> SceneIx -> Bool
(SceneIx -> SceneIx -> Bool)
-> (SceneIx -> SceneIx -> Bool) -> Eq SceneIx
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SceneIx -> SceneIx -> Bool
== :: SceneIx -> SceneIx -> Bool
$c/= :: SceneIx -> SceneIx -> Bool
/= :: SceneIx -> SceneIx -> Bool
Eq, Eq SceneIx
Eq SceneIx =>
(SceneIx -> SceneIx -> Ordering)
-> (SceneIx -> SceneIx -> Bool)
-> (SceneIx -> SceneIx -> Bool)
-> (SceneIx -> SceneIx -> Bool)
-> (SceneIx -> SceneIx -> Bool)
-> (SceneIx -> SceneIx -> SceneIx)
-> (SceneIx -> SceneIx -> SceneIx)
-> Ord SceneIx
SceneIx -> SceneIx -> Bool
SceneIx -> SceneIx -> Ordering
SceneIx -> SceneIx -> SceneIx
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 :: SceneIx -> SceneIx -> Ordering
compare :: SceneIx -> SceneIx -> Ordering
$c< :: SceneIx -> SceneIx -> Bool
< :: SceneIx -> SceneIx -> Bool
$c<= :: SceneIx -> SceneIx -> Bool
<= :: SceneIx -> SceneIx -> Bool
$c> :: SceneIx -> SceneIx -> Bool
> :: SceneIx -> SceneIx -> Bool
$c>= :: SceneIx -> SceneIx -> Bool
>= :: SceneIx -> SceneIx -> Bool
$cmax :: SceneIx -> SceneIx -> SceneIx
max :: SceneIx -> SceneIx -> SceneIx
$cmin :: SceneIx -> SceneIx -> SceneIx
min :: SceneIx -> SceneIx -> SceneIx
Ord, Int -> SceneIx -> ShowS
[SceneIx] -> ShowS
SceneIx -> String
(Int -> SceneIx -> ShowS)
-> (SceneIx -> String) -> ([SceneIx] -> ShowS) -> Show SceneIx
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SceneIx -> ShowS
showsPrec :: Int -> SceneIx -> ShowS
$cshow :: SceneIx -> String
show :: SceneIx -> String
$cshowList :: [SceneIx] -> ShowS
showList :: [SceneIx] -> ShowS
Show, Value -> Parser [SceneIx]
Value -> Parser SceneIx
(Value -> Parser SceneIx)
-> (Value -> Parser [SceneIx]) -> FromJSON SceneIx
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
$cparseJSON :: Value -> Parser SceneIx
parseJSON :: Value -> Parser SceneIx
$cparseJSONList :: Value -> Parser [SceneIx]
parseJSONList :: Value -> Parser [SceneIx]
FromJSON, [SceneIx] -> Value
[SceneIx] -> Encoding
SceneIx -> Value
SceneIx -> Encoding
(SceneIx -> Value)
-> (SceneIx -> Encoding)
-> ([SceneIx] -> Value)
-> ([SceneIx] -> Encoding)
-> ToJSON SceneIx
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
$ctoJSON :: SceneIx -> Value
toJSON :: SceneIx -> Value
$ctoEncoding :: SceneIx -> Encoding
toEncoding :: SceneIx -> Encoding
$ctoJSONList :: [SceneIx] -> Value
toJSONList :: [SceneIx] -> Value
$ctoEncodingList :: [SceneIx] -> Encoding
toEncodingList :: [SceneIx] -> Encoding
ToJSON, (forall x. SceneIx -> Rep SceneIx x)
-> (forall x. Rep SceneIx x -> SceneIx) -> Generic SceneIx
forall x. Rep SceneIx x -> SceneIx
forall x. SceneIx -> Rep SceneIx x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. SceneIx -> Rep SceneIx x
from :: forall x. SceneIx -> Rep SceneIx x
$cto :: forall x. Rep SceneIx x -> SceneIx
to :: forall x. Rep SceneIx x -> SceneIx
Generic)
data Scene = Scene
  { Scene -> Maybe (Vector NodeIx)
nodes       :: Maybe (Vector NodeIx)
  , Scene -> Maybe Text
name        :: Maybe Text
  , Scene -> Maybe Object
extensions  :: Maybe Object
  ,       :: Maybe Value
  } deriving (Scene -> Scene -> Bool
(Scene -> Scene -> Bool) -> (Scene -> Scene -> Bool) -> Eq Scene
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Scene -> Scene -> Bool
== :: Scene -> Scene -> Bool
$c/= :: Scene -> Scene -> Bool
/= :: Scene -> Scene -> Bool
Eq, Int -> Scene -> ShowS
[Scene] -> ShowS
Scene -> String
(Int -> Scene -> ShowS)
-> (Scene -> String) -> ([Scene] -> ShowS) -> Show Scene
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Scene -> ShowS
showsPrec :: Int -> Scene -> ShowS
$cshow :: Scene -> String
show :: Scene -> String
$cshowList :: [Scene] -> ShowS
showList :: [Scene] -> ShowS
Show, (forall x. Scene -> Rep Scene x)
-> (forall x. Rep Scene x -> Scene) -> Generic Scene
forall x. Rep Scene x -> Scene
forall x. Scene -> Rep Scene x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. Scene -> Rep Scene x
from :: forall x. Scene -> Rep Scene x
$cto :: forall x. Rep Scene x -> Scene
to :: forall x. Rep Scene x -> Scene
Generic)
instance FromJSON Scene
instance ToJSON Scene