--------------------------------------------------------------------------------
-- |
-- Module      :  Descriptor
-- Copyright   :  (c) Vladimir Lopatin 2022
-- License     :  BSD-3-Clause
--
-- Maintainer  :  Vladimir Lopatin <madjestic13@gmail.com>
-- Stability   :  provisional
-- Portability :  portable
--
-- A basic structure for passing to graphics driver.
--
--------------------------------------------------------------------------------

module Graphics.RedViz.Descriptor
  (Descriptor (..)) where

import Graphics.Rendering.OpenGL (VertexArrayObject, NumArrayIndices)

data Descriptor =
     Descriptor VertexArrayObject NumArrayIndices
  deriving Int -> Descriptor -> ShowS
[Descriptor] -> ShowS
Descriptor -> String
(Int -> Descriptor -> ShowS)
-> (Descriptor -> String)
-> ([Descriptor] -> ShowS)
-> Show Descriptor
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Descriptor] -> ShowS
$cshowList :: [Descriptor] -> ShowS
show :: Descriptor -> String
$cshow :: Descriptor -> String
showsPrec :: Int -> Descriptor -> ShowS
$cshowsPrec :: Int -> Descriptor -> ShowS
Show