{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

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

-- |
-- Module      : Amazonka.IoT.Types.AuditFinding
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.IoT.Types.AuditFinding where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.IoT.Types.AuditFindingSeverity
import Amazonka.IoT.Types.NonCompliantResource
import Amazonka.IoT.Types.RelatedResource
import qualified Amazonka.Prelude as Prelude

-- | The findings (results) of the audit.
--
-- /See:/ 'newAuditFinding' smart constructor.
data AuditFinding = AuditFinding'
  { -- | The audit check that generated this result.
    AuditFinding -> Maybe Text
checkName :: Prelude.Maybe Prelude.Text,
    -- | A unique identifier for this set of audit findings. This identifier is
    -- used to apply mitigation tasks to one or more sets of findings.
    AuditFinding -> Maybe Text
findingId :: Prelude.Maybe Prelude.Text,
    -- | The time the result (finding) was discovered.
    AuditFinding -> Maybe POSIX
findingTime :: Prelude.Maybe Data.POSIX,
    -- | Indicates whether the audit finding was suppressed or not during
    -- reporting.
    AuditFinding -> Maybe Bool
isSuppressed :: Prelude.Maybe Prelude.Bool,
    -- | The resource that was found to be noncompliant with the audit check.
    AuditFinding -> Maybe NonCompliantResource
nonCompliantResource :: Prelude.Maybe NonCompliantResource,
    -- | The reason the resource was noncompliant.
    AuditFinding -> Maybe Text
reasonForNonCompliance :: Prelude.Maybe Prelude.Text,
    -- | A code that indicates the reason that the resource was noncompliant.
    AuditFinding -> Maybe Text
reasonForNonComplianceCode :: Prelude.Maybe Prelude.Text,
    -- | The list of related resources.
    AuditFinding -> Maybe [RelatedResource]
relatedResources :: Prelude.Maybe [RelatedResource],
    -- | The severity of the result (finding).
    AuditFinding -> Maybe AuditFindingSeverity
severity :: Prelude.Maybe AuditFindingSeverity,
    -- | The ID of the audit that generated this result (finding).
    AuditFinding -> Maybe Text
taskId :: Prelude.Maybe Prelude.Text,
    -- | The time the audit started.
    AuditFinding -> Maybe POSIX
taskStartTime :: Prelude.Maybe Data.POSIX
  }
  deriving (AuditFinding -> AuditFinding -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AuditFinding -> AuditFinding -> Bool
$c/= :: AuditFinding -> AuditFinding -> Bool
== :: AuditFinding -> AuditFinding -> Bool
$c== :: AuditFinding -> AuditFinding -> Bool
Prelude.Eq, ReadPrec [AuditFinding]
ReadPrec AuditFinding
Int -> ReadS AuditFinding
ReadS [AuditFinding]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [AuditFinding]
$creadListPrec :: ReadPrec [AuditFinding]
readPrec :: ReadPrec AuditFinding
$creadPrec :: ReadPrec AuditFinding
readList :: ReadS [AuditFinding]
$creadList :: ReadS [AuditFinding]
readsPrec :: Int -> ReadS AuditFinding
$creadsPrec :: Int -> ReadS AuditFinding
Prelude.Read, Int -> AuditFinding -> ShowS
[AuditFinding] -> ShowS
AuditFinding -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AuditFinding] -> ShowS
$cshowList :: [AuditFinding] -> ShowS
show :: AuditFinding -> String
$cshow :: AuditFinding -> String
showsPrec :: Int -> AuditFinding -> ShowS
$cshowsPrec :: Int -> AuditFinding -> ShowS
Prelude.Show, forall x. Rep AuditFinding x -> AuditFinding
forall x. AuditFinding -> Rep AuditFinding x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep AuditFinding x -> AuditFinding
$cfrom :: forall x. AuditFinding -> Rep AuditFinding x
Prelude.Generic)

-- |
-- Create a value of 'AuditFinding' 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:
--
-- 'checkName', 'auditFinding_checkName' - The audit check that generated this result.
--
-- 'findingId', 'auditFinding_findingId' - A unique identifier for this set of audit findings. This identifier is
-- used to apply mitigation tasks to one or more sets of findings.
--
-- 'findingTime', 'auditFinding_findingTime' - The time the result (finding) was discovered.
--
-- 'isSuppressed', 'auditFinding_isSuppressed' - Indicates whether the audit finding was suppressed or not during
-- reporting.
--
-- 'nonCompliantResource', 'auditFinding_nonCompliantResource' - The resource that was found to be noncompliant with the audit check.
--
-- 'reasonForNonCompliance', 'auditFinding_reasonForNonCompliance' - The reason the resource was noncompliant.
--
-- 'reasonForNonComplianceCode', 'auditFinding_reasonForNonComplianceCode' - A code that indicates the reason that the resource was noncompliant.
--
-- 'relatedResources', 'auditFinding_relatedResources' - The list of related resources.
--
-- 'severity', 'auditFinding_severity' - The severity of the result (finding).
--
-- 'taskId', 'auditFinding_taskId' - The ID of the audit that generated this result (finding).
--
-- 'taskStartTime', 'auditFinding_taskStartTime' - The time the audit started.
newAuditFinding ::
  AuditFinding
newAuditFinding :: AuditFinding
newAuditFinding =
  AuditFinding'
    { $sel:checkName:AuditFinding' :: Maybe Text
checkName = forall a. Maybe a
Prelude.Nothing,
      $sel:findingId:AuditFinding' :: Maybe Text
findingId = forall a. Maybe a
Prelude.Nothing,
      $sel:findingTime:AuditFinding' :: Maybe POSIX
findingTime = forall a. Maybe a
Prelude.Nothing,
      $sel:isSuppressed:AuditFinding' :: Maybe Bool
isSuppressed = forall a. Maybe a
Prelude.Nothing,
      $sel:nonCompliantResource:AuditFinding' :: Maybe NonCompliantResource
nonCompliantResource = forall a. Maybe a
Prelude.Nothing,
      $sel:reasonForNonCompliance:AuditFinding' :: Maybe Text
reasonForNonCompliance = forall a. Maybe a
Prelude.Nothing,
      $sel:reasonForNonComplianceCode:AuditFinding' :: Maybe Text
reasonForNonComplianceCode = forall a. Maybe a
Prelude.Nothing,
      $sel:relatedResources:AuditFinding' :: Maybe [RelatedResource]
relatedResources = forall a. Maybe a
Prelude.Nothing,
      $sel:severity:AuditFinding' :: Maybe AuditFindingSeverity
severity = forall a. Maybe a
Prelude.Nothing,
      $sel:taskId:AuditFinding' :: Maybe Text
taskId = forall a. Maybe a
Prelude.Nothing,
      $sel:taskStartTime:AuditFinding' :: Maybe POSIX
taskStartTime = forall a. Maybe a
Prelude.Nothing
    }

-- | The audit check that generated this result.
auditFinding_checkName :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Text)
auditFinding_checkName :: Lens' AuditFinding (Maybe Text)
auditFinding_checkName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Text
checkName :: Maybe Text
$sel:checkName:AuditFinding' :: AuditFinding -> Maybe Text
checkName} -> Maybe Text
checkName) (\s :: AuditFinding
s@AuditFinding' {} Maybe Text
a -> AuditFinding
s {$sel:checkName:AuditFinding' :: Maybe Text
checkName = Maybe Text
a} :: AuditFinding)

-- | A unique identifier for this set of audit findings. This identifier is
-- used to apply mitigation tasks to one or more sets of findings.
auditFinding_findingId :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Text)
auditFinding_findingId :: Lens' AuditFinding (Maybe Text)
auditFinding_findingId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Text
findingId :: Maybe Text
$sel:findingId:AuditFinding' :: AuditFinding -> Maybe Text
findingId} -> Maybe Text
findingId) (\s :: AuditFinding
s@AuditFinding' {} Maybe Text
a -> AuditFinding
s {$sel:findingId:AuditFinding' :: Maybe Text
findingId = Maybe Text
a} :: AuditFinding)

-- | The time the result (finding) was discovered.
auditFinding_findingTime :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.UTCTime)
auditFinding_findingTime :: Lens' AuditFinding (Maybe UTCTime)
auditFinding_findingTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe POSIX
findingTime :: Maybe POSIX
$sel:findingTime:AuditFinding' :: AuditFinding -> Maybe POSIX
findingTime} -> Maybe POSIX
findingTime) (\s :: AuditFinding
s@AuditFinding' {} Maybe POSIX
a -> AuditFinding
s {$sel:findingTime:AuditFinding' :: Maybe POSIX
findingTime = Maybe POSIX
a} :: AuditFinding) 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

-- | Indicates whether the audit finding was suppressed or not during
-- reporting.
auditFinding_isSuppressed :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Bool)
auditFinding_isSuppressed :: Lens' AuditFinding (Maybe Bool)
auditFinding_isSuppressed = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Bool
isSuppressed :: Maybe Bool
$sel:isSuppressed:AuditFinding' :: AuditFinding -> Maybe Bool
isSuppressed} -> Maybe Bool
isSuppressed) (\s :: AuditFinding
s@AuditFinding' {} Maybe Bool
a -> AuditFinding
s {$sel:isSuppressed:AuditFinding' :: Maybe Bool
isSuppressed = Maybe Bool
a} :: AuditFinding)

-- | The resource that was found to be noncompliant with the audit check.
auditFinding_nonCompliantResource :: Lens.Lens' AuditFinding (Prelude.Maybe NonCompliantResource)
auditFinding_nonCompliantResource :: Lens' AuditFinding (Maybe NonCompliantResource)
auditFinding_nonCompliantResource = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe NonCompliantResource
nonCompliantResource :: Maybe NonCompliantResource
$sel:nonCompliantResource:AuditFinding' :: AuditFinding -> Maybe NonCompliantResource
nonCompliantResource} -> Maybe NonCompliantResource
nonCompliantResource) (\s :: AuditFinding
s@AuditFinding' {} Maybe NonCompliantResource
a -> AuditFinding
s {$sel:nonCompliantResource:AuditFinding' :: Maybe NonCompliantResource
nonCompliantResource = Maybe NonCompliantResource
a} :: AuditFinding)

-- | The reason the resource was noncompliant.
auditFinding_reasonForNonCompliance :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Text)
auditFinding_reasonForNonCompliance :: Lens' AuditFinding (Maybe Text)
auditFinding_reasonForNonCompliance = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Text
reasonForNonCompliance :: Maybe Text
$sel:reasonForNonCompliance:AuditFinding' :: AuditFinding -> Maybe Text
reasonForNonCompliance} -> Maybe Text
reasonForNonCompliance) (\s :: AuditFinding
s@AuditFinding' {} Maybe Text
a -> AuditFinding
s {$sel:reasonForNonCompliance:AuditFinding' :: Maybe Text
reasonForNonCompliance = Maybe Text
a} :: AuditFinding)

-- | A code that indicates the reason that the resource was noncompliant.
auditFinding_reasonForNonComplianceCode :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Text)
auditFinding_reasonForNonComplianceCode :: Lens' AuditFinding (Maybe Text)
auditFinding_reasonForNonComplianceCode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Text
reasonForNonComplianceCode :: Maybe Text
$sel:reasonForNonComplianceCode:AuditFinding' :: AuditFinding -> Maybe Text
reasonForNonComplianceCode} -> Maybe Text
reasonForNonComplianceCode) (\s :: AuditFinding
s@AuditFinding' {} Maybe Text
a -> AuditFinding
s {$sel:reasonForNonComplianceCode:AuditFinding' :: Maybe Text
reasonForNonComplianceCode = Maybe Text
a} :: AuditFinding)

-- | The list of related resources.
auditFinding_relatedResources :: Lens.Lens' AuditFinding (Prelude.Maybe [RelatedResource])
auditFinding_relatedResources :: Lens' AuditFinding (Maybe [RelatedResource])
auditFinding_relatedResources = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe [RelatedResource]
relatedResources :: Maybe [RelatedResource]
$sel:relatedResources:AuditFinding' :: AuditFinding -> Maybe [RelatedResource]
relatedResources} -> Maybe [RelatedResource]
relatedResources) (\s :: AuditFinding
s@AuditFinding' {} Maybe [RelatedResource]
a -> AuditFinding
s {$sel:relatedResources:AuditFinding' :: Maybe [RelatedResource]
relatedResources = Maybe [RelatedResource]
a} :: AuditFinding) 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 s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The severity of the result (finding).
auditFinding_severity :: Lens.Lens' AuditFinding (Prelude.Maybe AuditFindingSeverity)
auditFinding_severity :: Lens' AuditFinding (Maybe AuditFindingSeverity)
auditFinding_severity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe AuditFindingSeverity
severity :: Maybe AuditFindingSeverity
$sel:severity:AuditFinding' :: AuditFinding -> Maybe AuditFindingSeverity
severity} -> Maybe AuditFindingSeverity
severity) (\s :: AuditFinding
s@AuditFinding' {} Maybe AuditFindingSeverity
a -> AuditFinding
s {$sel:severity:AuditFinding' :: Maybe AuditFindingSeverity
severity = Maybe AuditFindingSeverity
a} :: AuditFinding)

-- | The ID of the audit that generated this result (finding).
auditFinding_taskId :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.Text)
auditFinding_taskId :: Lens' AuditFinding (Maybe Text)
auditFinding_taskId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe Text
taskId :: Maybe Text
$sel:taskId:AuditFinding' :: AuditFinding -> Maybe Text
taskId} -> Maybe Text
taskId) (\s :: AuditFinding
s@AuditFinding' {} Maybe Text
a -> AuditFinding
s {$sel:taskId:AuditFinding' :: Maybe Text
taskId = Maybe Text
a} :: AuditFinding)

-- | The time the audit started.
auditFinding_taskStartTime :: Lens.Lens' AuditFinding (Prelude.Maybe Prelude.UTCTime)
auditFinding_taskStartTime :: Lens' AuditFinding (Maybe UTCTime)
auditFinding_taskStartTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\AuditFinding' {Maybe POSIX
taskStartTime :: Maybe POSIX
$sel:taskStartTime:AuditFinding' :: AuditFinding -> Maybe POSIX
taskStartTime} -> Maybe POSIX
taskStartTime) (\s :: AuditFinding
s@AuditFinding' {} Maybe POSIX
a -> AuditFinding
s {$sel:taskStartTime:AuditFinding' :: Maybe POSIX
taskStartTime = Maybe POSIX
a} :: AuditFinding) 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

instance Data.FromJSON AuditFinding where
  parseJSON :: Value -> Parser AuditFinding
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"AuditFinding"
      ( \Object
x ->
          Maybe Text
-> Maybe Text
-> Maybe POSIX
-> Maybe Bool
-> Maybe NonCompliantResource
-> Maybe Text
-> Maybe Text
-> Maybe [RelatedResource]
-> Maybe AuditFindingSeverity
-> Maybe Text
-> Maybe POSIX
-> AuditFinding
AuditFinding'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"checkName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"findingId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"findingTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"isSuppressed")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"nonCompliantResource")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"reasonForNonCompliance")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"reasonForNonComplianceCode")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"relatedResources"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"severity")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"taskId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"taskStartTime")
      )

instance Prelude.Hashable AuditFinding where
  hashWithSalt :: Int -> AuditFinding -> Int
hashWithSalt Int
_salt AuditFinding' {Maybe Bool
Maybe [RelatedResource]
Maybe Text
Maybe POSIX
Maybe AuditFindingSeverity
Maybe NonCompliantResource
taskStartTime :: Maybe POSIX
taskId :: Maybe Text
severity :: Maybe AuditFindingSeverity
relatedResources :: Maybe [RelatedResource]
reasonForNonComplianceCode :: Maybe Text
reasonForNonCompliance :: Maybe Text
nonCompliantResource :: Maybe NonCompliantResource
isSuppressed :: Maybe Bool
findingTime :: Maybe POSIX
findingId :: Maybe Text
checkName :: Maybe Text
$sel:taskStartTime:AuditFinding' :: AuditFinding -> Maybe POSIX
$sel:taskId:AuditFinding' :: AuditFinding -> Maybe Text
$sel:severity:AuditFinding' :: AuditFinding -> Maybe AuditFindingSeverity
$sel:relatedResources:AuditFinding' :: AuditFinding -> Maybe [RelatedResource]
$sel:reasonForNonComplianceCode:AuditFinding' :: AuditFinding -> Maybe Text
$sel:reasonForNonCompliance:AuditFinding' :: AuditFinding -> Maybe Text
$sel:nonCompliantResource:AuditFinding' :: AuditFinding -> Maybe NonCompliantResource
$sel:isSuppressed:AuditFinding' :: AuditFinding -> Maybe Bool
$sel:findingTime:AuditFinding' :: AuditFinding -> Maybe POSIX
$sel:findingId:AuditFinding' :: AuditFinding -> Maybe Text
$sel:checkName:AuditFinding' :: AuditFinding -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
checkName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
findingId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
findingTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
isSuppressed
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe NonCompliantResource
nonCompliantResource
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
reasonForNonCompliance
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
reasonForNonComplianceCode
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [RelatedResource]
relatedResources
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe AuditFindingSeverity
severity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
taskId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
taskStartTime

instance Prelude.NFData AuditFinding where
  rnf :: AuditFinding -> ()
rnf AuditFinding' {Maybe Bool
Maybe [RelatedResource]
Maybe Text
Maybe POSIX
Maybe AuditFindingSeverity
Maybe NonCompliantResource
taskStartTime :: Maybe POSIX
taskId :: Maybe Text
severity :: Maybe AuditFindingSeverity
relatedResources :: Maybe [RelatedResource]
reasonForNonComplianceCode :: Maybe Text
reasonForNonCompliance :: Maybe Text
nonCompliantResource :: Maybe NonCompliantResource
isSuppressed :: Maybe Bool
findingTime :: Maybe POSIX
findingId :: Maybe Text
checkName :: Maybe Text
$sel:taskStartTime:AuditFinding' :: AuditFinding -> Maybe POSIX
$sel:taskId:AuditFinding' :: AuditFinding -> Maybe Text
$sel:severity:AuditFinding' :: AuditFinding -> Maybe AuditFindingSeverity
$sel:relatedResources:AuditFinding' :: AuditFinding -> Maybe [RelatedResource]
$sel:reasonForNonComplianceCode:AuditFinding' :: AuditFinding -> Maybe Text
$sel:reasonForNonCompliance:AuditFinding' :: AuditFinding -> Maybe Text
$sel:nonCompliantResource:AuditFinding' :: AuditFinding -> Maybe NonCompliantResource
$sel:isSuppressed:AuditFinding' :: AuditFinding -> Maybe Bool
$sel:findingTime:AuditFinding' :: AuditFinding -> Maybe POSIX
$sel:findingId:AuditFinding' :: AuditFinding -> Maybe Text
$sel:checkName:AuditFinding' :: AuditFinding -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
checkName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
findingId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
findingTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
isSuppressed
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe NonCompliantResource
nonCompliantResource
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
reasonForNonCompliance
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
reasonForNonComplianceCode
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [RelatedResource]
relatedResources
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe AuditFindingSeverity
severity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
taskId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
taskStartTime