{-# OPTIONS_GHC -Wno-missing-export-lists #-}
module M.V769.I where
import Control.DeepSeq
import Data.Bits
import Data.ByteString (ByteString)
import Data.Data
import Data.Fixed
import Data.Hashable
import Data.Int
import Data.Text (Text)
import GHC.Generics
import Language.Haskell.TH.Syntax (Lift)
import M.Pack
import M.PkMacro
data SetEntityVelocityRes
instance HasResolution SetEntityVelocityRes where
resolution :: forall (p :: * -> *). p SetEntityVelocityRes -> Integer
resolution p SetEntityVelocityRes
_ = Integer
8000
data ChatMode = CMEnabled | CMCommandsOnly | CMHidden
deriving stock (ChatMode -> ChatMode -> Bool
(ChatMode -> ChatMode -> Bool)
-> (ChatMode -> ChatMode -> Bool) -> Eq ChatMode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ChatMode -> ChatMode -> Bool
== :: ChatMode -> ChatMode -> Bool
$c/= :: ChatMode -> ChatMode -> Bool
/= :: ChatMode -> ChatMode -> Bool
Eq, Eq ChatMode
Eq ChatMode =>
(ChatMode -> ChatMode -> Ordering)
-> (ChatMode -> ChatMode -> Bool)
-> (ChatMode -> ChatMode -> Bool)
-> (ChatMode -> ChatMode -> Bool)
-> (ChatMode -> ChatMode -> Bool)
-> (ChatMode -> ChatMode -> ChatMode)
-> (ChatMode -> ChatMode -> ChatMode)
-> Ord ChatMode
ChatMode -> ChatMode -> Bool
ChatMode -> ChatMode -> Ordering
ChatMode -> ChatMode -> ChatMode
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
$ccompare :: ChatMode -> ChatMode -> Ordering
compare :: ChatMode -> ChatMode -> Ordering
$c< :: ChatMode -> ChatMode -> Bool
< :: ChatMode -> ChatMode -> Bool
$c<= :: ChatMode -> ChatMode -> Bool
<= :: ChatMode -> ChatMode -> Bool
$c> :: ChatMode -> ChatMode -> Bool
> :: ChatMode -> ChatMode -> Bool
$c>= :: ChatMode -> ChatMode -> Bool
>= :: ChatMode -> ChatMode -> Bool
$cmax :: ChatMode -> ChatMode -> ChatMode
max :: ChatMode -> ChatMode -> ChatMode
$cmin :: ChatMode -> ChatMode -> ChatMode
min :: ChatMode -> ChatMode -> ChatMode
Ord, Int -> ChatMode -> String -> String
[ChatMode] -> String -> String
ChatMode -> String
(Int -> ChatMode -> String -> String)
-> (ChatMode -> String)
-> ([ChatMode] -> String -> String)
-> Show ChatMode
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> ChatMode -> String -> String
showsPrec :: Int -> ChatMode -> String -> String
$cshow :: ChatMode -> String
show :: ChatMode -> String
$cshowList :: [ChatMode] -> String -> String
showList :: [ChatMode] -> String -> String
Show, ReadPrec [ChatMode]
ReadPrec ChatMode
Int -> ReadS ChatMode
ReadS [ChatMode]
(Int -> ReadS ChatMode)
-> ReadS [ChatMode]
-> ReadPrec ChatMode
-> ReadPrec [ChatMode]
-> Read ChatMode
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS ChatMode
readsPrec :: Int -> ReadS ChatMode
$creadList :: ReadS [ChatMode]
readList :: ReadS [ChatMode]
$creadPrec :: ReadPrec ChatMode
readPrec :: ReadPrec ChatMode
$creadListPrec :: ReadPrec [ChatMode]
readListPrec :: ReadPrec [ChatMode]
Read)
deriving stock (Int -> ChatMode
ChatMode -> Int
ChatMode -> [ChatMode]
ChatMode -> ChatMode
ChatMode -> ChatMode -> [ChatMode]
ChatMode -> ChatMode -> ChatMode -> [ChatMode]
(ChatMode -> ChatMode)
-> (ChatMode -> ChatMode)
-> (Int -> ChatMode)
-> (ChatMode -> Int)
-> (ChatMode -> [ChatMode])
-> (ChatMode -> ChatMode -> [ChatMode])
-> (ChatMode -> ChatMode -> [ChatMode])
-> (ChatMode -> ChatMode -> ChatMode -> [ChatMode])
-> Enum ChatMode
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: ChatMode -> ChatMode
succ :: ChatMode -> ChatMode
$cpred :: ChatMode -> ChatMode
pred :: ChatMode -> ChatMode
$ctoEnum :: Int -> ChatMode
toEnum :: Int -> ChatMode
$cfromEnum :: ChatMode -> Int
fromEnum :: ChatMode -> Int
$cenumFrom :: ChatMode -> [ChatMode]
enumFrom :: ChatMode -> [ChatMode]
$cenumFromThen :: ChatMode -> ChatMode -> [ChatMode]
enumFromThen :: ChatMode -> ChatMode -> [ChatMode]
$cenumFromTo :: ChatMode -> ChatMode -> [ChatMode]
enumFromTo :: ChatMode -> ChatMode -> [ChatMode]
$cenumFromThenTo :: ChatMode -> ChatMode -> ChatMode -> [ChatMode]
enumFromThenTo :: ChatMode -> ChatMode -> ChatMode -> [ChatMode]
Enum, ChatMode
ChatMode -> ChatMode -> Bounded ChatMode
forall a. a -> a -> Bounded a
$cminBound :: ChatMode
minBound :: ChatMode
$cmaxBound :: ChatMode
maxBound :: ChatMode
Bounded, (forall x. ChatMode -> Rep ChatMode x)
-> (forall x. Rep ChatMode x -> ChatMode) -> Generic ChatMode
forall x. Rep ChatMode x -> ChatMode
forall x. ChatMode -> Rep ChatMode x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. ChatMode -> Rep ChatMode x
from :: forall x. ChatMode -> Rep ChatMode x
$cto :: forall x. Rep ChatMode x -> ChatMode
to :: forall x. Rep ChatMode x -> ChatMode
Generic, Typeable ChatMode
Typeable ChatMode =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ChatMode -> c ChatMode)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ChatMode)
-> (ChatMode -> Constr)
-> (ChatMode -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ChatMode))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChatMode))
-> ((forall b. Data b => b -> b) -> ChatMode -> ChatMode)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r)
-> (forall u. (forall d. Data d => d -> u) -> ChatMode -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> ChatMode -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode)
-> Data ChatMode
ChatMode -> Constr
ChatMode -> DataType
(forall b. Data b => b -> b) -> ChatMode -> ChatMode
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> ChatMode -> u
forall u. (forall d. Data d => d -> u) -> ChatMode -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ChatMode
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ChatMode -> c ChatMode
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ChatMode)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChatMode)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ChatMode -> c ChatMode
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ChatMode -> c ChatMode
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ChatMode
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ChatMode
$ctoConstr :: ChatMode -> Constr
toConstr :: ChatMode -> Constr
$cdataTypeOf :: ChatMode -> DataType
dataTypeOf :: ChatMode -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ChatMode)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ChatMode)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChatMode)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChatMode)
$cgmapT :: (forall b. Data b => b -> b) -> ChatMode -> ChatMode
gmapT :: (forall b. Data b => b -> b) -> ChatMode -> ChatMode
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ChatMode -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> ChatMode -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> ChatMode -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> ChatMode -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> ChatMode -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ChatMode -> m ChatMode
Data, Typeable, (forall (m :: * -> *). Quote m => ChatMode -> m Exp)
-> (forall (m :: * -> *). Quote m => ChatMode -> Code m ChatMode)
-> Lift ChatMode
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => ChatMode -> m Exp
forall (m :: * -> *). Quote m => ChatMode -> Code m ChatMode
$clift :: forall (m :: * -> *). Quote m => ChatMode -> m Exp
lift :: forall (m :: * -> *). Quote m => ChatMode -> m Exp
$cliftTyped :: forall (m :: * -> *). Quote m => ChatMode -> Code m ChatMode
liftTyped :: forall (m :: * -> *). Quote m => ChatMode -> Code m ChatMode
Lift)
deriving anyclass (ChatMode -> ()
(ChatMode -> ()) -> NFData ChatMode
forall a. (a -> ()) -> NFData a
$crnf :: ChatMode -> ()
rnf :: ChatMode -> ()
NFData, Eq ChatMode
Eq ChatMode =>
(Int -> ChatMode -> Int) -> (ChatMode -> Int) -> Hashable ChatMode
Int -> ChatMode -> Int
ChatMode -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> ChatMode -> Int
hashWithSalt :: Int -> ChatMode -> Int
$chash :: ChatMode -> Int
hash :: ChatMode -> Int
Hashable)
data ParticleStatus = PSAll | PSDecreased | PSMinimal
deriving stock (ParticleStatus -> ParticleStatus -> Bool
(ParticleStatus -> ParticleStatus -> Bool)
-> (ParticleStatus -> ParticleStatus -> Bool) -> Eq ParticleStatus
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ParticleStatus -> ParticleStatus -> Bool
== :: ParticleStatus -> ParticleStatus -> Bool
$c/= :: ParticleStatus -> ParticleStatus -> Bool
/= :: ParticleStatus -> ParticleStatus -> Bool
Eq, Eq ParticleStatus
Eq ParticleStatus =>
(ParticleStatus -> ParticleStatus -> Ordering)
-> (ParticleStatus -> ParticleStatus -> Bool)
-> (ParticleStatus -> ParticleStatus -> Bool)
-> (ParticleStatus -> ParticleStatus -> Bool)
-> (ParticleStatus -> ParticleStatus -> Bool)
-> (ParticleStatus -> ParticleStatus -> ParticleStatus)
-> (ParticleStatus -> ParticleStatus -> ParticleStatus)
-> Ord ParticleStatus
ParticleStatus -> ParticleStatus -> Bool
ParticleStatus -> ParticleStatus -> Ordering
ParticleStatus -> ParticleStatus -> ParticleStatus
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
$ccompare :: ParticleStatus -> ParticleStatus -> Ordering
compare :: ParticleStatus -> ParticleStatus -> Ordering
$c< :: ParticleStatus -> ParticleStatus -> Bool
< :: ParticleStatus -> ParticleStatus -> Bool
$c<= :: ParticleStatus -> ParticleStatus -> Bool
<= :: ParticleStatus -> ParticleStatus -> Bool
$c> :: ParticleStatus -> ParticleStatus -> Bool
> :: ParticleStatus -> ParticleStatus -> Bool
$c>= :: ParticleStatus -> ParticleStatus -> Bool
>= :: ParticleStatus -> ParticleStatus -> Bool
$cmax :: ParticleStatus -> ParticleStatus -> ParticleStatus
max :: ParticleStatus -> ParticleStatus -> ParticleStatus
$cmin :: ParticleStatus -> ParticleStatus -> ParticleStatus
min :: ParticleStatus -> ParticleStatus -> ParticleStatus
Ord, Int -> ParticleStatus -> String -> String
[ParticleStatus] -> String -> String
ParticleStatus -> String
(Int -> ParticleStatus -> String -> String)
-> (ParticleStatus -> String)
-> ([ParticleStatus] -> String -> String)
-> Show ParticleStatus
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> ParticleStatus -> String -> String
showsPrec :: Int -> ParticleStatus -> String -> String
$cshow :: ParticleStatus -> String
show :: ParticleStatus -> String
$cshowList :: [ParticleStatus] -> String -> String
showList :: [ParticleStatus] -> String -> String
Show, ReadPrec [ParticleStatus]
ReadPrec ParticleStatus
Int -> ReadS ParticleStatus
ReadS [ParticleStatus]
(Int -> ReadS ParticleStatus)
-> ReadS [ParticleStatus]
-> ReadPrec ParticleStatus
-> ReadPrec [ParticleStatus]
-> Read ParticleStatus
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS ParticleStatus
readsPrec :: Int -> ReadS ParticleStatus
$creadList :: ReadS [ParticleStatus]
readList :: ReadS [ParticleStatus]
$creadPrec :: ReadPrec ParticleStatus
readPrec :: ReadPrec ParticleStatus
$creadListPrec :: ReadPrec [ParticleStatus]
readListPrec :: ReadPrec [ParticleStatus]
Read)
deriving stock (Int -> ParticleStatus
ParticleStatus -> Int
ParticleStatus -> [ParticleStatus]
ParticleStatus -> ParticleStatus
ParticleStatus -> ParticleStatus -> [ParticleStatus]
ParticleStatus
-> ParticleStatus -> ParticleStatus -> [ParticleStatus]
(ParticleStatus -> ParticleStatus)
-> (ParticleStatus -> ParticleStatus)
-> (Int -> ParticleStatus)
-> (ParticleStatus -> Int)
-> (ParticleStatus -> [ParticleStatus])
-> (ParticleStatus -> ParticleStatus -> [ParticleStatus])
-> (ParticleStatus -> ParticleStatus -> [ParticleStatus])
-> (ParticleStatus
-> ParticleStatus -> ParticleStatus -> [ParticleStatus])
-> Enum ParticleStatus
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: ParticleStatus -> ParticleStatus
succ :: ParticleStatus -> ParticleStatus
$cpred :: ParticleStatus -> ParticleStatus
pred :: ParticleStatus -> ParticleStatus
$ctoEnum :: Int -> ParticleStatus
toEnum :: Int -> ParticleStatus
$cfromEnum :: ParticleStatus -> Int
fromEnum :: ParticleStatus -> Int
$cenumFrom :: ParticleStatus -> [ParticleStatus]
enumFrom :: ParticleStatus -> [ParticleStatus]
$cenumFromThen :: ParticleStatus -> ParticleStatus -> [ParticleStatus]
enumFromThen :: ParticleStatus -> ParticleStatus -> [ParticleStatus]
$cenumFromTo :: ParticleStatus -> ParticleStatus -> [ParticleStatus]
enumFromTo :: ParticleStatus -> ParticleStatus -> [ParticleStatus]
$cenumFromThenTo :: ParticleStatus
-> ParticleStatus -> ParticleStatus -> [ParticleStatus]
enumFromThenTo :: ParticleStatus
-> ParticleStatus -> ParticleStatus -> [ParticleStatus]
Enum, ParticleStatus
ParticleStatus -> ParticleStatus -> Bounded ParticleStatus
forall a. a -> a -> Bounded a
$cminBound :: ParticleStatus
minBound :: ParticleStatus
$cmaxBound :: ParticleStatus
maxBound :: ParticleStatus
Bounded, (forall x. ParticleStatus -> Rep ParticleStatus x)
-> (forall x. Rep ParticleStatus x -> ParticleStatus)
-> Generic ParticleStatus
forall x. Rep ParticleStatus x -> ParticleStatus
forall x. ParticleStatus -> Rep ParticleStatus x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. ParticleStatus -> Rep ParticleStatus x
from :: forall x. ParticleStatus -> Rep ParticleStatus x
$cto :: forall x. Rep ParticleStatus x -> ParticleStatus
to :: forall x. Rep ParticleStatus x -> ParticleStatus
Generic, Typeable ParticleStatus
Typeable ParticleStatus =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ParticleStatus -> c ParticleStatus)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ParticleStatus)
-> (ParticleStatus -> Constr)
-> (ParticleStatus -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ParticleStatus))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ParticleStatus))
-> ((forall b. Data b => b -> b)
-> ParticleStatus -> ParticleStatus)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r)
-> (forall u.
(forall d. Data d => d -> u) -> ParticleStatus -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> ParticleStatus -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus)
-> Data ParticleStatus
ParticleStatus -> Constr
ParticleStatus -> DataType
(forall b. Data b => b -> b) -> ParticleStatus -> ParticleStatus
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u.
Int -> (forall d. Data d => d -> u) -> ParticleStatus -> u
forall u. (forall d. Data d => d -> u) -> ParticleStatus -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ParticleStatus
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ParticleStatus -> c ParticleStatus
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ParticleStatus)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ParticleStatus)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ParticleStatus -> c ParticleStatus
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ParticleStatus -> c ParticleStatus
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ParticleStatus
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ParticleStatus
$ctoConstr :: ParticleStatus -> Constr
toConstr :: ParticleStatus -> Constr
$cdataTypeOf :: ParticleStatus -> DataType
dataTypeOf :: ParticleStatus -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ParticleStatus)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ParticleStatus)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ParticleStatus)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ParticleStatus)
$cgmapT :: (forall b. Data b => b -> b) -> ParticleStatus -> ParticleStatus
gmapT :: (forall b. Data b => b -> b) -> ParticleStatus -> ParticleStatus
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ParticleStatus -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> ParticleStatus -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> ParticleStatus -> [u]
$cgmapQi :: forall u.
Int -> (forall d. Data d => d -> u) -> ParticleStatus -> u
gmapQi :: forall u.
Int -> (forall d. Data d => d -> u) -> ParticleStatus -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d)
-> ParticleStatus -> m ParticleStatus
Data, Typeable, (forall (m :: * -> *). Quote m => ParticleStatus -> m Exp)
-> (forall (m :: * -> *).
Quote m =>
ParticleStatus -> Code m ParticleStatus)
-> Lift ParticleStatus
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => ParticleStatus -> m Exp
forall (m :: * -> *).
Quote m =>
ParticleStatus -> Code m ParticleStatus
$clift :: forall (m :: * -> *). Quote m => ParticleStatus -> m Exp
lift :: forall (m :: * -> *). Quote m => ParticleStatus -> m Exp
$cliftTyped :: forall (m :: * -> *).
Quote m =>
ParticleStatus -> Code m ParticleStatus
liftTyped :: forall (m :: * -> *).
Quote m =>
ParticleStatus -> Code m ParticleStatus
Lift)
deriving anyclass (ParticleStatus -> ()
(ParticleStatus -> ()) -> NFData ParticleStatus
forall a. (a -> ()) -> NFData a
$crnf :: ParticleStatus -> ()
rnf :: ParticleStatus -> ()
NFData, Eq ParticleStatus
Eq ParticleStatus =>
(Int -> ParticleStatus -> Int)
-> (ParticleStatus -> Int) -> Hashable ParticleStatus
Int -> ParticleStatus -> Int
ParticleStatus -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> ParticleStatus -> Int
hashWithSalt :: Int -> ParticleStatus -> Int
$chash :: ParticleStatus -> Int
hash :: ParticleStatus -> Int
Hashable)
data FilterType = PassThrough | FullyFiltered | PartiallyFiltered
deriving stock (FilterType -> FilterType -> Bool
(FilterType -> FilterType -> Bool)
-> (FilterType -> FilterType -> Bool) -> Eq FilterType
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: FilterType -> FilterType -> Bool
== :: FilterType -> FilterType -> Bool
$c/= :: FilterType -> FilterType -> Bool
/= :: FilterType -> FilterType -> Bool
Eq, Eq FilterType
Eq FilterType =>
(FilterType -> FilterType -> Ordering)
-> (FilterType -> FilterType -> Bool)
-> (FilterType -> FilterType -> Bool)
-> (FilterType -> FilterType -> Bool)
-> (FilterType -> FilterType -> Bool)
-> (FilterType -> FilterType -> FilterType)
-> (FilterType -> FilterType -> FilterType)
-> Ord FilterType
FilterType -> FilterType -> Bool
FilterType -> FilterType -> Ordering
FilterType -> FilterType -> FilterType
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
$ccompare :: FilterType -> FilterType -> Ordering
compare :: FilterType -> FilterType -> Ordering
$c< :: FilterType -> FilterType -> Bool
< :: FilterType -> FilterType -> Bool
$c<= :: FilterType -> FilterType -> Bool
<= :: FilterType -> FilterType -> Bool
$c> :: FilterType -> FilterType -> Bool
> :: FilterType -> FilterType -> Bool
$c>= :: FilterType -> FilterType -> Bool
>= :: FilterType -> FilterType -> Bool
$cmax :: FilterType -> FilterType -> FilterType
max :: FilterType -> FilterType -> FilterType
$cmin :: FilterType -> FilterType -> FilterType
min :: FilterType -> FilterType -> FilterType
Ord, Int -> FilterType -> String -> String
[FilterType] -> String -> String
FilterType -> String
(Int -> FilterType -> String -> String)
-> (FilterType -> String)
-> ([FilterType] -> String -> String)
-> Show FilterType
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> FilterType -> String -> String
showsPrec :: Int -> FilterType -> String -> String
$cshow :: FilterType -> String
show :: FilterType -> String
$cshowList :: [FilterType] -> String -> String
showList :: [FilterType] -> String -> String
Show, ReadPrec [FilterType]
ReadPrec FilterType
Int -> ReadS FilterType
ReadS [FilterType]
(Int -> ReadS FilterType)
-> ReadS [FilterType]
-> ReadPrec FilterType
-> ReadPrec [FilterType]
-> Read FilterType
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS FilterType
readsPrec :: Int -> ReadS FilterType
$creadList :: ReadS [FilterType]
readList :: ReadS [FilterType]
$creadPrec :: ReadPrec FilterType
readPrec :: ReadPrec FilterType
$creadListPrec :: ReadPrec [FilterType]
readListPrec :: ReadPrec [FilterType]
Read)
deriving stock (Int -> FilterType
FilterType -> Int
FilterType -> [FilterType]
FilterType -> FilterType
FilterType -> FilterType -> [FilterType]
FilterType -> FilterType -> FilterType -> [FilterType]
(FilterType -> FilterType)
-> (FilterType -> FilterType)
-> (Int -> FilterType)
-> (FilterType -> Int)
-> (FilterType -> [FilterType])
-> (FilterType -> FilterType -> [FilterType])
-> (FilterType -> FilterType -> [FilterType])
-> (FilterType -> FilterType -> FilterType -> [FilterType])
-> Enum FilterType
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: FilterType -> FilterType
succ :: FilterType -> FilterType
$cpred :: FilterType -> FilterType
pred :: FilterType -> FilterType
$ctoEnum :: Int -> FilterType
toEnum :: Int -> FilterType
$cfromEnum :: FilterType -> Int
fromEnum :: FilterType -> Int
$cenumFrom :: FilterType -> [FilterType]
enumFrom :: FilterType -> [FilterType]
$cenumFromThen :: FilterType -> FilterType -> [FilterType]
enumFromThen :: FilterType -> FilterType -> [FilterType]
$cenumFromTo :: FilterType -> FilterType -> [FilterType]
enumFromTo :: FilterType -> FilterType -> [FilterType]
$cenumFromThenTo :: FilterType -> FilterType -> FilterType -> [FilterType]
enumFromThenTo :: FilterType -> FilterType -> FilterType -> [FilterType]
Enum, FilterType
FilterType -> FilterType -> Bounded FilterType
forall a. a -> a -> Bounded a
$cminBound :: FilterType
minBound :: FilterType
$cmaxBound :: FilterType
maxBound :: FilterType
Bounded, (forall x. FilterType -> Rep FilterType x)
-> (forall x. Rep FilterType x -> FilterType) -> Generic FilterType
forall x. Rep FilterType x -> FilterType
forall x. FilterType -> Rep FilterType x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. FilterType -> Rep FilterType x
from :: forall x. FilterType -> Rep FilterType x
$cto :: forall x. Rep FilterType x -> FilterType
to :: forall x. Rep FilterType x -> FilterType
Generic, Typeable FilterType
Typeable FilterType =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> FilterType -> c FilterType)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c FilterType)
-> (FilterType -> Constr)
-> (FilterType -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c FilterType))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c FilterType))
-> ((forall b. Data b => b -> b) -> FilterType -> FilterType)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r)
-> (forall u. (forall d. Data d => d -> u) -> FilterType -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> FilterType -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType)
-> Data FilterType
FilterType -> Constr
FilterType -> DataType
(forall b. Data b => b -> b) -> FilterType -> FilterType
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> FilterType -> u
forall u. (forall d. Data d => d -> u) -> FilterType -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c FilterType
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> FilterType -> c FilterType
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c FilterType)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterType)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> FilterType -> c FilterType
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> FilterType -> c FilterType
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c FilterType
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c FilterType
$ctoConstr :: FilterType -> Constr
toConstr :: FilterType -> Constr
$cdataTypeOf :: FilterType -> DataType
dataTypeOf :: FilterType -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c FilterType)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c FilterType)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterType)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterType)
$cgmapT :: (forall b. Data b => b -> b) -> FilterType -> FilterType
gmapT :: (forall b. Data b => b -> b) -> FilterType -> FilterType
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> FilterType -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> FilterType -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> FilterType -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> FilterType -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> FilterType -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> FilterType -> m FilterType
Data, Typeable, (forall (m :: * -> *). Quote m => FilterType -> m Exp)
-> (forall (m :: * -> *).
Quote m =>
FilterType -> Code m FilterType)
-> Lift FilterType
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => FilterType -> m Exp
forall (m :: * -> *). Quote m => FilterType -> Code m FilterType
$clift :: forall (m :: * -> *). Quote m => FilterType -> m Exp
lift :: forall (m :: * -> *). Quote m => FilterType -> m Exp
$cliftTyped :: forall (m :: * -> *). Quote m => FilterType -> Code m FilterType
liftTyped :: forall (m :: * -> *). Quote m => FilterType -> Code m FilterType
Lift)
deriving anyclass (FilterType -> ()
(FilterType -> ()) -> NFData FilterType
forall a. (a -> ()) -> NFData a
$crnf :: FilterType -> ()
rnf :: FilterType -> ()
NFData, Eq FilterType
Eq FilterType =>
(Int -> FilterType -> Int)
-> (FilterType -> Int) -> Hashable FilterType
Int -> FilterType -> Int
FilterType -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> FilterType -> Int
hashWithSalt :: Int -> FilterType -> Int
$chash :: FilterType -> Int
hash :: FilterType -> Int
Hashable)
data BossBarColor
= BCPink
| BCBlue
| BCRed
| BCGreen
| BCYellow
| BCPurple
| BCWhite
deriving stock (BossBarColor -> BossBarColor -> Bool
(BossBarColor -> BossBarColor -> Bool)
-> (BossBarColor -> BossBarColor -> Bool) -> Eq BossBarColor
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BossBarColor -> BossBarColor -> Bool
== :: BossBarColor -> BossBarColor -> Bool
$c/= :: BossBarColor -> BossBarColor -> Bool
/= :: BossBarColor -> BossBarColor -> Bool
Eq, Eq BossBarColor
Eq BossBarColor =>
(BossBarColor -> BossBarColor -> Ordering)
-> (BossBarColor -> BossBarColor -> Bool)
-> (BossBarColor -> BossBarColor -> Bool)
-> (BossBarColor -> BossBarColor -> Bool)
-> (BossBarColor -> BossBarColor -> Bool)
-> (BossBarColor -> BossBarColor -> BossBarColor)
-> (BossBarColor -> BossBarColor -> BossBarColor)
-> Ord BossBarColor
BossBarColor -> BossBarColor -> Bool
BossBarColor -> BossBarColor -> Ordering
BossBarColor -> BossBarColor -> BossBarColor
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
$ccompare :: BossBarColor -> BossBarColor -> Ordering
compare :: BossBarColor -> BossBarColor -> Ordering
$c< :: BossBarColor -> BossBarColor -> Bool
< :: BossBarColor -> BossBarColor -> Bool
$c<= :: BossBarColor -> BossBarColor -> Bool
<= :: BossBarColor -> BossBarColor -> Bool
$c> :: BossBarColor -> BossBarColor -> Bool
> :: BossBarColor -> BossBarColor -> Bool
$c>= :: BossBarColor -> BossBarColor -> Bool
>= :: BossBarColor -> BossBarColor -> Bool
$cmax :: BossBarColor -> BossBarColor -> BossBarColor
max :: BossBarColor -> BossBarColor -> BossBarColor
$cmin :: BossBarColor -> BossBarColor -> BossBarColor
min :: BossBarColor -> BossBarColor -> BossBarColor
Ord, Int -> BossBarColor -> String -> String
[BossBarColor] -> String -> String
BossBarColor -> String
(Int -> BossBarColor -> String -> String)
-> (BossBarColor -> String)
-> ([BossBarColor] -> String -> String)
-> Show BossBarColor
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> BossBarColor -> String -> String
showsPrec :: Int -> BossBarColor -> String -> String
$cshow :: BossBarColor -> String
show :: BossBarColor -> String
$cshowList :: [BossBarColor] -> String -> String
showList :: [BossBarColor] -> String -> String
Show, ReadPrec [BossBarColor]
ReadPrec BossBarColor
Int -> ReadS BossBarColor
ReadS [BossBarColor]
(Int -> ReadS BossBarColor)
-> ReadS [BossBarColor]
-> ReadPrec BossBarColor
-> ReadPrec [BossBarColor]
-> Read BossBarColor
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS BossBarColor
readsPrec :: Int -> ReadS BossBarColor
$creadList :: ReadS [BossBarColor]
readList :: ReadS [BossBarColor]
$creadPrec :: ReadPrec BossBarColor
readPrec :: ReadPrec BossBarColor
$creadListPrec :: ReadPrec [BossBarColor]
readListPrec :: ReadPrec [BossBarColor]
Read)
deriving stock (Int -> BossBarColor
BossBarColor -> Int
BossBarColor -> [BossBarColor]
BossBarColor -> BossBarColor
BossBarColor -> BossBarColor -> [BossBarColor]
BossBarColor -> BossBarColor -> BossBarColor -> [BossBarColor]
(BossBarColor -> BossBarColor)
-> (BossBarColor -> BossBarColor)
-> (Int -> BossBarColor)
-> (BossBarColor -> Int)
-> (BossBarColor -> [BossBarColor])
-> (BossBarColor -> BossBarColor -> [BossBarColor])
-> (BossBarColor -> BossBarColor -> [BossBarColor])
-> (BossBarColor -> BossBarColor -> BossBarColor -> [BossBarColor])
-> Enum BossBarColor
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: BossBarColor -> BossBarColor
succ :: BossBarColor -> BossBarColor
$cpred :: BossBarColor -> BossBarColor
pred :: BossBarColor -> BossBarColor
$ctoEnum :: Int -> BossBarColor
toEnum :: Int -> BossBarColor
$cfromEnum :: BossBarColor -> Int
fromEnum :: BossBarColor -> Int
$cenumFrom :: BossBarColor -> [BossBarColor]
enumFrom :: BossBarColor -> [BossBarColor]
$cenumFromThen :: BossBarColor -> BossBarColor -> [BossBarColor]
enumFromThen :: BossBarColor -> BossBarColor -> [BossBarColor]
$cenumFromTo :: BossBarColor -> BossBarColor -> [BossBarColor]
enumFromTo :: BossBarColor -> BossBarColor -> [BossBarColor]
$cenumFromThenTo :: BossBarColor -> BossBarColor -> BossBarColor -> [BossBarColor]
enumFromThenTo :: BossBarColor -> BossBarColor -> BossBarColor -> [BossBarColor]
Enum, BossBarColor
BossBarColor -> BossBarColor -> Bounded BossBarColor
forall a. a -> a -> Bounded a
$cminBound :: BossBarColor
minBound :: BossBarColor
$cmaxBound :: BossBarColor
maxBound :: BossBarColor
Bounded, (forall x. BossBarColor -> Rep BossBarColor x)
-> (forall x. Rep BossBarColor x -> BossBarColor)
-> Generic BossBarColor
forall x. Rep BossBarColor x -> BossBarColor
forall x. BossBarColor -> Rep BossBarColor x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. BossBarColor -> Rep BossBarColor x
from :: forall x. BossBarColor -> Rep BossBarColor x
$cto :: forall x. Rep BossBarColor x -> BossBarColor
to :: forall x. Rep BossBarColor x -> BossBarColor
Generic, Typeable BossBarColor
Typeable BossBarColor =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> BossBarColor -> c BossBarColor)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c BossBarColor)
-> (BossBarColor -> Constr)
-> (BossBarColor -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c BossBarColor))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c BossBarColor))
-> ((forall b. Data b => b -> b) -> BossBarColor -> BossBarColor)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r)
-> (forall u. (forall d. Data d => d -> u) -> BossBarColor -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> BossBarColor -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor)
-> Data BossBarColor
BossBarColor -> Constr
BossBarColor -> DataType
(forall b. Data b => b -> b) -> BossBarColor -> BossBarColor
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> BossBarColor -> u
forall u. (forall d. Data d => d -> u) -> BossBarColor -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c BossBarColor
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> BossBarColor -> c BossBarColor
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c BossBarColor)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c BossBarColor)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> BossBarColor -> c BossBarColor
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> BossBarColor -> c BossBarColor
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c BossBarColor
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c BossBarColor
$ctoConstr :: BossBarColor -> Constr
toConstr :: BossBarColor -> Constr
$cdataTypeOf :: BossBarColor -> DataType
dataTypeOf :: BossBarColor -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c BossBarColor)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c BossBarColor)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c BossBarColor)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c BossBarColor)
$cgmapT :: (forall b. Data b => b -> b) -> BossBarColor -> BossBarColor
gmapT :: (forall b. Data b => b -> b) -> BossBarColor -> BossBarColor
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> BossBarColor -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> BossBarColor -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> BossBarColor -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> BossBarColor -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> BossBarColor -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> BossBarColor -> m BossBarColor
Data, Typeable, (forall (m :: * -> *). Quote m => BossBarColor -> m Exp)
-> (forall (m :: * -> *).
Quote m =>
BossBarColor -> Code m BossBarColor)
-> Lift BossBarColor
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => BossBarColor -> m Exp
forall (m :: * -> *).
Quote m =>
BossBarColor -> Code m BossBarColor
$clift :: forall (m :: * -> *). Quote m => BossBarColor -> m Exp
lift :: forall (m :: * -> *). Quote m => BossBarColor -> m Exp
$cliftTyped :: forall (m :: * -> *).
Quote m =>
BossBarColor -> Code m BossBarColor
liftTyped :: forall (m :: * -> *).
Quote m =>
BossBarColor -> Code m BossBarColor
Lift)
deriving anyclass (BossBarColor -> ()
(BossBarColor -> ()) -> NFData BossBarColor
forall a. (a -> ()) -> NFData a
$crnf :: BossBarColor -> ()
rnf :: BossBarColor -> ()
NFData, Eq BossBarColor
Eq BossBarColor =>
(Int -> BossBarColor -> Int)
-> (BossBarColor -> Int) -> Hashable BossBarColor
Int -> BossBarColor -> Int
BossBarColor -> Int
forall a. Eq a => (Int -> a -> Int) -> (a -> Int) -> Hashable a
$chashWithSalt :: Int -> BossBarColor -> Int
hashWithSalt :: Int -> BossBarColor -> Int
$chash :: BossBarColor -> Int
hash :: BossBarColor -> Int
Hashable)
newtype KeepAlive = KeepAlive
{KeepAlive -> Int64
id :: Int64}
deriving newtype (Int -> KeepAlive -> String -> String
[KeepAlive] -> String -> String
KeepAlive -> String
(Int -> KeepAlive -> String -> String)
-> (KeepAlive -> String)
-> ([KeepAlive] -> String -> String)
-> Show KeepAlive
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> KeepAlive -> String -> String
showsPrec :: Int -> KeepAlive -> String -> String
$cshow :: KeepAlive -> String
show :: KeepAlive -> String
$cshowList :: [KeepAlive] -> String -> String
showList :: [KeepAlive] -> String -> String
Show, ReadPrec [KeepAlive]
ReadPrec KeepAlive
Int -> ReadS KeepAlive
ReadS [KeepAlive]
(Int -> ReadS KeepAlive)
-> ReadS [KeepAlive]
-> ReadPrec KeepAlive
-> ReadPrec [KeepAlive]
-> Read KeepAlive
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS KeepAlive
readsPrec :: Int -> ReadS KeepAlive
$creadList :: ReadS [KeepAlive]
readList :: ReadS [KeepAlive]
$creadPrec :: ReadPrec KeepAlive
readPrec :: ReadPrec KeepAlive
$creadListPrec :: ReadPrec [KeepAlive]
readListPrec :: ReadPrec [KeepAlive]
Read, KeepAlive -> ()
(KeepAlive -> ()) -> NFData KeepAlive
forall a. (a -> ()) -> NFData a
$crnf :: KeepAlive -> ()
rnf :: KeepAlive -> ()
NFData, KeepAlive -> KeepAlive -> Bool
(KeepAlive -> KeepAlive -> Bool)
-> (KeepAlive -> KeepAlive -> Bool) -> Eq KeepAlive
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: KeepAlive -> KeepAlive -> Bool
== :: KeepAlive -> KeepAlive -> Bool
$c/= :: KeepAlive -> KeepAlive -> Bool
/= :: KeepAlive -> KeepAlive -> Bool
Eq, Eq KeepAlive
Eq KeepAlive =>
(KeepAlive -> KeepAlive -> Ordering)
-> (KeepAlive -> KeepAlive -> Bool)
-> (KeepAlive -> KeepAlive -> Bool)
-> (KeepAlive -> KeepAlive -> Bool)
-> (KeepAlive -> KeepAlive -> Bool)
-> (KeepAlive -> KeepAlive -> KeepAlive)
-> (KeepAlive -> KeepAlive -> KeepAlive)
-> Ord KeepAlive
KeepAlive -> KeepAlive -> Bool
KeepAlive -> KeepAlive -> Ordering
KeepAlive -> KeepAlive -> KeepAlive
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
$ccompare :: KeepAlive -> KeepAlive -> Ordering
compare :: KeepAlive -> KeepAlive -> Ordering
$c< :: KeepAlive -> KeepAlive -> Bool
< :: KeepAlive -> KeepAlive -> Bool
$c<= :: KeepAlive -> KeepAlive -> Bool
<= :: KeepAlive -> KeepAlive -> Bool
$c> :: KeepAlive -> KeepAlive -> Bool
> :: KeepAlive -> KeepAlive -> Bool
$c>= :: KeepAlive -> KeepAlive -> Bool
>= :: KeepAlive -> KeepAlive -> Bool
$cmax :: KeepAlive -> KeepAlive -> KeepAlive
max :: KeepAlive -> KeepAlive -> KeepAlive
$cmin :: KeepAlive -> KeepAlive -> KeepAlive
min :: KeepAlive -> KeepAlive -> KeepAlive
Ord, KeepAlive -> Builder
(KeepAlive -> Builder) -> Pack KeepAlive
forall a. (a -> Builder) -> Pack a
$cpack :: KeepAlive -> Builder
pack :: KeepAlive -> Builder
Pack, (forall (st :: ZeroBitType) r. Parser st r KeepAlive)
-> Unpack KeepAlive
forall (st :: ZeroBitType) r. Parser st r KeepAlive
forall a. (forall (st :: ZeroBitType) r. Parser st r a) -> Unpack a
$cunpack :: forall (st :: ZeroBitType) r. Parser st r KeepAlive
unpack :: forall (st :: ZeroBitType) r. Parser st r KeepAlive
Unpack)
deriving stock (Typeable KeepAlive
Typeable KeepAlive =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> KeepAlive -> c KeepAlive)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c KeepAlive)
-> (KeepAlive -> Constr)
-> (KeepAlive -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c KeepAlive))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeepAlive))
-> ((forall b. Data b => b -> b) -> KeepAlive -> KeepAlive)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r)
-> (forall u. (forall d. Data d => d -> u) -> KeepAlive -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> KeepAlive -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive)
-> Data KeepAlive
KeepAlive -> Constr
KeepAlive -> DataType
(forall b. Data b => b -> b) -> KeepAlive -> KeepAlive
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> KeepAlive -> u
forall u. (forall d. Data d => d -> u) -> KeepAlive -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c KeepAlive
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> KeepAlive -> c KeepAlive
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c KeepAlive)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeepAlive)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> KeepAlive -> c KeepAlive
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> KeepAlive -> c KeepAlive
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c KeepAlive
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c KeepAlive
$ctoConstr :: KeepAlive -> Constr
toConstr :: KeepAlive -> Constr
$cdataTypeOf :: KeepAlive -> DataType
dataTypeOf :: KeepAlive -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c KeepAlive)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c KeepAlive)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeepAlive)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeepAlive)
$cgmapT :: (forall b. Data b => b -> b) -> KeepAlive -> KeepAlive
gmapT :: (forall b. Data b => b -> b) -> KeepAlive -> KeepAlive
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> KeepAlive -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> KeepAlive -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> KeepAlive -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> KeepAlive -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> KeepAlive -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> KeepAlive -> m KeepAlive
Data, Typeable, (forall x. KeepAlive -> Rep KeepAlive x)
-> (forall x. Rep KeepAlive x -> KeepAlive) -> Generic KeepAlive
forall x. Rep KeepAlive x -> KeepAlive
forall x. KeepAlive -> Rep KeepAlive x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. KeepAlive -> Rep KeepAlive x
from :: forall x. KeepAlive -> Rep KeepAlive x
$cto :: forall x. Rep KeepAlive x -> KeepAlive
to :: forall x. Rep KeepAlive x -> KeepAlive
Generic)
data PluginMessage = PluginMessage
{ PluginMessage -> Text
channel :: Text,
PluginMessage -> ByteString
data_ :: ByteString
}
deriving (Int -> PluginMessage -> String -> String
[PluginMessage] -> String -> String
PluginMessage -> String
(Int -> PluginMessage -> String -> String)
-> (PluginMessage -> String)
-> ([PluginMessage] -> String -> String)
-> Show PluginMessage
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> PluginMessage -> String -> String
showsPrec :: Int -> PluginMessage -> String -> String
$cshow :: PluginMessage -> String
show :: PluginMessage -> String
$cshowList :: [PluginMessage] -> String -> String
showList :: [PluginMessage] -> String -> String
Show, ReadPrec [PluginMessage]
ReadPrec PluginMessage
Int -> ReadS PluginMessage
ReadS [PluginMessage]
(Int -> ReadS PluginMessage)
-> ReadS [PluginMessage]
-> ReadPrec PluginMessage
-> ReadPrec [PluginMessage]
-> Read PluginMessage
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS PluginMessage
readsPrec :: Int -> ReadS PluginMessage
$creadList :: ReadS [PluginMessage]
readList :: ReadS [PluginMessage]
$creadPrec :: ReadPrec PluginMessage
readPrec :: ReadPrec PluginMessage
$creadListPrec :: ReadPrec [PluginMessage]
readListPrec :: ReadPrec [PluginMessage]
Read, Typeable PluginMessage
Typeable PluginMessage =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> PluginMessage -> c PluginMessage)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c PluginMessage)
-> (PluginMessage -> Constr)
-> (PluginMessage -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c PluginMessage))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c PluginMessage))
-> ((forall b. Data b => b -> b) -> PluginMessage -> PluginMessage)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r)
-> (forall u. (forall d. Data d => d -> u) -> PluginMessage -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> PluginMessage -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage)
-> Data PluginMessage
PluginMessage -> Constr
PluginMessage -> DataType
(forall b. Data b => b -> b) -> PluginMessage -> PluginMessage
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> PluginMessage -> u
forall u. (forall d. Data d => d -> u) -> PluginMessage -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c PluginMessage
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> PluginMessage -> c PluginMessage
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c PluginMessage)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c PluginMessage)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> PluginMessage -> c PluginMessage
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> PluginMessage -> c PluginMessage
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c PluginMessage
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c PluginMessage
$ctoConstr :: PluginMessage -> Constr
toConstr :: PluginMessage -> Constr
$cdataTypeOf :: PluginMessage -> DataType
dataTypeOf :: PluginMessage -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c PluginMessage)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c PluginMessage)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c PluginMessage)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c PluginMessage)
$cgmapT :: (forall b. Data b => b -> b) -> PluginMessage -> PluginMessage
gmapT :: (forall b. Data b => b -> b) -> PluginMessage -> PluginMessage
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> PluginMessage -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> PluginMessage -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> PluginMessage -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> PluginMessage -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> PluginMessage -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> PluginMessage -> m PluginMessage
Data, Typeable, (forall x. PluginMessage -> Rep PluginMessage x)
-> (forall x. Rep PluginMessage x -> PluginMessage)
-> Generic PluginMessage
forall x. Rep PluginMessage x -> PluginMessage
forall x. PluginMessage -> Rep PluginMessage x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. PluginMessage -> Rep PluginMessage x
from :: forall x. PluginMessage -> Rep PluginMessage x
$cto :: forall x. Rep PluginMessage x -> PluginMessage
to :: forall x. Rep PluginMessage x -> PluginMessage
Generic, PluginMessage -> ()
(PluginMessage -> ()) -> NFData PluginMessage
forall a. (a -> ()) -> NFData a
$crnf :: PluginMessage -> ()
rnf :: PluginMessage -> ()
NFData, PluginMessage -> PluginMessage -> Bool
(PluginMessage -> PluginMessage -> Bool)
-> (PluginMessage -> PluginMessage -> Bool) -> Eq PluginMessage
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PluginMessage -> PluginMessage -> Bool
== :: PluginMessage -> PluginMessage -> Bool
$c/= :: PluginMessage -> PluginMessage -> Bool
/= :: PluginMessage -> PluginMessage -> Bool
Eq, Eq PluginMessage
Eq PluginMessage =>
(PluginMessage -> PluginMessage -> Ordering)
-> (PluginMessage -> PluginMessage -> Bool)
-> (PluginMessage -> PluginMessage -> Bool)
-> (PluginMessage -> PluginMessage -> Bool)
-> (PluginMessage -> PluginMessage -> Bool)
-> (PluginMessage -> PluginMessage -> PluginMessage)
-> (PluginMessage -> PluginMessage -> PluginMessage)
-> Ord PluginMessage
PluginMessage -> PluginMessage -> Bool
PluginMessage -> PluginMessage -> Ordering
PluginMessage -> PluginMessage -> PluginMessage
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
$ccompare :: PluginMessage -> PluginMessage -> Ordering
compare :: PluginMessage -> PluginMessage -> Ordering
$c< :: PluginMessage -> PluginMessage -> Bool
< :: PluginMessage -> PluginMessage -> Bool
$c<= :: PluginMessage -> PluginMessage -> Bool
<= :: PluginMessage -> PluginMessage -> Bool
$c> :: PluginMessage -> PluginMessage -> Bool
> :: PluginMessage -> PluginMessage -> Bool
$c>= :: PluginMessage -> PluginMessage -> Bool
>= :: PluginMessage -> PluginMessage -> Bool
$cmax :: PluginMessage -> PluginMessage -> PluginMessage
max :: PluginMessage -> PluginMessage -> PluginMessage
$cmin :: PluginMessage -> PluginMessage -> PluginMessage
min :: PluginMessage -> PluginMessage -> PluginMessage
Ord)
deriving (PluginMessage -> Builder
(PluginMessage -> Builder) -> Pack PluginMessage
forall a. (a -> Builder) -> Pack a
$cpack :: PluginMessage -> Builder
pack :: PluginMessage -> Builder
Pack, (forall (st :: ZeroBitType) r. Parser st r PluginMessage)
-> Unpack PluginMessage
forall (st :: ZeroBitType) r. Parser st r PluginMessage
forall a. (forall (st :: ZeroBitType) r. Parser st r a) -> Unpack a
$cunpack :: forall (st :: ZeroBitType) r. Parser st r PluginMessage
unpack :: forall (st :: ZeroBitType) r. Parser st r PluginMessage
Unpack)
data ResourcePack = ResourcePack
{ ResourcePack -> Text
url :: Text,
ResourcePack -> Text
hash :: Text
}
deriving (Int -> ResourcePack -> String -> String
[ResourcePack] -> String -> String
ResourcePack -> String
(Int -> ResourcePack -> String -> String)
-> (ResourcePack -> String)
-> ([ResourcePack] -> String -> String)
-> Show ResourcePack
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> ResourcePack -> String -> String
showsPrec :: Int -> ResourcePack -> String -> String
$cshow :: ResourcePack -> String
show :: ResourcePack -> String
$cshowList :: [ResourcePack] -> String -> String
showList :: [ResourcePack] -> String -> String
Show, ReadPrec [ResourcePack]
ReadPrec ResourcePack
Int -> ReadS ResourcePack
ReadS [ResourcePack]
(Int -> ReadS ResourcePack)
-> ReadS [ResourcePack]
-> ReadPrec ResourcePack
-> ReadPrec [ResourcePack]
-> Read ResourcePack
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS ResourcePack
readsPrec :: Int -> ReadS ResourcePack
$creadList :: ReadS [ResourcePack]
readList :: ReadS [ResourcePack]
$creadPrec :: ReadPrec ResourcePack
readPrec :: ReadPrec ResourcePack
$creadListPrec :: ReadPrec [ResourcePack]
readListPrec :: ReadPrec [ResourcePack]
Read, Typeable ResourcePack
Typeable ResourcePack =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ResourcePack -> c ResourcePack)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ResourcePack)
-> (ResourcePack -> Constr)
-> (ResourcePack -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ResourcePack))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ResourcePack))
-> ((forall b. Data b => b -> b) -> ResourcePack -> ResourcePack)
-> (forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r)
-> (forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r)
-> (forall u. (forall d. Data d => d -> u) -> ResourcePack -> [u])
-> (forall u.
Int -> (forall d. Data d => d -> u) -> ResourcePack -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack)
-> Data ResourcePack
ResourcePack -> Constr
ResourcePack -> DataType
(forall b. Data b => b -> b) -> ResourcePack -> ResourcePack
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> ResourcePack -> u
forall u. (forall d. Data d => d -> u) -> ResourcePack -> [u]
forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ResourcePack
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ResourcePack -> c ResourcePack
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ResourcePack)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ResourcePack)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ResourcePack -> c ResourcePack
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> ResourcePack -> c ResourcePack
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ResourcePack
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c ResourcePack
$ctoConstr :: ResourcePack -> Constr
toConstr :: ResourcePack -> Constr
$cdataTypeOf :: ResourcePack -> DataType
dataTypeOf :: ResourcePack -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ResourcePack)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c ResourcePack)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ResourcePack)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e))
-> Maybe (c ResourcePack)
$cgmapT :: (forall b. Data b => b -> b) -> ResourcePack -> ResourcePack
gmapT :: (forall b. Data b => b -> b) -> ResourcePack -> ResourcePack
$cgmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
gmapQl :: forall r r'.
(r -> r' -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
$cgmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
gmapQr :: forall r r'.
(r' -> r -> r)
-> r -> (forall d. Data d => d -> r') -> ResourcePack -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> ResourcePack -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> ResourcePack -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> ResourcePack -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> ResourcePack -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> ResourcePack -> m ResourcePack
Data, Typeable, (forall x. ResourcePack -> Rep ResourcePack x)
-> (forall x. Rep ResourcePack x -> ResourcePack)
-> Generic ResourcePack
forall x. Rep ResourcePack x -> ResourcePack
forall x. ResourcePack -> Rep ResourcePack x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. ResourcePack -> Rep ResourcePack x
from :: forall x. ResourcePack -> Rep ResourcePack x
$cto :: forall x. Rep ResourcePack x -> ResourcePack
to :: forall x. Rep ResourcePack x -> ResourcePack
Generic, ResourcePack -> ()
(ResourcePack -> ()) -> NFData ResourcePack
forall a. (a -> ()) -> NFData a
$crnf :: ResourcePack -> ()
rnf :: ResourcePack -> ()
NFData, ResourcePack -> ResourcePack -> Bool
(ResourcePack -> ResourcePack -> Bool)
-> (ResourcePack -> ResourcePack -> Bool) -> Eq ResourcePack
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ResourcePack -> ResourcePack -> Bool
== :: ResourcePack -> ResourcePack -> Bool
$c/= :: ResourcePack -> ResourcePack -> Bool
/= :: ResourcePack -> ResourcePack -> Bool
Eq, Eq ResourcePack
Eq ResourcePack =>
(ResourcePack -> ResourcePack -> Ordering)
-> (ResourcePack -> ResourcePack -> Bool)
-> (ResourcePack -> ResourcePack -> Bool)
-> (ResourcePack -> ResourcePack -> Bool)
-> (ResourcePack -> ResourcePack -> Bool)
-> (ResourcePack -> ResourcePack -> ResourcePack)
-> (ResourcePack -> ResourcePack -> ResourcePack)
-> Ord ResourcePack
ResourcePack -> ResourcePack -> Bool
ResourcePack -> ResourcePack -> Ordering
ResourcePack -> ResourcePack -> ResourcePack
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
$ccompare :: ResourcePack -> ResourcePack -> Ordering
compare :: ResourcePack -> ResourcePack -> Ordering
$c< :: ResourcePack -> ResourcePack -> Bool
< :: ResourcePack -> ResourcePack -> Bool
$c<= :: ResourcePack -> ResourcePack -> Bool
<= :: ResourcePack -> ResourcePack -> Bool
$c> :: ResourcePack -> ResourcePack -> Bool
> :: ResourcePack -> ResourcePack -> Bool
$c>= :: ResourcePack -> ResourcePack -> Bool
>= :: ResourcePack -> ResourcePack -> Bool
$cmax :: ResourcePack -> ResourcePack -> ResourcePack
max :: ResourcePack -> ResourcePack -> ResourcePack
$cmin :: ResourcePack -> ResourcePack -> ResourcePack
min :: ResourcePack -> ResourcePack -> ResourcePack
Ord)
deriving (ResourcePack -> Builder
(ResourcePack -> Builder) -> Pack ResourcePack
forall a. (a -> Builder) -> Pack a
$cpack :: ResourcePack -> Builder
pack :: ResourcePack -> Builder
Pack, (forall (st :: ZeroBitType) r. Parser st r ResourcePack)
-> Unpack ResourcePack
forall (st :: ZeroBitType) r. Parser st r ResourcePack
forall a. (forall (st :: ZeroBitType) r. Parser st r a) -> Unpack a
$cunpack :: forall (st :: ZeroBitType) r. Parser st r ResourcePack
unpack :: forall (st :: ZeroBitType) r. Parser st r ResourcePack
Unpack)
newtype Ping = Ping
{Ping -> Int32
id :: Int32}
deriving newtype (Int -> Ping -> String -> String
[Ping] -> String -> String
Ping -> String
(Int -> Ping -> String -> String)
-> (Ping -> String) -> ([Ping] -> String -> String) -> Show Ping
forall a.
(Int -> a -> String -> String)
-> (a -> String) -> ([a] -> String -> String) -> Show a
$cshowsPrec :: Int -> Ping -> String -> String
showsPrec :: Int -> Ping -> String -> String
$cshow :: Ping -> String
show :: Ping -> String
$cshowList :: [Ping] -> String -> String
showList :: [Ping] -> String -> String
Show, ReadPrec [Ping]
ReadPrec Ping
Int -> ReadS Ping
ReadS [Ping]
(Int -> ReadS Ping)
-> ReadS [Ping] -> ReadPrec Ping -> ReadPrec [Ping] -> Read Ping
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS Ping
readsPrec :: Int -> ReadS Ping
$creadList :: ReadS [Ping]
readList :: ReadS [Ping]
$creadPrec :: ReadPrec Ping
readPrec :: ReadPrec Ping
$creadListPrec :: ReadPrec [Ping]
readListPrec :: ReadPrec [Ping]
Read, Ping -> ()
(Ping -> ()) -> NFData Ping
forall a. (a -> ()) -> NFData a
$crnf :: Ping -> ()
rnf :: Ping -> ()
NFData, Ping -> Ping -> Bool
(Ping -> Ping -> Bool) -> (Ping -> Ping -> Bool) -> Eq Ping
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Ping -> Ping -> Bool
== :: Ping -> Ping -> Bool
$c/= :: Ping -> Ping -> Bool
/= :: Ping -> Ping -> Bool
Eq, Eq Ping
Eq Ping =>
(Ping -> Ping -> Ordering)
-> (Ping -> Ping -> Bool)
-> (Ping -> Ping -> Bool)
-> (Ping -> Ping -> Bool)
-> (Ping -> Ping -> Bool)
-> (Ping -> Ping -> Ping)
-> (Ping -> Ping -> Ping)
-> Ord Ping
Ping -> Ping -> Bool
Ping -> Ping -> Ordering
Ping -> Ping -> Ping
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
$ccompare :: Ping -> Ping -> Ordering
compare :: Ping -> Ping -> Ordering
$c< :: Ping -> Ping -> Bool
< :: Ping -> Ping -> Bool
$c<= :: Ping -> Ping -> Bool
<= :: Ping -> Ping -> Bool
$c> :: Ping -> Ping -> Bool
> :: Ping -> Ping -> Bool
$c>= :: Ping -> Ping -> Bool
>= :: Ping -> Ping -> Bool
$cmax :: Ping -> Ping -> Ping
max :: Ping -> Ping -> Ping
$cmin :: Ping -> Ping -> Ping
min :: Ping -> Ping -> Ping
Ord, Ping -> Builder
(Ping -> Builder) -> Pack Ping
forall a. (a -> Builder) -> Pack a
$cpack :: Ping -> Builder
pack :: Ping -> Builder
Pack, (forall (st :: ZeroBitType) r. Parser st r Ping) -> Unpack Ping
forall (st :: ZeroBitType) r. Parser st r Ping
forall a. (forall (st :: ZeroBitType) r. Parser st r a) -> Unpack a
$cunpack :: forall (st :: ZeroBitType) r. Parser st r Ping
unpack :: forall (st :: ZeroBitType) r. Parser st r Ping
Unpack)
deriving stock (Typeable Ping
Typeable Ping =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Ping -> c Ping)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Ping)
-> (Ping -> Constr)
-> (Ping -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Ping))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ping))
-> ((forall b. Data b => b -> b) -> Ping -> Ping)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r)
-> (forall u. (forall d. Data d => d -> u) -> Ping -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> Ping -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping)
-> Data Ping
Ping -> Constr
Ping -> DataType
(forall b. Data b => b -> b) -> Ping -> Ping
forall a.
Typeable a =>
(forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> a -> c a)
-> (forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c a)
-> (a -> Constr)
-> (a -> DataType)
-> (forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c a))
-> (forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a))
-> ((forall b. Data b => b -> b) -> a -> a)
-> (forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r)
-> (forall u. (forall d. Data d => d -> u) -> a -> [u])
-> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u)
-> (forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> (forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> a -> m a)
-> Data a
forall u. Int -> (forall d. Data d => d -> u) -> Ping -> u
forall u. (forall d. Data d => d -> u) -> Ping -> [u]
forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Ping
forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Ping -> c Ping
forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Ping)
forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ping)
$cgfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Ping -> c Ping
gfoldl :: forall (c :: * -> *).
(forall d b. Data d => c (d -> b) -> d -> c b)
-> (forall g. g -> c g) -> Ping -> c Ping
$cgunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Ping
gunfold :: forall (c :: * -> *).
(forall b r. Data b => c (b -> r) -> c r)
-> (forall r. r -> c r) -> Constr -> c Ping
$ctoConstr :: Ping -> Constr
toConstr :: Ping -> Constr
$cdataTypeOf :: Ping -> DataType
dataTypeOf :: Ping -> DataType
$cdataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Ping)
dataCast1 :: forall (t :: * -> *) (c :: * -> *).
Typeable t =>
(forall d. Data d => c (t d)) -> Maybe (c Ping)
$cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ping)
dataCast2 :: forall (t :: * -> * -> *) (c :: * -> *).
Typeable t =>
(forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ping)
$cgmapT :: (forall b. Data b => b -> b) -> Ping -> Ping
gmapT :: (forall b. Data b => b -> b) -> Ping -> Ping
$cgmapQl :: forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
gmapQl :: forall r r'.
(r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
$cgmapQr :: forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
gmapQr :: forall r r'.
(r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ping -> r
$cgmapQ :: forall u. (forall d. Data d => d -> u) -> Ping -> [u]
gmapQ :: forall u. (forall d. Data d => d -> u) -> Ping -> [u]
$cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> Ping -> u
gmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> Ping -> u
$cgmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
gmapM :: forall (m :: * -> *).
Monad m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
$cgmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
gmapMp :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
$cgmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
gmapMo :: forall (m :: * -> *).
MonadPlus m =>
(forall d. Data d => d -> m d) -> Ping -> m Ping
Data, Typeable, (forall x. Ping -> Rep Ping x)
-> (forall x. Rep Ping x -> Ping) -> Generic Ping
forall x. Rep Ping x -> Ping
forall x. Ping -> Rep Ping x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. Ping -> Rep Ping x
from :: forall x. Ping -> Rep Ping x
$cto :: forall x. Rep Ping x -> Ping
to :: forall x. Rep Ping x -> Ping
Generic)
setdefaultderives
addproperderives [''NFData, ''Typeable, ''Show, ''Eq]
[pkmacro|
data DisplayedSkinParts {
cape :: Bool,
jacket :: Bool,
leftsleeve :: Bool,
rightsleeve :: Bool,
leftpants :: Bool,
rightpants :: Bool,
hat :: Bool,
}
|]
instance
(Bits i, Integral i, Pack i, Unpack i) =>
Bitreppable i DisplayedSkinParts