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

module Gpu.Vulkan.Khr.Swapchain.Type where

import qualified Gpu.Vulkan.TypeEnum as T
import qualified Gpu.Vulkan.Khr.Swapchain.Middle as M

newtype S (fmt :: T.Format) ss = S M.S deriving Int -> S fmt ss -> ShowS
[S fmt ss] -> ShowS
S fmt ss -> String
(Int -> S fmt ss -> ShowS)
-> (S fmt ss -> String) -> ([S fmt ss] -> ShowS) -> Show (S fmt ss)
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
forall (fmt :: Format) ss. Int -> S fmt ss -> ShowS
forall (fmt :: Format) ss. [S fmt ss] -> ShowS
forall (fmt :: Format) ss. S fmt ss -> String
$cshowsPrec :: forall (fmt :: Format) ss. Int -> S fmt ss -> ShowS
showsPrec :: Int -> S fmt ss -> ShowS
$cshow :: forall (fmt :: Format) ss. S fmt ss -> String
show :: S fmt ss -> String
$cshowList :: forall (fmt :: Format) ss. [S fmt ss] -> ShowS
showList :: [S fmt ss] -> ShowS
Show