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

module Gpu.Vulkan.RenderPass.Type where

import qualified Gpu.Vulkan.RenderPass.Middle as M

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