{-# LANGUAGE ImportQualifiedPost #-}
{-# LANGUAGE KindSignatures #-}
{-# OPTIONS_GHC -Wall -fno-warn-tabs #-}

module Gpu.Vulkan.QueryPool.Type (

	-- * QUERY POOL

	Q(..)

	) where

import Data.Kind

import Gpu.Vulkan.QueryPool.Middle qualified as M

newtype Q sq (tp :: Bool -> Type) = Q M.Q deriving Int -> Q sq tp -> ShowS
[Q sq tp] -> ShowS
Q sq tp -> String
(Int -> Q sq tp -> ShowS)
-> (Q sq tp -> String) -> ([Q sq tp] -> ShowS) -> Show (Q sq tp)
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
forall sq (tp :: Bool -> *). Int -> Q sq tp -> ShowS
forall sq (tp :: Bool -> *). [Q sq tp] -> ShowS
forall sq (tp :: Bool -> *). Q sq tp -> String
$cshowsPrec :: forall sq (tp :: Bool -> *). Int -> Q sq tp -> ShowS
showsPrec :: Int -> Q sq tp -> ShowS
$cshow :: forall sq (tp :: Bool -> *). Q sq tp -> String
show :: Q sq tp -> String
$cshowList :: forall sq (tp :: Bool -> *). [Q sq tp] -> ShowS
showList :: [Q sq tp] -> ShowS
Show