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

module Gpu.Vulkan.Semaphore.Type where

import Gpu.Vulkan.Semaphore.Middle qualified as M

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