module OpenAI.V1.DeletionStatus
(
DeletionStatus(..)
) where
import OpenAI.Prelude
data DeletionStatus = DeletionStatus
{ DeletionStatus -> Text
id :: Text
, DeletionStatus -> Text
object :: Text
, DeletionStatus -> Bool
deleted :: Bool
} deriving stock ((forall x. DeletionStatus -> Rep DeletionStatus x)
-> (forall x. Rep DeletionStatus x -> DeletionStatus)
-> Generic DeletionStatus
forall x. Rep DeletionStatus x -> DeletionStatus
forall x. DeletionStatus -> Rep DeletionStatus x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. DeletionStatus -> Rep DeletionStatus x
from :: forall x. DeletionStatus -> Rep DeletionStatus x
$cto :: forall x. Rep DeletionStatus x -> DeletionStatus
to :: forall x. Rep DeletionStatus x -> DeletionStatus
Generic, Int -> DeletionStatus -> ShowS
[DeletionStatus] -> ShowS
DeletionStatus -> String
(Int -> DeletionStatus -> ShowS)
-> (DeletionStatus -> String)
-> ([DeletionStatus] -> ShowS)
-> Show DeletionStatus
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DeletionStatus -> ShowS
showsPrec :: Int -> DeletionStatus -> ShowS
$cshow :: DeletionStatus -> String
show :: DeletionStatus -> String
$cshowList :: [DeletionStatus] -> ShowS
showList :: [DeletionStatus] -> ShowS
Show)
deriving anyclass (Maybe DeletionStatus
Value -> Parser [DeletionStatus]
Value -> Parser DeletionStatus
(Value -> Parser DeletionStatus)
-> (Value -> Parser [DeletionStatus])
-> Maybe DeletionStatus
-> FromJSON DeletionStatus
forall a.
(Value -> Parser a)
-> (Value -> Parser [a]) -> Maybe a -> FromJSON a
$cparseJSON :: Value -> Parser DeletionStatus
parseJSON :: Value -> Parser DeletionStatus
$cparseJSONList :: Value -> Parser [DeletionStatus]
parseJSONList :: Value -> Parser [DeletionStatus]
$comittedField :: Maybe DeletionStatus
omittedField :: Maybe DeletionStatus
FromJSON)