{-# LANGUAGE DeriveFunctor #-}
module Aztecs.ECS.R (R (..)) where
newtype R a = R {forall a. R a -> a
unR :: a}
deriving (Int -> R a -> ShowS
[R a] -> ShowS
R a -> String
(Int -> R a -> ShowS)
-> (R a -> String) -> ([R a] -> ShowS) -> Show (R a)
forall a. Show a => Int -> R a -> ShowS
forall a. Show a => [R a] -> ShowS
forall a. Show a => R a -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: forall a. Show a => Int -> R a -> ShowS
showsPrec :: Int -> R a -> ShowS
$cshow :: forall a. Show a => R a -> String
show :: R a -> String
$cshowList :: forall a. Show a => [R a] -> ShowS
showList :: [R a] -> ShowS
Show, R a -> R a -> Bool
(R a -> R a -> Bool) -> (R a -> R a -> Bool) -> Eq (R a)
forall a. Eq a => R a -> R a -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: forall a. Eq a => R a -> R a -> Bool
== :: R a -> R a -> Bool
$c/= :: forall a. Eq a => R a -> R a -> Bool
/= :: R a -> R a -> Bool
Eq, (forall a b. (a -> b) -> R a -> R b)
-> (forall a b. a -> R b -> R a) -> Functor R
forall a b. a -> R b -> R a
forall a b. (a -> b) -> R a -> R b
forall (f :: * -> *).
(forall a b. (a -> b) -> f a -> f b)
-> (forall a b. a -> f b -> f a) -> Functor f
$cfmap :: forall a b. (a -> b) -> R a -> R b
fmap :: forall a b. (a -> b) -> R a -> R b
$c<$ :: forall a b. a -> R b -> R a
<$ :: forall a b. a -> R b -> R a
Functor)