{-# 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 #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.CodeGuruReviewer.DescribeRecommendationFeedback
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Describes the customer feedback for a CodeGuru Reviewer recommendation.
module Amazonka.CodeGuruReviewer.DescribeRecommendationFeedback
  ( -- * Creating a Request
    DescribeRecommendationFeedback (..),
    newDescribeRecommendationFeedback,

    -- * Request Lenses
    describeRecommendationFeedback_userId,
    describeRecommendationFeedback_codeReviewArn,
    describeRecommendationFeedback_recommendationId,

    -- * Destructuring the Response
    DescribeRecommendationFeedbackResponse (..),
    newDescribeRecommendationFeedbackResponse,

    -- * Response Lenses
    describeRecommendationFeedbackResponse_recommendationFeedback,
    describeRecommendationFeedbackResponse_httpStatus,
  )
where

import Amazonka.CodeGuruReviewer.Types
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

-- | /See:/ 'newDescribeRecommendationFeedback' smart constructor.
data DescribeRecommendationFeedback = DescribeRecommendationFeedback'
  { -- | Optional parameter to describe the feedback for a given user. If this is
    -- not supplied, it defaults to the user making the request.
    --
    -- The @UserId@ is an IAM principal that can be specified as an Amazon Web
    -- Services account ID or an Amazon Resource Name (ARN). For more
    -- information, see
    -- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_policies_elements_principal.html#Principal_specifying Specifying a Principal>
    -- in the /Amazon Web Services Identity and Access Management User Guide/.
    DescribeRecommendationFeedback -> Maybe Text
userId :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the
    -- <https://docs.aws.amazon.com/codeguru/latest/reviewer-api/API_CodeReview.html CodeReview>
    -- object.
    DescribeRecommendationFeedback -> Text
codeReviewArn :: Prelude.Text,
    -- | The recommendation ID that can be used to track the provided
    -- recommendations and then to collect the feedback.
    DescribeRecommendationFeedback -> Text
recommendationId :: Prelude.Text
  }
  deriving (DescribeRecommendationFeedback
-> DescribeRecommendationFeedback -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeRecommendationFeedback
-> DescribeRecommendationFeedback -> Bool
$c/= :: DescribeRecommendationFeedback
-> DescribeRecommendationFeedback -> Bool
== :: DescribeRecommendationFeedback
-> DescribeRecommendationFeedback -> Bool
$c== :: DescribeRecommendationFeedback
-> DescribeRecommendationFeedback -> Bool
Prelude.Eq, ReadPrec [DescribeRecommendationFeedback]
ReadPrec DescribeRecommendationFeedback
Int -> ReadS DescribeRecommendationFeedback
ReadS [DescribeRecommendationFeedback]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeRecommendationFeedback]
$creadListPrec :: ReadPrec [DescribeRecommendationFeedback]
readPrec :: ReadPrec DescribeRecommendationFeedback
$creadPrec :: ReadPrec DescribeRecommendationFeedback
readList :: ReadS [DescribeRecommendationFeedback]
$creadList :: ReadS [DescribeRecommendationFeedback]
readsPrec :: Int -> ReadS DescribeRecommendationFeedback
$creadsPrec :: Int -> ReadS DescribeRecommendationFeedback
Prelude.Read, Int -> DescribeRecommendationFeedback -> ShowS
[DescribeRecommendationFeedback] -> ShowS
DescribeRecommendationFeedback -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeRecommendationFeedback] -> ShowS
$cshowList :: [DescribeRecommendationFeedback] -> ShowS
show :: DescribeRecommendationFeedback -> String
$cshow :: DescribeRecommendationFeedback -> String
showsPrec :: Int -> DescribeRecommendationFeedback -> ShowS
$cshowsPrec :: Int -> DescribeRecommendationFeedback -> ShowS
Prelude.Show, forall x.
Rep DescribeRecommendationFeedback x
-> DescribeRecommendationFeedback
forall x.
DescribeRecommendationFeedback
-> Rep DescribeRecommendationFeedback x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeRecommendationFeedback x
-> DescribeRecommendationFeedback
$cfrom :: forall x.
DescribeRecommendationFeedback
-> Rep DescribeRecommendationFeedback x
Prelude.Generic)

-- |
-- Create a value of 'DescribeRecommendationFeedback' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'userId', 'describeRecommendationFeedback_userId' - Optional parameter to describe the feedback for a given user. If this is
-- not supplied, it defaults to the user making the request.
--
-- The @UserId@ is an IAM principal that can be specified as an Amazon Web
-- Services account ID or an Amazon Resource Name (ARN). For more
-- information, see
-- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_policies_elements_principal.html#Principal_specifying Specifying a Principal>
-- in the /Amazon Web Services Identity and Access Management User Guide/.
--
-- 'codeReviewArn', 'describeRecommendationFeedback_codeReviewArn' - The Amazon Resource Name (ARN) of the
-- <https://docs.aws.amazon.com/codeguru/latest/reviewer-api/API_CodeReview.html CodeReview>
-- object.
--
-- 'recommendationId', 'describeRecommendationFeedback_recommendationId' - The recommendation ID that can be used to track the provided
-- recommendations and then to collect the feedback.
newDescribeRecommendationFeedback ::
  -- | 'codeReviewArn'
  Prelude.Text ->
  -- | 'recommendationId'
  Prelude.Text ->
  DescribeRecommendationFeedback
newDescribeRecommendationFeedback :: Text -> Text -> DescribeRecommendationFeedback
newDescribeRecommendationFeedback
  Text
pCodeReviewArn_
  Text
pRecommendationId_ =
    DescribeRecommendationFeedback'
      { $sel:userId:DescribeRecommendationFeedback' :: Maybe Text
userId =
          forall a. Maybe a
Prelude.Nothing,
        $sel:codeReviewArn:DescribeRecommendationFeedback' :: Text
codeReviewArn = Text
pCodeReviewArn_,
        $sel:recommendationId:DescribeRecommendationFeedback' :: Text
recommendationId = Text
pRecommendationId_
      }

-- | Optional parameter to describe the feedback for a given user. If this is
-- not supplied, it defaults to the user making the request.
--
-- The @UserId@ is an IAM principal that can be specified as an Amazon Web
-- Services account ID or an Amazon Resource Name (ARN). For more
-- information, see
-- <https://docs.aws.amazon.com/IAM/latest/UserGuide/reference_policies_elements_principal.html#Principal_specifying Specifying a Principal>
-- in the /Amazon Web Services Identity and Access Management User Guide/.
describeRecommendationFeedback_userId :: Lens.Lens' DescribeRecommendationFeedback (Prelude.Maybe Prelude.Text)
describeRecommendationFeedback_userId :: Lens' DescribeRecommendationFeedback (Maybe Text)
describeRecommendationFeedback_userId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRecommendationFeedback' {Maybe Text
userId :: Maybe Text
$sel:userId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Maybe Text
userId} -> Maybe Text
userId) (\s :: DescribeRecommendationFeedback
s@DescribeRecommendationFeedback' {} Maybe Text
a -> DescribeRecommendationFeedback
s {$sel:userId:DescribeRecommendationFeedback' :: Maybe Text
userId = Maybe Text
a} :: DescribeRecommendationFeedback)

-- | The Amazon Resource Name (ARN) of the
-- <https://docs.aws.amazon.com/codeguru/latest/reviewer-api/API_CodeReview.html CodeReview>
-- object.
describeRecommendationFeedback_codeReviewArn :: Lens.Lens' DescribeRecommendationFeedback Prelude.Text
describeRecommendationFeedback_codeReviewArn :: Lens' DescribeRecommendationFeedback Text
describeRecommendationFeedback_codeReviewArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRecommendationFeedback' {Text
codeReviewArn :: Text
$sel:codeReviewArn:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
codeReviewArn} -> Text
codeReviewArn) (\s :: DescribeRecommendationFeedback
s@DescribeRecommendationFeedback' {} Text
a -> DescribeRecommendationFeedback
s {$sel:codeReviewArn:DescribeRecommendationFeedback' :: Text
codeReviewArn = Text
a} :: DescribeRecommendationFeedback)

-- | The recommendation ID that can be used to track the provided
-- recommendations and then to collect the feedback.
describeRecommendationFeedback_recommendationId :: Lens.Lens' DescribeRecommendationFeedback Prelude.Text
describeRecommendationFeedback_recommendationId :: Lens' DescribeRecommendationFeedback Text
describeRecommendationFeedback_recommendationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRecommendationFeedback' {Text
recommendationId :: Text
$sel:recommendationId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
recommendationId} -> Text
recommendationId) (\s :: DescribeRecommendationFeedback
s@DescribeRecommendationFeedback' {} Text
a -> DescribeRecommendationFeedback
s {$sel:recommendationId:DescribeRecommendationFeedback' :: Text
recommendationId = Text
a} :: DescribeRecommendationFeedback)

instance
  Core.AWSRequest
    DescribeRecommendationFeedback
  where
  type
    AWSResponse DescribeRecommendationFeedback =
      DescribeRecommendationFeedbackResponse
  request :: (Service -> Service)
-> DescribeRecommendationFeedback
-> Request DescribeRecommendationFeedback
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy DescribeRecommendationFeedback
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse DescribeRecommendationFeedback)))
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 RecommendationFeedback
-> Int -> DescribeRecommendationFeedbackResponse
DescribeRecommendationFeedbackResponse'
            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
"RecommendationFeedback")
            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
    DescribeRecommendationFeedback
  where
  hashWithSalt :: Int -> DescribeRecommendationFeedback -> Int
hashWithSalt
    Int
_salt
    DescribeRecommendationFeedback' {Maybe Text
Text
recommendationId :: Text
codeReviewArn :: Text
userId :: Maybe Text
$sel:recommendationId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:codeReviewArn:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:userId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Maybe Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
userId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
codeReviewArn
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
recommendationId

instance
  Prelude.NFData
    DescribeRecommendationFeedback
  where
  rnf :: DescribeRecommendationFeedback -> ()
rnf DescribeRecommendationFeedback' {Maybe Text
Text
recommendationId :: Text
codeReviewArn :: Text
userId :: Maybe Text
$sel:recommendationId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:codeReviewArn:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:userId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
userId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
codeReviewArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
recommendationId

instance
  Data.ToHeaders
    DescribeRecommendationFeedback
  where
  toHeaders :: DescribeRecommendationFeedback -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToPath DescribeRecommendationFeedback where
  toPath :: DescribeRecommendationFeedback -> ByteString
toPath DescribeRecommendationFeedback' {Maybe Text
Text
recommendationId :: Text
codeReviewArn :: Text
userId :: Maybe Text
$sel:recommendationId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:codeReviewArn:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:userId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ByteString
"/feedback/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
codeReviewArn]

instance Data.ToQuery DescribeRecommendationFeedback where
  toQuery :: DescribeRecommendationFeedback -> QueryString
toQuery DescribeRecommendationFeedback' {Maybe Text
Text
recommendationId :: Text
codeReviewArn :: Text
userId :: Maybe Text
$sel:recommendationId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:codeReviewArn:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Text
$sel:userId:DescribeRecommendationFeedback' :: DescribeRecommendationFeedback -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"UserId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
userId,
        ByteString
"RecommendationId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
recommendationId
      ]

-- | /See:/ 'newDescribeRecommendationFeedbackResponse' smart constructor.
data DescribeRecommendationFeedbackResponse = DescribeRecommendationFeedbackResponse'
  { -- | The recommendation feedback given by the user.
    DescribeRecommendationFeedbackResponse
-> Maybe RecommendationFeedback
recommendationFeedback :: Prelude.Maybe RecommendationFeedback,
    -- | The response's http status code.
    DescribeRecommendationFeedbackResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DescribeRecommendationFeedbackResponse
-> DescribeRecommendationFeedbackResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DescribeRecommendationFeedbackResponse
-> DescribeRecommendationFeedbackResponse -> Bool
$c/= :: DescribeRecommendationFeedbackResponse
-> DescribeRecommendationFeedbackResponse -> Bool
== :: DescribeRecommendationFeedbackResponse
-> DescribeRecommendationFeedbackResponse -> Bool
$c== :: DescribeRecommendationFeedbackResponse
-> DescribeRecommendationFeedbackResponse -> Bool
Prelude.Eq, ReadPrec [DescribeRecommendationFeedbackResponse]
ReadPrec DescribeRecommendationFeedbackResponse
Int -> ReadS DescribeRecommendationFeedbackResponse
ReadS [DescribeRecommendationFeedbackResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DescribeRecommendationFeedbackResponse]
$creadListPrec :: ReadPrec [DescribeRecommendationFeedbackResponse]
readPrec :: ReadPrec DescribeRecommendationFeedbackResponse
$creadPrec :: ReadPrec DescribeRecommendationFeedbackResponse
readList :: ReadS [DescribeRecommendationFeedbackResponse]
$creadList :: ReadS [DescribeRecommendationFeedbackResponse]
readsPrec :: Int -> ReadS DescribeRecommendationFeedbackResponse
$creadsPrec :: Int -> ReadS DescribeRecommendationFeedbackResponse
Prelude.Read, Int -> DescribeRecommendationFeedbackResponse -> ShowS
[DescribeRecommendationFeedbackResponse] -> ShowS
DescribeRecommendationFeedbackResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DescribeRecommendationFeedbackResponse] -> ShowS
$cshowList :: [DescribeRecommendationFeedbackResponse] -> ShowS
show :: DescribeRecommendationFeedbackResponse -> String
$cshow :: DescribeRecommendationFeedbackResponse -> String
showsPrec :: Int -> DescribeRecommendationFeedbackResponse -> ShowS
$cshowsPrec :: Int -> DescribeRecommendationFeedbackResponse -> ShowS
Prelude.Show, forall x.
Rep DescribeRecommendationFeedbackResponse x
-> DescribeRecommendationFeedbackResponse
forall x.
DescribeRecommendationFeedbackResponse
-> Rep DescribeRecommendationFeedbackResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DescribeRecommendationFeedbackResponse x
-> DescribeRecommendationFeedbackResponse
$cfrom :: forall x.
DescribeRecommendationFeedbackResponse
-> Rep DescribeRecommendationFeedbackResponse x
Prelude.Generic)

-- |
-- Create a value of 'DescribeRecommendationFeedbackResponse' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'recommendationFeedback', 'describeRecommendationFeedbackResponse_recommendationFeedback' - The recommendation feedback given by the user.
--
-- 'httpStatus', 'describeRecommendationFeedbackResponse_httpStatus' - The response's http status code.
newDescribeRecommendationFeedbackResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DescribeRecommendationFeedbackResponse
newDescribeRecommendationFeedbackResponse :: Int -> DescribeRecommendationFeedbackResponse
newDescribeRecommendationFeedbackResponse
  Int
pHttpStatus_ =
    DescribeRecommendationFeedbackResponse'
      { $sel:recommendationFeedback:DescribeRecommendationFeedbackResponse' :: Maybe RecommendationFeedback
recommendationFeedback =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:DescribeRecommendationFeedbackResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | The recommendation feedback given by the user.
describeRecommendationFeedbackResponse_recommendationFeedback :: Lens.Lens' DescribeRecommendationFeedbackResponse (Prelude.Maybe RecommendationFeedback)
describeRecommendationFeedbackResponse_recommendationFeedback :: Lens'
  DescribeRecommendationFeedbackResponse
  (Maybe RecommendationFeedback)
describeRecommendationFeedbackResponse_recommendationFeedback = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRecommendationFeedbackResponse' {Maybe RecommendationFeedback
recommendationFeedback :: Maybe RecommendationFeedback
$sel:recommendationFeedback:DescribeRecommendationFeedbackResponse' :: DescribeRecommendationFeedbackResponse
-> Maybe RecommendationFeedback
recommendationFeedback} -> Maybe RecommendationFeedback
recommendationFeedback) (\s :: DescribeRecommendationFeedbackResponse
s@DescribeRecommendationFeedbackResponse' {} Maybe RecommendationFeedback
a -> DescribeRecommendationFeedbackResponse
s {$sel:recommendationFeedback:DescribeRecommendationFeedbackResponse' :: Maybe RecommendationFeedback
recommendationFeedback = Maybe RecommendationFeedback
a} :: DescribeRecommendationFeedbackResponse)

-- | The response's http status code.
describeRecommendationFeedbackResponse_httpStatus :: Lens.Lens' DescribeRecommendationFeedbackResponse Prelude.Int
describeRecommendationFeedbackResponse_httpStatus :: Lens' DescribeRecommendationFeedbackResponse Int
describeRecommendationFeedbackResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DescribeRecommendationFeedbackResponse' {Int
httpStatus :: Int
$sel:httpStatus:DescribeRecommendationFeedbackResponse' :: DescribeRecommendationFeedbackResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DescribeRecommendationFeedbackResponse
s@DescribeRecommendationFeedbackResponse' {} Int
a -> DescribeRecommendationFeedbackResponse
s {$sel:httpStatus:DescribeRecommendationFeedbackResponse' :: Int
httpStatus = Int
a} :: DescribeRecommendationFeedbackResponse)

instance
  Prelude.NFData
    DescribeRecommendationFeedbackResponse
  where
  rnf :: DescribeRecommendationFeedbackResponse -> ()
rnf DescribeRecommendationFeedbackResponse' {Int
Maybe RecommendationFeedback
httpStatus :: Int
recommendationFeedback :: Maybe RecommendationFeedback
$sel:httpStatus:DescribeRecommendationFeedbackResponse' :: DescribeRecommendationFeedbackResponse -> Int
$sel:recommendationFeedback:DescribeRecommendationFeedbackResponse' :: DescribeRecommendationFeedbackResponse
-> Maybe RecommendationFeedback
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe RecommendationFeedback
recommendationFeedback
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus