{-# OPTIONS_GHC -Wall -fno-warn-tabs #-}

module Gpu.Vulkan.Khr.Surface.Type where

import Gpu.Vulkan.Khr.Surface.Middle as M

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