{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.Route53Domains.GetOperationDetail
(
GetOperationDetail (..),
newGetOperationDetail,
getOperationDetail_operationId,
GetOperationDetailResponse (..),
newGetOperationDetailResponse,
getOperationDetailResponse_domainName,
getOperationDetailResponse_lastUpdatedDate,
getOperationDetailResponse_message,
getOperationDetailResponse_operationId,
getOperationDetailResponse_status,
getOperationDetailResponse_statusFlag,
getOperationDetailResponse_submittedDate,
getOperationDetailResponse_type,
getOperationDetailResponse_httpStatus,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
import Amazonka.Route53Domains.Types
data GetOperationDetail = GetOperationDetail'
{
GetOperationDetail -> Text
operationId :: Prelude.Text
}
deriving (GetOperationDetail -> GetOperationDetail -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetOperationDetail -> GetOperationDetail -> Bool
$c/= :: GetOperationDetail -> GetOperationDetail -> Bool
== :: GetOperationDetail -> GetOperationDetail -> Bool
$c== :: GetOperationDetail -> GetOperationDetail -> Bool
Prelude.Eq, ReadPrec [GetOperationDetail]
ReadPrec GetOperationDetail
Int -> ReadS GetOperationDetail
ReadS [GetOperationDetail]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetOperationDetail]
$creadListPrec :: ReadPrec [GetOperationDetail]
readPrec :: ReadPrec GetOperationDetail
$creadPrec :: ReadPrec GetOperationDetail
readList :: ReadS [GetOperationDetail]
$creadList :: ReadS [GetOperationDetail]
readsPrec :: Int -> ReadS GetOperationDetail
$creadsPrec :: Int -> ReadS GetOperationDetail
Prelude.Read, Int -> GetOperationDetail -> ShowS
[GetOperationDetail] -> ShowS
GetOperationDetail -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetOperationDetail] -> ShowS
$cshowList :: [GetOperationDetail] -> ShowS
show :: GetOperationDetail -> String
$cshow :: GetOperationDetail -> String
showsPrec :: Int -> GetOperationDetail -> ShowS
$cshowsPrec :: Int -> GetOperationDetail -> ShowS
Prelude.Show, forall x. Rep GetOperationDetail x -> GetOperationDetail
forall x. GetOperationDetail -> Rep GetOperationDetail x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetOperationDetail x -> GetOperationDetail
$cfrom :: forall x. GetOperationDetail -> Rep GetOperationDetail x
Prelude.Generic)
newGetOperationDetail ::
Prelude.Text ->
GetOperationDetail
newGetOperationDetail :: Text -> GetOperationDetail
newGetOperationDetail Text
pOperationId_ =
GetOperationDetail' {$sel:operationId:GetOperationDetail' :: Text
operationId = Text
pOperationId_}
getOperationDetail_operationId :: Lens.Lens' GetOperationDetail Prelude.Text
getOperationDetail_operationId :: Lens' GetOperationDetail Text
getOperationDetail_operationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetail' {Text
operationId :: Text
$sel:operationId:GetOperationDetail' :: GetOperationDetail -> Text
operationId} -> Text
operationId) (\s :: GetOperationDetail
s@GetOperationDetail' {} Text
a -> GetOperationDetail
s {$sel:operationId:GetOperationDetail' :: Text
operationId = Text
a} :: GetOperationDetail)
instance Core.AWSRequest GetOperationDetail where
type
AWSResponse GetOperationDetail =
GetOperationDetailResponse
request :: (Service -> Service)
-> GetOperationDetail -> Request GetOperationDetail
request Service -> Service
overrides =
forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetOperationDetail
-> ClientResponse ClientBody
-> m (Either
Error (ClientResponse (AWSResponse GetOperationDetail)))
response =
forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
( \Int
s ResponseHeaders
h Object
x ->
Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe Text
-> Maybe OperationStatus
-> Maybe StatusFlag
-> Maybe POSIX
-> Maybe OperationType
-> Int
-> GetOperationDetailResponse
GetOperationDetailResponse'
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"DomainName")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"LastUpdatedDate")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Message")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"OperationId")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Status")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"StatusFlag")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"SubmittedDate")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Type")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
)
instance Prelude.Hashable GetOperationDetail where
hashWithSalt :: Int -> GetOperationDetail -> Int
hashWithSalt Int
_salt GetOperationDetail' {Text
operationId :: Text
$sel:operationId:GetOperationDetail' :: GetOperationDetail -> Text
..} =
Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
operationId
instance Prelude.NFData GetOperationDetail where
rnf :: GetOperationDetail -> ()
rnf GetOperationDetail' {Text
operationId :: Text
$sel:operationId:GetOperationDetail' :: GetOperationDetail -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
operationId
instance Data.ToHeaders GetOperationDetail where
toHeaders :: GetOperationDetail -> ResponseHeaders
toHeaders =
forall a b. a -> b -> a
Prelude.const
( forall a. Monoid a => [a] -> a
Prelude.mconcat
[ HeaderName
"X-Amz-Target"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"Route53Domains_v20140515.GetOperationDetail" ::
Prelude.ByteString
),
HeaderName
"Content-Type"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
Prelude.ByteString
)
]
)
instance Data.ToJSON GetOperationDetail where
toJSON :: GetOperationDetail -> Value
toJSON GetOperationDetail' {Text
operationId :: Text
$sel:operationId:GetOperationDetail' :: GetOperationDetail -> Text
..} =
[Pair] -> Value
Data.object
( forall a. [Maybe a] -> [a]
Prelude.catMaybes
[forall a. a -> Maybe a
Prelude.Just (Key
"OperationId" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
operationId)]
)
instance Data.ToPath GetOperationDetail where
toPath :: GetOperationDetail -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"
instance Data.ToQuery GetOperationDetail where
toQuery :: GetOperationDetail -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data GetOperationDetailResponse = GetOperationDetailResponse'
{
GetOperationDetailResponse -> Maybe Text
domainName :: Prelude.Maybe Prelude.Text,
GetOperationDetailResponse -> Maybe POSIX
lastUpdatedDate :: Prelude.Maybe Data.POSIX,
GetOperationDetailResponse -> Maybe Text
message :: Prelude.Maybe Prelude.Text,
GetOperationDetailResponse -> Maybe Text
operationId :: Prelude.Maybe Prelude.Text,
GetOperationDetailResponse -> Maybe OperationStatus
status :: Prelude.Maybe OperationStatus,
GetOperationDetailResponse -> Maybe StatusFlag
statusFlag :: Prelude.Maybe StatusFlag,
GetOperationDetailResponse -> Maybe POSIX
submittedDate :: Prelude.Maybe Data.POSIX,
GetOperationDetailResponse -> Maybe OperationType
type' :: Prelude.Maybe OperationType,
GetOperationDetailResponse -> Int
httpStatus :: Prelude.Int
}
deriving (GetOperationDetailResponse -> GetOperationDetailResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetOperationDetailResponse -> GetOperationDetailResponse -> Bool
$c/= :: GetOperationDetailResponse -> GetOperationDetailResponse -> Bool
== :: GetOperationDetailResponse -> GetOperationDetailResponse -> Bool
$c== :: GetOperationDetailResponse -> GetOperationDetailResponse -> Bool
Prelude.Eq, ReadPrec [GetOperationDetailResponse]
ReadPrec GetOperationDetailResponse
Int -> ReadS GetOperationDetailResponse
ReadS [GetOperationDetailResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetOperationDetailResponse]
$creadListPrec :: ReadPrec [GetOperationDetailResponse]
readPrec :: ReadPrec GetOperationDetailResponse
$creadPrec :: ReadPrec GetOperationDetailResponse
readList :: ReadS [GetOperationDetailResponse]
$creadList :: ReadS [GetOperationDetailResponse]
readsPrec :: Int -> ReadS GetOperationDetailResponse
$creadsPrec :: Int -> ReadS GetOperationDetailResponse
Prelude.Read, Int -> GetOperationDetailResponse -> ShowS
[GetOperationDetailResponse] -> ShowS
GetOperationDetailResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetOperationDetailResponse] -> ShowS
$cshowList :: [GetOperationDetailResponse] -> ShowS
show :: GetOperationDetailResponse -> String
$cshow :: GetOperationDetailResponse -> String
showsPrec :: Int -> GetOperationDetailResponse -> ShowS
$cshowsPrec :: Int -> GetOperationDetailResponse -> ShowS
Prelude.Show, forall x.
Rep GetOperationDetailResponse x -> GetOperationDetailResponse
forall x.
GetOperationDetailResponse -> Rep GetOperationDetailResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep GetOperationDetailResponse x -> GetOperationDetailResponse
$cfrom :: forall x.
GetOperationDetailResponse -> Rep GetOperationDetailResponse x
Prelude.Generic)
newGetOperationDetailResponse ::
Prelude.Int ->
GetOperationDetailResponse
newGetOperationDetailResponse :: Int -> GetOperationDetailResponse
newGetOperationDetailResponse Int
pHttpStatus_ =
GetOperationDetailResponse'
{ $sel:domainName:GetOperationDetailResponse' :: Maybe Text
domainName =
forall a. Maybe a
Prelude.Nothing,
$sel:lastUpdatedDate:GetOperationDetailResponse' :: Maybe POSIX
lastUpdatedDate = forall a. Maybe a
Prelude.Nothing,
$sel:message:GetOperationDetailResponse' :: Maybe Text
message = forall a. Maybe a
Prelude.Nothing,
$sel:operationId:GetOperationDetailResponse' :: Maybe Text
operationId = forall a. Maybe a
Prelude.Nothing,
$sel:status:GetOperationDetailResponse' :: Maybe OperationStatus
status = forall a. Maybe a
Prelude.Nothing,
$sel:statusFlag:GetOperationDetailResponse' :: Maybe StatusFlag
statusFlag = forall a. Maybe a
Prelude.Nothing,
$sel:submittedDate:GetOperationDetailResponse' :: Maybe POSIX
submittedDate = forall a. Maybe a
Prelude.Nothing,
$sel:type':GetOperationDetailResponse' :: Maybe OperationType
type' = forall a. Maybe a
Prelude.Nothing,
$sel:httpStatus:GetOperationDetailResponse' :: Int
httpStatus = Int
pHttpStatus_
}
getOperationDetailResponse_domainName :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe Prelude.Text)
getOperationDetailResponse_domainName :: Lens' GetOperationDetailResponse (Maybe Text)
getOperationDetailResponse_domainName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe Text
domainName :: Maybe Text
$sel:domainName:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
domainName} -> Maybe Text
domainName) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe Text
a -> GetOperationDetailResponse
s {$sel:domainName:GetOperationDetailResponse' :: Maybe Text
domainName = Maybe Text
a} :: GetOperationDetailResponse)
getOperationDetailResponse_lastUpdatedDate :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe Prelude.UTCTime)
getOperationDetailResponse_lastUpdatedDate :: Lens' GetOperationDetailResponse (Maybe UTCTime)
getOperationDetailResponse_lastUpdatedDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe POSIX
lastUpdatedDate :: Maybe POSIX
$sel:lastUpdatedDate:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe POSIX
lastUpdatedDate} -> Maybe POSIX
lastUpdatedDate) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe POSIX
a -> GetOperationDetailResponse
s {$sel:lastUpdatedDate:GetOperationDetailResponse' :: Maybe POSIX
lastUpdatedDate = Maybe POSIX
a} :: GetOperationDetailResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time
getOperationDetailResponse_message :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe Prelude.Text)
getOperationDetailResponse_message :: Lens' GetOperationDetailResponse (Maybe Text)
getOperationDetailResponse_message = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe Text
message :: Maybe Text
$sel:message:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
message} -> Maybe Text
message) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe Text
a -> GetOperationDetailResponse
s {$sel:message:GetOperationDetailResponse' :: Maybe Text
message = Maybe Text
a} :: GetOperationDetailResponse)
getOperationDetailResponse_operationId :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe Prelude.Text)
getOperationDetailResponse_operationId :: Lens' GetOperationDetailResponse (Maybe Text)
getOperationDetailResponse_operationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe Text
operationId :: Maybe Text
$sel:operationId:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
operationId} -> Maybe Text
operationId) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe Text
a -> GetOperationDetailResponse
s {$sel:operationId:GetOperationDetailResponse' :: Maybe Text
operationId = Maybe Text
a} :: GetOperationDetailResponse)
getOperationDetailResponse_status :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe OperationStatus)
getOperationDetailResponse_status :: Lens' GetOperationDetailResponse (Maybe OperationStatus)
getOperationDetailResponse_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe OperationStatus
status :: Maybe OperationStatus
$sel:status:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe OperationStatus
status} -> Maybe OperationStatus
status) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe OperationStatus
a -> GetOperationDetailResponse
s {$sel:status:GetOperationDetailResponse' :: Maybe OperationStatus
status = Maybe OperationStatus
a} :: GetOperationDetailResponse)
getOperationDetailResponse_statusFlag :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe StatusFlag)
getOperationDetailResponse_statusFlag :: Lens' GetOperationDetailResponse (Maybe StatusFlag)
getOperationDetailResponse_statusFlag = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe StatusFlag
statusFlag :: Maybe StatusFlag
$sel:statusFlag:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe StatusFlag
statusFlag} -> Maybe StatusFlag
statusFlag) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe StatusFlag
a -> GetOperationDetailResponse
s {$sel:statusFlag:GetOperationDetailResponse' :: Maybe StatusFlag
statusFlag = Maybe StatusFlag
a} :: GetOperationDetailResponse)
getOperationDetailResponse_submittedDate :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe Prelude.UTCTime)
getOperationDetailResponse_submittedDate :: Lens' GetOperationDetailResponse (Maybe UTCTime)
getOperationDetailResponse_submittedDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe POSIX
submittedDate :: Maybe POSIX
$sel:submittedDate:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe POSIX
submittedDate} -> Maybe POSIX
submittedDate) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe POSIX
a -> GetOperationDetailResponse
s {$sel:submittedDate:GetOperationDetailResponse' :: Maybe POSIX
submittedDate = Maybe POSIX
a} :: GetOperationDetailResponse) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time
getOperationDetailResponse_type :: Lens.Lens' GetOperationDetailResponse (Prelude.Maybe OperationType)
getOperationDetailResponse_type :: Lens' GetOperationDetailResponse (Maybe OperationType)
getOperationDetailResponse_type = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Maybe OperationType
type' :: Maybe OperationType
$sel:type':GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe OperationType
type'} -> Maybe OperationType
type') (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Maybe OperationType
a -> GetOperationDetailResponse
s {$sel:type':GetOperationDetailResponse' :: Maybe OperationType
type' = Maybe OperationType
a} :: GetOperationDetailResponse)
getOperationDetailResponse_httpStatus :: Lens.Lens' GetOperationDetailResponse Prelude.Int
getOperationDetailResponse_httpStatus :: Lens' GetOperationDetailResponse Int
getOperationDetailResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetOperationDetailResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetOperationDetailResponse' :: GetOperationDetailResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetOperationDetailResponse
s@GetOperationDetailResponse' {} Int
a -> GetOperationDetailResponse
s {$sel:httpStatus:GetOperationDetailResponse' :: Int
httpStatus = Int
a} :: GetOperationDetailResponse)
instance Prelude.NFData GetOperationDetailResponse where
rnf :: GetOperationDetailResponse -> ()
rnf GetOperationDetailResponse' {Int
Maybe Text
Maybe POSIX
Maybe OperationStatus
Maybe OperationType
Maybe StatusFlag
httpStatus :: Int
type' :: Maybe OperationType
submittedDate :: Maybe POSIX
statusFlag :: Maybe StatusFlag
status :: Maybe OperationStatus
operationId :: Maybe Text
message :: Maybe Text
lastUpdatedDate :: Maybe POSIX
domainName :: Maybe Text
$sel:httpStatus:GetOperationDetailResponse' :: GetOperationDetailResponse -> Int
$sel:type':GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe OperationType
$sel:submittedDate:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe POSIX
$sel:statusFlag:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe StatusFlag
$sel:status:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe OperationStatus
$sel:operationId:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
$sel:message:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
$sel:lastUpdatedDate:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe POSIX
$sel:domainName:GetOperationDetailResponse' :: GetOperationDetailResponse -> Maybe Text
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
domainName
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastUpdatedDate
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
message
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
operationId
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe OperationStatus
status
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe StatusFlag
statusFlag
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
submittedDate
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe OperationType
type'
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus