{-# 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.Config.Types.OrganizationCustomPolicyRuleMetadataNoPolicy
-- 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.Config.Types.OrganizationCustomPolicyRuleMetadataNoPolicy where

import Amazonka.Config.Types.MaximumExecutionFrequency
import Amazonka.Config.Types.OrganizationConfigRuleTriggerTypeNoSN
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

-- | An object that specifies metadata for your organization Config Custom
-- Policy rule including the runtime system in use, which accounts have
-- debug logging enabled, and other custom rule metadata such as resource
-- type, resource ID of Amazon Web Services resource, and organization
-- trigger types that trigger Config to evaluate Amazon Web Services
-- resources against a rule.
--
-- /See:/ 'newOrganizationCustomPolicyRuleMetadataNoPolicy' smart constructor.
data OrganizationCustomPolicyRuleMetadataNoPolicy = OrganizationCustomPolicyRuleMetadataNoPolicy'
  { -- | A list of accounts that you can enable debug logging for your
    -- organization Config Custom Policy rule. List is null when debug logging
    -- is enabled for all accounts.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
debugLogDeliveryAccounts :: Prelude.Maybe [Prelude.Text],
    -- | The description that you provide for your organization Config Custom
    -- Policy rule.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | A string, in JSON format, that is passed to your organization Config
    -- Custom Policy rule.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
inputParameters :: Prelude.Maybe Prelude.Text,
    -- | The maximum frequency with which Config runs evaluations for a rule.
    -- Your Config Custom Policy rule is triggered when Config delivers the
    -- configuration snapshot. For more information, see
    -- ConfigSnapshotDeliveryProperties.
    OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe MaximumExecutionFrequency
maximumExecutionFrequency :: Prelude.Maybe MaximumExecutionFrequency,
    -- | The type of notification that triggers Config to run an evaluation for a
    -- rule. For Config Custom Policy rules, Config supports change triggered
    -- notification types:
    --
    -- -   @ConfigurationItemChangeNotification@ - Triggers an evaluation when
    --     Config delivers a configuration item as a result of a resource
    --     change.
    --
    -- -   @OversizedConfigurationItemChangeNotification@ - Triggers an
    --     evaluation when Config delivers an oversized configuration item.
    --     Config may generate this notification type when a resource changes
    --     and the notification exceeds the maximum size allowed by Amazon SNS.
    OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes :: Prelude.Maybe [OrganizationConfigRuleTriggerTypeNoSN],
    -- | The runtime system for your organization Config Custom Policy rules.
    -- Guard is a policy-as-code language that allows you to write policies
    -- that are enforced by Config Custom Policy rules. For more information
    -- about Guard, see the
    -- <https://github.com/aws-cloudformation/cloudformation-guard Guard GitHub Repository>.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
policyRuntime :: Prelude.Maybe Prelude.Text,
    -- | The ID of the Amazon Web Services resource that was evaluated.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
resourceIdScope :: Prelude.Maybe Prelude.Text,
    -- | The type of the Amazon Web Services resource that was evaluated.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
resourceTypesScope :: Prelude.Maybe [Prelude.Text],
    -- | One part of a key-value pair that make up a tag. A key is a general
    -- label that acts like a category for more specific tag values.
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
tagKeyScope :: Prelude.Maybe Prelude.Text,
    -- | The optional part of a key-value pair that make up a tag. A value acts
    -- as a descriptor within a tag category (key).
    OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
tagValueScope :: Prelude.Maybe Prelude.Text
  }
  deriving (OrganizationCustomPolicyRuleMetadataNoPolicy
-> OrganizationCustomPolicyRuleMetadataNoPolicy -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> OrganizationCustomPolicyRuleMetadataNoPolicy -> Bool
$c/= :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> OrganizationCustomPolicyRuleMetadataNoPolicy -> Bool
== :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> OrganizationCustomPolicyRuleMetadataNoPolicy -> Bool
$c== :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> OrganizationCustomPolicyRuleMetadataNoPolicy -> Bool
Prelude.Eq, ReadPrec [OrganizationCustomPolicyRuleMetadataNoPolicy]
ReadPrec OrganizationCustomPolicyRuleMetadataNoPolicy
Int -> ReadS OrganizationCustomPolicyRuleMetadataNoPolicy
ReadS [OrganizationCustomPolicyRuleMetadataNoPolicy]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [OrganizationCustomPolicyRuleMetadataNoPolicy]
$creadListPrec :: ReadPrec [OrganizationCustomPolicyRuleMetadataNoPolicy]
readPrec :: ReadPrec OrganizationCustomPolicyRuleMetadataNoPolicy
$creadPrec :: ReadPrec OrganizationCustomPolicyRuleMetadataNoPolicy
readList :: ReadS [OrganizationCustomPolicyRuleMetadataNoPolicy]
$creadList :: ReadS [OrganizationCustomPolicyRuleMetadataNoPolicy]
readsPrec :: Int -> ReadS OrganizationCustomPolicyRuleMetadataNoPolicy
$creadsPrec :: Int -> ReadS OrganizationCustomPolicyRuleMetadataNoPolicy
Prelude.Read, Int -> OrganizationCustomPolicyRuleMetadataNoPolicy -> ShowS
[OrganizationCustomPolicyRuleMetadataNoPolicy] -> ShowS
OrganizationCustomPolicyRuleMetadataNoPolicy -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [OrganizationCustomPolicyRuleMetadataNoPolicy] -> ShowS
$cshowList :: [OrganizationCustomPolicyRuleMetadataNoPolicy] -> ShowS
show :: OrganizationCustomPolicyRuleMetadataNoPolicy -> String
$cshow :: OrganizationCustomPolicyRuleMetadataNoPolicy -> String
showsPrec :: Int -> OrganizationCustomPolicyRuleMetadataNoPolicy -> ShowS
$cshowsPrec :: Int -> OrganizationCustomPolicyRuleMetadataNoPolicy -> ShowS
Prelude.Show, forall x.
Rep OrganizationCustomPolicyRuleMetadataNoPolicy x
-> OrganizationCustomPolicyRuleMetadataNoPolicy
forall x.
OrganizationCustomPolicyRuleMetadataNoPolicy
-> Rep OrganizationCustomPolicyRuleMetadataNoPolicy x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep OrganizationCustomPolicyRuleMetadataNoPolicy x
-> OrganizationCustomPolicyRuleMetadataNoPolicy
$cfrom :: forall x.
OrganizationCustomPolicyRuleMetadataNoPolicy
-> Rep OrganizationCustomPolicyRuleMetadataNoPolicy x
Prelude.Generic)

-- |
-- Create a value of 'OrganizationCustomPolicyRuleMetadataNoPolicy' 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:
--
-- 'debugLogDeliveryAccounts', 'organizationCustomPolicyRuleMetadataNoPolicy_debugLogDeliveryAccounts' - A list of accounts that you can enable debug logging for your
-- organization Config Custom Policy rule. List is null when debug logging
-- is enabled for all accounts.
--
-- 'description', 'organizationCustomPolicyRuleMetadataNoPolicy_description' - The description that you provide for your organization Config Custom
-- Policy rule.
--
-- 'inputParameters', 'organizationCustomPolicyRuleMetadataNoPolicy_inputParameters' - A string, in JSON format, that is passed to your organization Config
-- Custom Policy rule.
--
-- 'maximumExecutionFrequency', 'organizationCustomPolicyRuleMetadataNoPolicy_maximumExecutionFrequency' - The maximum frequency with which Config runs evaluations for a rule.
-- Your Config Custom Policy rule is triggered when Config delivers the
-- configuration snapshot. For more information, see
-- ConfigSnapshotDeliveryProperties.
--
-- 'organizationConfigRuleTriggerTypes', 'organizationCustomPolicyRuleMetadataNoPolicy_organizationConfigRuleTriggerTypes' - The type of notification that triggers Config to run an evaluation for a
-- rule. For Config Custom Policy rules, Config supports change triggered
-- notification types:
--
-- -   @ConfigurationItemChangeNotification@ - Triggers an evaluation when
--     Config delivers a configuration item as a result of a resource
--     change.
--
-- -   @OversizedConfigurationItemChangeNotification@ - Triggers an
--     evaluation when Config delivers an oversized configuration item.
--     Config may generate this notification type when a resource changes
--     and the notification exceeds the maximum size allowed by Amazon SNS.
--
-- 'policyRuntime', 'organizationCustomPolicyRuleMetadataNoPolicy_policyRuntime' - The runtime system for your organization Config Custom Policy rules.
-- Guard is a policy-as-code language that allows you to write policies
-- that are enforced by Config Custom Policy rules. For more information
-- about Guard, see the
-- <https://github.com/aws-cloudformation/cloudformation-guard Guard GitHub Repository>.
--
-- 'resourceIdScope', 'organizationCustomPolicyRuleMetadataNoPolicy_resourceIdScope' - The ID of the Amazon Web Services resource that was evaluated.
--
-- 'resourceTypesScope', 'organizationCustomPolicyRuleMetadataNoPolicy_resourceTypesScope' - The type of the Amazon Web Services resource that was evaluated.
--
-- 'tagKeyScope', 'organizationCustomPolicyRuleMetadataNoPolicy_tagKeyScope' - One part of a key-value pair that make up a tag. A key is a general
-- label that acts like a category for more specific tag values.
--
-- 'tagValueScope', 'organizationCustomPolicyRuleMetadataNoPolicy_tagValueScope' - The optional part of a key-value pair that make up a tag. A value acts
-- as a descriptor within a tag category (key).
newOrganizationCustomPolicyRuleMetadataNoPolicy ::
  OrganizationCustomPolicyRuleMetadataNoPolicy
newOrganizationCustomPolicyRuleMetadataNoPolicy :: OrganizationCustomPolicyRuleMetadataNoPolicy
newOrganizationCustomPolicyRuleMetadataNoPolicy =
  OrganizationCustomPolicyRuleMetadataNoPolicy'
    { $sel:debugLogDeliveryAccounts:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [Text]
debugLogDeliveryAccounts =
        forall a. Maybe a
Prelude.Nothing,
      $sel:description:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:inputParameters:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
inputParameters =
        forall a. Maybe a
Prelude.Nothing,
      $sel:maximumExecutionFrequency:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe MaximumExecutionFrequency
maximumExecutionFrequency =
        forall a. Maybe a
Prelude.Nothing,
      $sel:organizationConfigRuleTriggerTypes:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes =
        forall a. Maybe a
Prelude.Nothing,
      $sel:policyRuntime:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
policyRuntime =
        forall a. Maybe a
Prelude.Nothing,
      $sel:resourceIdScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
resourceIdScope =
        forall a. Maybe a
Prelude.Nothing,
      $sel:resourceTypesScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [Text]
resourceTypesScope =
        forall a. Maybe a
Prelude.Nothing,
      $sel:tagKeyScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
tagKeyScope = forall a. Maybe a
Prelude.Nothing,
      $sel:tagValueScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
tagValueScope =
        forall a. Maybe a
Prelude.Nothing
    }

-- | A list of accounts that you can enable debug logging for your
-- organization Config Custom Policy rule. List is null when debug logging
-- is enabled for all accounts.
organizationCustomPolicyRuleMetadataNoPolicy_debugLogDeliveryAccounts :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe [Prelude.Text])
organizationCustomPolicyRuleMetadataNoPolicy_debugLogDeliveryAccounts :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe [Text])
organizationCustomPolicyRuleMetadataNoPolicy_debugLogDeliveryAccounts = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe [Text]
debugLogDeliveryAccounts :: Maybe [Text]
$sel:debugLogDeliveryAccounts:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
debugLogDeliveryAccounts} -> Maybe [Text]
debugLogDeliveryAccounts) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe [Text]
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:debugLogDeliveryAccounts:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [Text]
debugLogDeliveryAccounts = Maybe [Text]
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy) 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 description that you provide for your organization Config Custom
-- Policy rule.
organizationCustomPolicyRuleMetadataNoPolicy_description :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_description :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
description :: Maybe Text
$sel:description:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
description} -> Maybe Text
description) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:description:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
description = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | A string, in JSON format, that is passed to your organization Config
-- Custom Policy rule.
organizationCustomPolicyRuleMetadataNoPolicy_inputParameters :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_inputParameters :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_inputParameters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
inputParameters :: Maybe Text
$sel:inputParameters:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
inputParameters} -> Maybe Text
inputParameters) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:inputParameters:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
inputParameters = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | The maximum frequency with which Config runs evaluations for a rule.
-- Your Config Custom Policy rule is triggered when Config delivers the
-- configuration snapshot. For more information, see
-- ConfigSnapshotDeliveryProperties.
organizationCustomPolicyRuleMetadataNoPolicy_maximumExecutionFrequency :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe MaximumExecutionFrequency)
organizationCustomPolicyRuleMetadataNoPolicy_maximumExecutionFrequency :: Lens'
  OrganizationCustomPolicyRuleMetadataNoPolicy
  (Maybe MaximumExecutionFrequency)
organizationCustomPolicyRuleMetadataNoPolicy_maximumExecutionFrequency = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe MaximumExecutionFrequency
maximumExecutionFrequency :: Maybe MaximumExecutionFrequency
$sel:maximumExecutionFrequency:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe MaximumExecutionFrequency
maximumExecutionFrequency} -> Maybe MaximumExecutionFrequency
maximumExecutionFrequency) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe MaximumExecutionFrequency
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:maximumExecutionFrequency:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe MaximumExecutionFrequency
maximumExecutionFrequency = Maybe MaximumExecutionFrequency
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | The type of notification that triggers Config to run an evaluation for a
-- rule. For Config Custom Policy rules, Config supports change triggered
-- notification types:
--
-- -   @ConfigurationItemChangeNotification@ - Triggers an evaluation when
--     Config delivers a configuration item as a result of a resource
--     change.
--
-- -   @OversizedConfigurationItemChangeNotification@ - Triggers an
--     evaluation when Config delivers an oversized configuration item.
--     Config may generate this notification type when a resource changes
--     and the notification exceeds the maximum size allowed by Amazon SNS.
organizationCustomPolicyRuleMetadataNoPolicy_organizationConfigRuleTriggerTypes :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe [OrganizationConfigRuleTriggerTypeNoSN])
organizationCustomPolicyRuleMetadataNoPolicy_organizationConfigRuleTriggerTypes :: Lens'
  OrganizationCustomPolicyRuleMetadataNoPolicy
  (Maybe [OrganizationConfigRuleTriggerTypeNoSN])
organizationCustomPolicyRuleMetadataNoPolicy_organizationConfigRuleTriggerTypes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes :: Maybe [OrganizationConfigRuleTriggerTypeNoSN]
$sel:organizationConfigRuleTriggerTypes:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes} -> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe [OrganizationConfigRuleTriggerTypeNoSN]
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:organizationConfigRuleTriggerTypes:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes = Maybe [OrganizationConfigRuleTriggerTypeNoSN]
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy) 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 runtime system for your organization Config Custom Policy rules.
-- Guard is a policy-as-code language that allows you to write policies
-- that are enforced by Config Custom Policy rules. For more information
-- about Guard, see the
-- <https://github.com/aws-cloudformation/cloudformation-guard Guard GitHub Repository>.
organizationCustomPolicyRuleMetadataNoPolicy_policyRuntime :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_policyRuntime :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_policyRuntime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
policyRuntime :: Maybe Text
$sel:policyRuntime:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
policyRuntime} -> Maybe Text
policyRuntime) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:policyRuntime:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
policyRuntime = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | The ID of the Amazon Web Services resource that was evaluated.
organizationCustomPolicyRuleMetadataNoPolicy_resourceIdScope :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_resourceIdScope :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_resourceIdScope = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
resourceIdScope :: Maybe Text
$sel:resourceIdScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
resourceIdScope} -> Maybe Text
resourceIdScope) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:resourceIdScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
resourceIdScope = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | The type of the Amazon Web Services resource that was evaluated.
organizationCustomPolicyRuleMetadataNoPolicy_resourceTypesScope :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe [Prelude.Text])
organizationCustomPolicyRuleMetadataNoPolicy_resourceTypesScope :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe [Text])
organizationCustomPolicyRuleMetadataNoPolicy_resourceTypesScope = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe [Text]
resourceTypesScope :: Maybe [Text]
$sel:resourceTypesScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
resourceTypesScope} -> Maybe [Text]
resourceTypesScope) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe [Text]
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:resourceTypesScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe [Text]
resourceTypesScope = Maybe [Text]
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy) 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

-- | One part of a key-value pair that make up a tag. A key is a general
-- label that acts like a category for more specific tag values.
organizationCustomPolicyRuleMetadataNoPolicy_tagKeyScope :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_tagKeyScope :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_tagKeyScope = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
tagKeyScope :: Maybe Text
$sel:tagKeyScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
tagKeyScope} -> Maybe Text
tagKeyScope) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:tagKeyScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
tagKeyScope = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

-- | The optional part of a key-value pair that make up a tag. A value acts
-- as a descriptor within a tag category (key).
organizationCustomPolicyRuleMetadataNoPolicy_tagValueScope :: Lens.Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Prelude.Maybe Prelude.Text)
organizationCustomPolicyRuleMetadataNoPolicy_tagValueScope :: Lens' OrganizationCustomPolicyRuleMetadataNoPolicy (Maybe Text)
organizationCustomPolicyRuleMetadataNoPolicy_tagValueScope = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe Text
tagValueScope :: Maybe Text
$sel:tagValueScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
tagValueScope} -> Maybe Text
tagValueScope) (\s :: OrganizationCustomPolicyRuleMetadataNoPolicy
s@OrganizationCustomPolicyRuleMetadataNoPolicy' {} Maybe Text
a -> OrganizationCustomPolicyRuleMetadataNoPolicy
s {$sel:tagValueScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: Maybe Text
tagValueScope = Maybe Text
a} :: OrganizationCustomPolicyRuleMetadataNoPolicy)

instance
  Data.FromJSON
    OrganizationCustomPolicyRuleMetadataNoPolicy
  where
  parseJSON :: Value -> Parser OrganizationCustomPolicyRuleMetadataNoPolicy
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"OrganizationCustomPolicyRuleMetadataNoPolicy"
      ( \Object
x ->
          Maybe [Text]
-> Maybe Text
-> Maybe Text
-> Maybe MaximumExecutionFrequency
-> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
-> Maybe Text
-> Maybe Text
-> Maybe [Text]
-> Maybe Text
-> Maybe Text
-> OrganizationCustomPolicyRuleMetadataNoPolicy
OrganizationCustomPolicyRuleMetadataNoPolicy'
            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
"DebugLogDeliveryAccounts"
                            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
"Description")
            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
"InputParameters")
            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
"MaximumExecutionFrequency")
            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
"OrganizationConfigRuleTriggerTypes"
                            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
"PolicyRuntime")
            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
"ResourceIdScope")
            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
"ResourceTypesScope"
                            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
"TagKeyScope")
            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
"TagValueScope")
      )

instance
  Prelude.Hashable
    OrganizationCustomPolicyRuleMetadataNoPolicy
  where
  hashWithSalt :: Int -> OrganizationCustomPolicyRuleMetadataNoPolicy -> Int
hashWithSalt
    Int
_salt
    OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe [Text]
Maybe [OrganizationConfigRuleTriggerTypeNoSN]
Maybe Text
Maybe MaximumExecutionFrequency
tagValueScope :: Maybe Text
tagKeyScope :: Maybe Text
resourceTypesScope :: Maybe [Text]
resourceIdScope :: Maybe Text
policyRuntime :: Maybe Text
organizationConfigRuleTriggerTypes :: Maybe [OrganizationConfigRuleTriggerTypeNoSN]
maximumExecutionFrequency :: Maybe MaximumExecutionFrequency
inputParameters :: Maybe Text
description :: Maybe Text
debugLogDeliveryAccounts :: Maybe [Text]
$sel:tagValueScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:tagKeyScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:resourceTypesScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
$sel:resourceIdScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:policyRuntime:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:organizationConfigRuleTriggerTypes:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
$sel:maximumExecutionFrequency:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe MaximumExecutionFrequency
$sel:inputParameters:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:description:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:debugLogDeliveryAccounts:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
debugLogDeliveryAccounts
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
inputParameters
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe MaximumExecutionFrequency
maximumExecutionFrequency
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
policyRuntime
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
resourceIdScope
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
resourceTypesScope
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tagKeyScope
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tagValueScope

instance
  Prelude.NFData
    OrganizationCustomPolicyRuleMetadataNoPolicy
  where
  rnf :: OrganizationCustomPolicyRuleMetadataNoPolicy -> ()
rnf OrganizationCustomPolicyRuleMetadataNoPolicy' {Maybe [Text]
Maybe [OrganizationConfigRuleTriggerTypeNoSN]
Maybe Text
Maybe MaximumExecutionFrequency
tagValueScope :: Maybe Text
tagKeyScope :: Maybe Text
resourceTypesScope :: Maybe [Text]
resourceIdScope :: Maybe Text
policyRuntime :: Maybe Text
organizationConfigRuleTriggerTypes :: Maybe [OrganizationConfigRuleTriggerTypeNoSN]
maximumExecutionFrequency :: Maybe MaximumExecutionFrequency
inputParameters :: Maybe Text
description :: Maybe Text
debugLogDeliveryAccounts :: Maybe [Text]
$sel:tagValueScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:tagKeyScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:resourceTypesScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
$sel:resourceIdScope:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:policyRuntime:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:organizationConfigRuleTriggerTypes:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe [OrganizationConfigRuleTriggerTypeNoSN]
$sel:maximumExecutionFrequency:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy
-> Maybe MaximumExecutionFrequency
$sel:inputParameters:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:description:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe Text
$sel:debugLogDeliveryAccounts:OrganizationCustomPolicyRuleMetadataNoPolicy' :: OrganizationCustomPolicyRuleMetadataNoPolicy -> Maybe [Text]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
debugLogDeliveryAccounts
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
description
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
inputParameters
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MaximumExecutionFrequency
maximumExecutionFrequency
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [OrganizationConfigRuleTriggerTypeNoSN]
organizationConfigRuleTriggerTypes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
policyRuntime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
resourceIdScope
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
resourceTypesScope
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tagKeyScope
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tagValueScope