{-# 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.EC2.Types.Ipam
-- 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.EC2.Types.Ipam where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.EC2.Internal
import Amazonka.EC2.Types.IpamOperatingRegion
import Amazonka.EC2.Types.IpamState
import Amazonka.EC2.Types.Tag
import qualified Amazonka.Prelude as Prelude

-- | IPAM is a VPC feature that you can use to automate your IP address
-- management workflows including assigning, tracking, troubleshooting, and
-- auditing IP addresses across Amazon Web Services Regions and accounts
-- throughout your Amazon Web Services Organization. For more information,
-- see
-- <https://docs.aws.amazon.com/vpc/latest/ipam/what-is-it-ipam.html What is IPAM?>
-- in the /Amazon VPC IPAM User Guide/.
--
-- /See:/ 'newIpam' smart constructor.
data Ipam = Ipam'
  { -- | The description for the IPAM.
    Ipam -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The ARN of the IPAM.
    Ipam -> Maybe Text
ipamArn :: Prelude.Maybe Prelude.Text,
    -- | The ID of the IPAM.
    Ipam -> Maybe Text
ipamId :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Web Services Region of the IPAM.
    Ipam -> Maybe Text
ipamRegion :: Prelude.Maybe Prelude.Text,
    -- | The operating Regions for an IPAM. Operating Regions are Amazon Web
    -- Services Regions where the IPAM is allowed to manage IP address CIDRs.
    -- IPAM only discovers and monitors resources in the Amazon Web Services
    -- Regions you select as operating Regions.
    --
    -- For more information about operating Regions, see
    -- <https://docs.aws.amazon.com/vpc/latest/ipam/create-ipam.html Create an IPAM>
    -- in the /Amazon VPC IPAM User Guide/.
    Ipam -> Maybe [IpamOperatingRegion]
operatingRegions :: Prelude.Maybe [IpamOperatingRegion],
    -- | The Amazon Web Services account ID of the owner of the IPAM.
    Ipam -> Maybe Text
ownerId :: Prelude.Maybe Prelude.Text,
    -- | The ID of the IPAM\'s default private scope.
    Ipam -> Maybe Text
privateDefaultScopeId :: Prelude.Maybe Prelude.Text,
    -- | The ID of the IPAM\'s default public scope.
    Ipam -> Maybe Text
publicDefaultScopeId :: Prelude.Maybe Prelude.Text,
    -- | The number of scopes in the IPAM. The scope quota is 5. For more
    -- information on quotas, see
    -- <https://docs.aws.amazon.com/vpc/latest/ipam/quotas-ipam.html Quotas in IPAM>
    -- in the /Amazon VPC IPAM User Guide/.
    Ipam -> Maybe Int
scopeCount :: Prelude.Maybe Prelude.Int,
    -- | The state of the IPAM.
    Ipam -> Maybe IpamState
state :: Prelude.Maybe IpamState,
    -- | The key\/value combination of a tag assigned to the resource. Use the
    -- tag key in the filter name and the tag value as the filter value. For
    -- example, to find all resources that have a tag with the key @Owner@ and
    -- the value @TeamA@, specify @tag:Owner@ for the filter name and @TeamA@
    -- for the filter value.
    Ipam -> Maybe [Tag]
tags :: Prelude.Maybe [Tag]
  }
  deriving (Ipam -> Ipam -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Ipam -> Ipam -> Bool
$c/= :: Ipam -> Ipam -> Bool
== :: Ipam -> Ipam -> Bool
$c== :: Ipam -> Ipam -> Bool
Prelude.Eq, ReadPrec [Ipam]
ReadPrec Ipam
Int -> ReadS Ipam
ReadS [Ipam]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Ipam]
$creadListPrec :: ReadPrec [Ipam]
readPrec :: ReadPrec Ipam
$creadPrec :: ReadPrec Ipam
readList :: ReadS [Ipam]
$creadList :: ReadS [Ipam]
readsPrec :: Int -> ReadS Ipam
$creadsPrec :: Int -> ReadS Ipam
Prelude.Read, Int -> Ipam -> ShowS
[Ipam] -> ShowS
Ipam -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Ipam] -> ShowS
$cshowList :: [Ipam] -> ShowS
show :: Ipam -> String
$cshow :: Ipam -> String
showsPrec :: Int -> Ipam -> ShowS
$cshowsPrec :: Int -> Ipam -> ShowS
Prelude.Show, forall x. Rep Ipam x -> Ipam
forall x. Ipam -> Rep Ipam x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Ipam x -> Ipam
$cfrom :: forall x. Ipam -> Rep Ipam x
Prelude.Generic)

-- |
-- Create a value of 'Ipam' 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:
--
-- 'description', 'ipam_description' - The description for the IPAM.
--
-- 'ipamArn', 'ipam_ipamArn' - The ARN of the IPAM.
--
-- 'ipamId', 'ipam_ipamId' - The ID of the IPAM.
--
-- 'ipamRegion', 'ipam_ipamRegion' - The Amazon Web Services Region of the IPAM.
--
-- 'operatingRegions', 'ipam_operatingRegions' - The operating Regions for an IPAM. Operating Regions are Amazon Web
-- Services Regions where the IPAM is allowed to manage IP address CIDRs.
-- IPAM only discovers and monitors resources in the Amazon Web Services
-- Regions you select as operating Regions.
--
-- For more information about operating Regions, see
-- <https://docs.aws.amazon.com/vpc/latest/ipam/create-ipam.html Create an IPAM>
-- in the /Amazon VPC IPAM User Guide/.
--
-- 'ownerId', 'ipam_ownerId' - The Amazon Web Services account ID of the owner of the IPAM.
--
-- 'privateDefaultScopeId', 'ipam_privateDefaultScopeId' - The ID of the IPAM\'s default private scope.
--
-- 'publicDefaultScopeId', 'ipam_publicDefaultScopeId' - The ID of the IPAM\'s default public scope.
--
-- 'scopeCount', 'ipam_scopeCount' - The number of scopes in the IPAM. The scope quota is 5. For more
-- information on quotas, see
-- <https://docs.aws.amazon.com/vpc/latest/ipam/quotas-ipam.html Quotas in IPAM>
-- in the /Amazon VPC IPAM User Guide/.
--
-- 'state', 'ipam_state' - The state of the IPAM.
--
-- 'tags', 'ipam_tags' - The key\/value combination of a tag assigned to the resource. Use the
-- tag key in the filter name and the tag value as the filter value. For
-- example, to find all resources that have a tag with the key @Owner@ and
-- the value @TeamA@, specify @tag:Owner@ for the filter name and @TeamA@
-- for the filter value.
newIpam ::
  Ipam
newIpam :: Ipam
newIpam =
  Ipam'
    { $sel:description:Ipam' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:ipamArn:Ipam' :: Maybe Text
ipamArn = forall a. Maybe a
Prelude.Nothing,
      $sel:ipamId:Ipam' :: Maybe Text
ipamId = forall a. Maybe a
Prelude.Nothing,
      $sel:ipamRegion:Ipam' :: Maybe Text
ipamRegion = forall a. Maybe a
Prelude.Nothing,
      $sel:operatingRegions:Ipam' :: Maybe [IpamOperatingRegion]
operatingRegions = forall a. Maybe a
Prelude.Nothing,
      $sel:ownerId:Ipam' :: Maybe Text
ownerId = forall a. Maybe a
Prelude.Nothing,
      $sel:privateDefaultScopeId:Ipam' :: Maybe Text
privateDefaultScopeId = forall a. Maybe a
Prelude.Nothing,
      $sel:publicDefaultScopeId:Ipam' :: Maybe Text
publicDefaultScopeId = forall a. Maybe a
Prelude.Nothing,
      $sel:scopeCount:Ipam' :: Maybe Int
scopeCount = forall a. Maybe a
Prelude.Nothing,
      $sel:state:Ipam' :: Maybe IpamState
state = forall a. Maybe a
Prelude.Nothing,
      $sel:tags:Ipam' :: Maybe [Tag]
tags = forall a. Maybe a
Prelude.Nothing
    }

-- | The description for the IPAM.
ipam_description :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_description :: Lens' Ipam (Maybe Text)
ipam_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
description :: Maybe Text
$sel:description:Ipam' :: Ipam -> Maybe Text
description} -> Maybe Text
description) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:description:Ipam' :: Maybe Text
description = Maybe Text
a} :: Ipam)

-- | The ARN of the IPAM.
ipam_ipamArn :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_ipamArn :: Lens' Ipam (Maybe Text)
ipam_ipamArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
ipamArn :: Maybe Text
$sel:ipamArn:Ipam' :: Ipam -> Maybe Text
ipamArn} -> Maybe Text
ipamArn) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:ipamArn:Ipam' :: Maybe Text
ipamArn = Maybe Text
a} :: Ipam)

-- | The ID of the IPAM.
ipam_ipamId :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_ipamId :: Lens' Ipam (Maybe Text)
ipam_ipamId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
ipamId :: Maybe Text
$sel:ipamId:Ipam' :: Ipam -> Maybe Text
ipamId} -> Maybe Text
ipamId) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:ipamId:Ipam' :: Maybe Text
ipamId = Maybe Text
a} :: Ipam)

-- | The Amazon Web Services Region of the IPAM.
ipam_ipamRegion :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_ipamRegion :: Lens' Ipam (Maybe Text)
ipam_ipamRegion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
ipamRegion :: Maybe Text
$sel:ipamRegion:Ipam' :: Ipam -> Maybe Text
ipamRegion} -> Maybe Text
ipamRegion) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:ipamRegion:Ipam' :: Maybe Text
ipamRegion = Maybe Text
a} :: Ipam)

-- | The operating Regions for an IPAM. Operating Regions are Amazon Web
-- Services Regions where the IPAM is allowed to manage IP address CIDRs.
-- IPAM only discovers and monitors resources in the Amazon Web Services
-- Regions you select as operating Regions.
--
-- For more information about operating Regions, see
-- <https://docs.aws.amazon.com/vpc/latest/ipam/create-ipam.html Create an IPAM>
-- in the /Amazon VPC IPAM User Guide/.
ipam_operatingRegions :: Lens.Lens' Ipam (Prelude.Maybe [IpamOperatingRegion])
ipam_operatingRegions :: Lens' Ipam (Maybe [IpamOperatingRegion])
ipam_operatingRegions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe [IpamOperatingRegion]
operatingRegions :: Maybe [IpamOperatingRegion]
$sel:operatingRegions:Ipam' :: Ipam -> Maybe [IpamOperatingRegion]
operatingRegions} -> Maybe [IpamOperatingRegion]
operatingRegions) (\s :: Ipam
s@Ipam' {} Maybe [IpamOperatingRegion]
a -> Ipam
s {$sel:operatingRegions:Ipam' :: Maybe [IpamOperatingRegion]
operatingRegions = Maybe [IpamOperatingRegion]
a} :: Ipam) 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 Amazon Web Services account ID of the owner of the IPAM.
ipam_ownerId :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_ownerId :: Lens' Ipam (Maybe Text)
ipam_ownerId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
ownerId :: Maybe Text
$sel:ownerId:Ipam' :: Ipam -> Maybe Text
ownerId} -> Maybe Text
ownerId) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:ownerId:Ipam' :: Maybe Text
ownerId = Maybe Text
a} :: Ipam)

-- | The ID of the IPAM\'s default private scope.
ipam_privateDefaultScopeId :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_privateDefaultScopeId :: Lens' Ipam (Maybe Text)
ipam_privateDefaultScopeId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
privateDefaultScopeId :: Maybe Text
$sel:privateDefaultScopeId:Ipam' :: Ipam -> Maybe Text
privateDefaultScopeId} -> Maybe Text
privateDefaultScopeId) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:privateDefaultScopeId:Ipam' :: Maybe Text
privateDefaultScopeId = Maybe Text
a} :: Ipam)

-- | The ID of the IPAM\'s default public scope.
ipam_publicDefaultScopeId :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Text)
ipam_publicDefaultScopeId :: Lens' Ipam (Maybe Text)
ipam_publicDefaultScopeId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Text
publicDefaultScopeId :: Maybe Text
$sel:publicDefaultScopeId:Ipam' :: Ipam -> Maybe Text
publicDefaultScopeId} -> Maybe Text
publicDefaultScopeId) (\s :: Ipam
s@Ipam' {} Maybe Text
a -> Ipam
s {$sel:publicDefaultScopeId:Ipam' :: Maybe Text
publicDefaultScopeId = Maybe Text
a} :: Ipam)

-- | The number of scopes in the IPAM. The scope quota is 5. For more
-- information on quotas, see
-- <https://docs.aws.amazon.com/vpc/latest/ipam/quotas-ipam.html Quotas in IPAM>
-- in the /Amazon VPC IPAM User Guide/.
ipam_scopeCount :: Lens.Lens' Ipam (Prelude.Maybe Prelude.Int)
ipam_scopeCount :: Lens' Ipam (Maybe Int)
ipam_scopeCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe Int
scopeCount :: Maybe Int
$sel:scopeCount:Ipam' :: Ipam -> Maybe Int
scopeCount} -> Maybe Int
scopeCount) (\s :: Ipam
s@Ipam' {} Maybe Int
a -> Ipam
s {$sel:scopeCount:Ipam' :: Maybe Int
scopeCount = Maybe Int
a} :: Ipam)

-- | The state of the IPAM.
ipam_state :: Lens.Lens' Ipam (Prelude.Maybe IpamState)
ipam_state :: Lens' Ipam (Maybe IpamState)
ipam_state = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe IpamState
state :: Maybe IpamState
$sel:state:Ipam' :: Ipam -> Maybe IpamState
state} -> Maybe IpamState
state) (\s :: Ipam
s@Ipam' {} Maybe IpamState
a -> Ipam
s {$sel:state:Ipam' :: Maybe IpamState
state = Maybe IpamState
a} :: Ipam)

-- | The key\/value combination of a tag assigned to the resource. Use the
-- tag key in the filter name and the tag value as the filter value. For
-- example, to find all resources that have a tag with the key @Owner@ and
-- the value @TeamA@, specify @tag:Owner@ for the filter name and @TeamA@
-- for the filter value.
ipam_tags :: Lens.Lens' Ipam (Prelude.Maybe [Tag])
ipam_tags :: Lens' Ipam (Maybe [Tag])
ipam_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Ipam' {Maybe [Tag]
tags :: Maybe [Tag]
$sel:tags:Ipam' :: Ipam -> Maybe [Tag]
tags} -> Maybe [Tag]
tags) (\s :: Ipam
s@Ipam' {} Maybe [Tag]
a -> Ipam
s {$sel:tags:Ipam' :: Maybe [Tag]
tags = Maybe [Tag]
a} :: Ipam) 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

instance Data.FromXML Ipam where
  parseXML :: [Node] -> Either String Ipam
parseXML [Node]
x =
    Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe [IpamOperatingRegion]
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Int
-> Maybe IpamState
-> Maybe [Tag]
-> Ipam
Ipam'
      forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"description")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ipamArn")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ipamId")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ipamRegion")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( [Node]
x
                      forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"operatingRegionSet"
                      forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                      forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
Prelude.>>= forall (f :: * -> *) a b.
Applicative f =>
([a] -> f b) -> [a] -> f (Maybe b)
Core.may (forall a. FromXML a => Text -> [Node] -> Either String [a]
Data.parseXMLList Text
"item")
                  )
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ownerId")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"privateDefaultScopeId")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"publicDefaultScopeId")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"scopeCount")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"state")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( [Node]
x
                      forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"tagSet"
                      forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                      forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
Prelude.>>= forall (f :: * -> *) a b.
Applicative f =>
([a] -> f b) -> [a] -> f (Maybe b)
Core.may (forall a. FromXML a => Text -> [Node] -> Either String [a]
Data.parseXMLList Text
"item")
                  )

instance Prelude.Hashable Ipam where
  hashWithSalt :: Int -> Ipam -> Int
hashWithSalt Int
_salt Ipam' {Maybe Int
Maybe [IpamOperatingRegion]
Maybe [Tag]
Maybe Text
Maybe IpamState
tags :: Maybe [Tag]
state :: Maybe IpamState
scopeCount :: Maybe Int
publicDefaultScopeId :: Maybe Text
privateDefaultScopeId :: Maybe Text
ownerId :: Maybe Text
operatingRegions :: Maybe [IpamOperatingRegion]
ipamRegion :: Maybe Text
ipamId :: Maybe Text
ipamArn :: Maybe Text
description :: Maybe Text
$sel:tags:Ipam' :: Ipam -> Maybe [Tag]
$sel:state:Ipam' :: Ipam -> Maybe IpamState
$sel:scopeCount:Ipam' :: Ipam -> Maybe Int
$sel:publicDefaultScopeId:Ipam' :: Ipam -> Maybe Text
$sel:privateDefaultScopeId:Ipam' :: Ipam -> Maybe Text
$sel:ownerId:Ipam' :: Ipam -> Maybe Text
$sel:operatingRegions:Ipam' :: Ipam -> Maybe [IpamOperatingRegion]
$sel:ipamRegion:Ipam' :: Ipam -> Maybe Text
$sel:ipamId:Ipam' :: Ipam -> Maybe Text
$sel:ipamArn:Ipam' :: Ipam -> Maybe Text
$sel:description:Ipam' :: Ipam -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ipamArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ipamId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ipamRegion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [IpamOperatingRegion]
operatingRegions
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ownerId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
privateDefaultScopeId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
publicDefaultScopeId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
scopeCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe IpamState
state
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Tag]
tags

instance Prelude.NFData Ipam where
  rnf :: Ipam -> ()
rnf Ipam' {Maybe Int
Maybe [IpamOperatingRegion]
Maybe [Tag]
Maybe Text
Maybe IpamState
tags :: Maybe [Tag]
state :: Maybe IpamState
scopeCount :: Maybe Int
publicDefaultScopeId :: Maybe Text
privateDefaultScopeId :: Maybe Text
ownerId :: Maybe Text
operatingRegions :: Maybe [IpamOperatingRegion]
ipamRegion :: Maybe Text
ipamId :: Maybe Text
ipamArn :: Maybe Text
description :: Maybe Text
$sel:tags:Ipam' :: Ipam -> Maybe [Tag]
$sel:state:Ipam' :: Ipam -> Maybe IpamState
$sel:scopeCount:Ipam' :: Ipam -> Maybe Int
$sel:publicDefaultScopeId:Ipam' :: Ipam -> Maybe Text
$sel:privateDefaultScopeId:Ipam' :: Ipam -> Maybe Text
$sel:ownerId:Ipam' :: Ipam -> Maybe Text
$sel:operatingRegions:Ipam' :: Ipam -> Maybe [IpamOperatingRegion]
$sel:ipamRegion:Ipam' :: Ipam -> Maybe Text
$sel:ipamId:Ipam' :: Ipam -> Maybe Text
$sel:ipamArn:Ipam' :: Ipam -> Maybe Text
$sel:description:Ipam' :: Ipam -> Maybe Text
..} =
    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
ipamArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
ipamId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
ipamRegion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [IpamOperatingRegion]
operatingRegions
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
ownerId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
privateDefaultScopeId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
publicDefaultScopeId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
scopeCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IpamState
state
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Tag]
tags