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

module Graphics.UI.GlfwG.Window.Type where

import Graphics.UI.GLFW qualified as B

newtype W s = W B.Window deriving (W s -> W s -> Bool
(W s -> W s -> Bool) -> (W s -> W s -> Bool) -> Eq (W s)
forall s. W s -> W s -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: forall s. W s -> W s -> Bool
== :: W s -> W s -> Bool
$c/= :: forall s. W s -> W s -> Bool
/= :: W s -> W s -> Bool
Eq, Eq (W s)
Eq (W s) =>
(W s -> W s -> Ordering)
-> (W s -> W s -> Bool)
-> (W s -> W s -> Bool)
-> (W s -> W s -> Bool)
-> (W s -> W s -> Bool)
-> (W s -> W s -> W s)
-> (W s -> W s -> W s)
-> Ord (W s)
W s -> W s -> Bool
W s -> W s -> Ordering
W s -> W s -> W s
forall s. Eq (W s)
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
forall s. W s -> W s -> Bool
forall s. W s -> W s -> Ordering
forall s. W s -> W s -> W s
$ccompare :: forall s. W s -> W s -> Ordering
compare :: W s -> W s -> Ordering
$c< :: forall s. W s -> W s -> Bool
< :: W s -> W s -> Bool
$c<= :: forall s. W s -> W s -> Bool
<= :: W s -> W s -> Bool
$c> :: forall s. W s -> W s -> Bool
> :: W s -> W s -> Bool
$c>= :: forall s. W s -> W s -> Bool
>= :: W s -> W s -> Bool
$cmax :: forall s. W s -> W s -> W s
max :: W s -> W s -> W s
$cmin :: forall s. W s -> W s -> W s
min :: W s -> W s -> W s
Ord, Int -> W s -> ShowS
[W s] -> ShowS
W s -> String
(Int -> W s -> ShowS)
-> (W s -> String) -> ([W s] -> ShowS) -> Show (W s)
forall s. Int -> W s -> ShowS
forall s. [W s] -> ShowS
forall s. W s -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: forall s. Int -> W s -> ShowS
showsPrec :: Int -> W s -> ShowS
$cshow :: forall s. W s -> String
show :: W s -> String
$cshowList :: forall s. [W s] -> ShowS
showList :: [W s] -> ShowS
Show)