{-# LANGUAGE DeriveAnyClass #-}

module Hercules.Agent.WorkerProtocol.Event.DaemonStarted where

import Data.Binary
import Protolude

data DaemonStarted = DaemonStarted
  {DaemonStarted -> Bool
_dummy :: Bool {- make its binary representation non-empty -}}
  deriving ((forall x. DaemonStarted -> Rep DaemonStarted x)
-> (forall x. Rep DaemonStarted x -> DaemonStarted)
-> Generic DaemonStarted
forall x. Rep DaemonStarted x -> DaemonStarted
forall x. DaemonStarted -> Rep DaemonStarted x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DaemonStarted x -> DaemonStarted
$cfrom :: forall x. DaemonStarted -> Rep DaemonStarted x
Generic, Get DaemonStarted
[DaemonStarted] -> Put
DaemonStarted -> Put
(DaemonStarted -> Put)
-> Get DaemonStarted
-> ([DaemonStarted] -> Put)
-> Binary DaemonStarted
forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t
putList :: [DaemonStarted] -> Put
$cputList :: [DaemonStarted] -> Put
get :: Get DaemonStarted
$cget :: Get DaemonStarted
put :: DaemonStarted -> Put
$cput :: DaemonStarted -> Put
Binary, Int -> DaemonStarted -> ShowS
[DaemonStarted] -> ShowS
DaemonStarted -> String
(Int -> DaemonStarted -> ShowS)
-> (DaemonStarted -> String)
-> ([DaemonStarted] -> ShowS)
-> Show DaemonStarted
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DaemonStarted] -> ShowS
$cshowList :: [DaemonStarted] -> ShowS
show :: DaemonStarted -> String
$cshow :: DaemonStarted -> String
showsPrec :: Int -> DaemonStarted -> ShowS
$cshowsPrec :: Int -> DaemonStarted -> ShowS
Show, DaemonStarted -> DaemonStarted -> Bool
(DaemonStarted -> DaemonStarted -> Bool)
-> (DaemonStarted -> DaemonStarted -> Bool) -> Eq DaemonStarted
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DaemonStarted -> DaemonStarted -> Bool
$c/= :: DaemonStarted -> DaemonStarted -> Bool
== :: DaemonStarted -> DaemonStarted -> Bool
$c== :: DaemonStarted -> DaemonStarted -> Bool
Eq)