module Effectful.Zoo.Amazonka.Data.AwsLogEntry
  ( AwsLogEntry(..),
  ) where

import Data.ByteString.Builder
import Effectful.Zoo.Amazonka.Data.AwsLogLevel
import HaskellWorks.Prelude

data AwsLogEntry = AwsLogEntry
  { AwsLogEntry -> CallStack
callStack :: CallStack
  , AwsLogEntry -> AwsLogLevel
logLevel  :: AwsLogLevel
  , AwsLogEntry -> Builder
builder   :: Builder
  }
  deriving stock (forall x. AwsLogEntry -> Rep AwsLogEntry x)
-> (forall x. Rep AwsLogEntry x -> AwsLogEntry)
-> Generic AwsLogEntry
forall x. Rep AwsLogEntry x -> AwsLogEntry
forall x. AwsLogEntry -> Rep AwsLogEntry x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. AwsLogEntry -> Rep AwsLogEntry x
from :: forall x. AwsLogEntry -> Rep AwsLogEntry x
$cto :: forall x. Rep AwsLogEntry x -> AwsLogEntry
to :: forall x. Rep AwsLogEntry x -> AwsLogEntry
Generic
  deriving stock Int -> AwsLogEntry -> ShowS
[AwsLogEntry] -> ShowS
AwsLogEntry -> String
(Int -> AwsLogEntry -> ShowS)
-> (AwsLogEntry -> String)
-> ([AwsLogEntry] -> ShowS)
-> Show AwsLogEntry
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AwsLogEntry -> ShowS
showsPrec :: Int -> AwsLogEntry -> ShowS
$cshow :: AwsLogEntry -> String
show :: AwsLogEntry -> String
$cshowList :: [AwsLogEntry] -> ShowS
showList :: [AwsLogEntry] -> ShowS
Show
  deriving stock Typeable