{-# 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.CloudFormation.Types.TypeSummary
-- 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.CloudFormation.Types.TypeSummary where

import Amazonka.CloudFormation.Types.IdentityProvider
import Amazonka.CloudFormation.Types.RegistryType
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

-- | Contains summary information about the specified CloudFormation
-- extension.
--
-- /See:/ 'newTypeSummary' smart constructor.
data TypeSummary = TypeSummary'
  { -- | The ID of the default version of the extension. The default version is
    -- used when the extension version isn\'t specified.
    --
    -- This applies only to private extensions you have registered in your
    -- account. For public extensions, both those provided by Amazon and
    -- published by third parties, CloudFormation returns @null@. For more
    -- information, see
    -- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
    --
    -- To set the default version of an extension, use
    -- @ @@SetTypeDefaultVersion@@ @.
    TypeSummary -> Maybe Text
defaultVersionId :: Prelude.Maybe Prelude.Text,
    -- | The description of the extension.
    TypeSummary -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | Whether the extension is activated for this account and region.
    --
    -- This applies only to third-party public extensions. Extensions published
    -- by Amazon are activated by default.
    TypeSummary -> Maybe Bool
isActivated :: Prelude.Maybe Prelude.Bool,
    -- | When the specified extension version was registered. This applies only
    -- to:
    --
    -- -   Private extensions you have registered in your account. For more
    --     information, see
    --     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
    --
    -- -   Public extensions you have activated in your account with
    --     auto-update specified. For more information, see
    --     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html ActivateType>.
    --
    -- For all other extension types, CloudFormation returns @null@.
    TypeSummary -> Maybe ISO8601
lastUpdated :: Prelude.Maybe Data.ISO8601,
    -- | For public extensions that have been activated for this account and
    -- region, the latest version of the public extension /that is available/.
    -- For any extensions other than activated third-arty extensions,
    -- CloudFormation returns @null@.
    --
    -- How you specified @AutoUpdate@ when enabling the extension affects
    -- whether CloudFormation automatically updates the extension in this
    -- account and region when a new version is released. For more information,
    -- see
    -- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
    -- in the /CloudFormation User Guide/.
    TypeSummary -> Maybe Text
latestPublicVersion :: Prelude.Maybe Prelude.Text,
    -- | For public extensions that have been activated for this account and
    -- region, the type name of the public extension.
    --
    -- If you specified a @TypeNameAlias@ when enabling the extension in this
    -- account and region, CloudFormation treats that alias as the extension\'s
    -- type name within the account and region, not the type name of the public
    -- extension. For more information, see
    -- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-alias Specifying aliases to refer to extensions>
    -- in the /CloudFormation User Guide/.
    TypeSummary -> Maybe Text
originalTypeName :: Prelude.Maybe Prelude.Text,
    -- | For public extensions that have been activated for this account and
    -- region, the version of the public extension to be used for
    -- CloudFormation operations in this account and Region.
    --
    -- How you specified @AutoUpdate@ when enabling the extension affects
    -- whether CloudFormation automatically updates the extension in this
    -- account and region when a new version is released. For more information,
    -- see
    -- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
    -- in the /CloudFormation User Guide/.
    TypeSummary -> Maybe Text
publicVersionNumber :: Prelude.Maybe Prelude.Text,
    -- | The ID of the extension publisher, if the extension is published by a
    -- third party. Extensions published by Amazon don\'t return a publisher
    -- ID.
    TypeSummary -> Maybe Text
publisherId :: Prelude.Maybe Prelude.Text,
    -- | The service used to verify the publisher identity.
    --
    -- For more information, see
    -- <https://docs.aws.amazon.com/cloudformation-cli/latest/userguide/publish-extension.html Registering your account to publish CloudFormation extensions>
    -- in the /CFN-CLI User Guide for Extension Development/.
    TypeSummary -> Maybe IdentityProvider
publisherIdentity :: Prelude.Maybe IdentityProvider,
    -- | The publisher name, as defined in the public profile for that publisher
    -- in the service used to verify the publisher identity.
    TypeSummary -> Maybe Text
publisherName :: Prelude.Maybe Prelude.Text,
    -- | The kind of extension.
    TypeSummary -> Maybe RegistryType
type' :: Prelude.Maybe RegistryType,
    -- | The Amazon Resource Name (ARN) of the extension.
    TypeSummary -> Maybe Text
typeArn :: Prelude.Maybe Prelude.Text,
    -- | The name of the extension.
    --
    -- If you specified a @TypeNameAlias@ when you
    -- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html activate this extension>
    -- in your account and region, CloudFormation considers that alias as the
    -- type name.
    TypeSummary -> Maybe Text
typeName :: Prelude.Maybe Prelude.Text
  }
  deriving (TypeSummary -> TypeSummary -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TypeSummary -> TypeSummary -> Bool
$c/= :: TypeSummary -> TypeSummary -> Bool
== :: TypeSummary -> TypeSummary -> Bool
$c== :: TypeSummary -> TypeSummary -> Bool
Prelude.Eq, ReadPrec [TypeSummary]
ReadPrec TypeSummary
Int -> ReadS TypeSummary
ReadS [TypeSummary]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [TypeSummary]
$creadListPrec :: ReadPrec [TypeSummary]
readPrec :: ReadPrec TypeSummary
$creadPrec :: ReadPrec TypeSummary
readList :: ReadS [TypeSummary]
$creadList :: ReadS [TypeSummary]
readsPrec :: Int -> ReadS TypeSummary
$creadsPrec :: Int -> ReadS TypeSummary
Prelude.Read, Int -> TypeSummary -> ShowS
[TypeSummary] -> ShowS
TypeSummary -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TypeSummary] -> ShowS
$cshowList :: [TypeSummary] -> ShowS
show :: TypeSummary -> String
$cshow :: TypeSummary -> String
showsPrec :: Int -> TypeSummary -> ShowS
$cshowsPrec :: Int -> TypeSummary -> ShowS
Prelude.Show, forall x. Rep TypeSummary x -> TypeSummary
forall x. TypeSummary -> Rep TypeSummary x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep TypeSummary x -> TypeSummary
$cfrom :: forall x. TypeSummary -> Rep TypeSummary x
Prelude.Generic)

-- |
-- Create a value of 'TypeSummary' 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:
--
-- 'defaultVersionId', 'typeSummary_defaultVersionId' - The ID of the default version of the extension. The default version is
-- used when the extension version isn\'t specified.
--
-- This applies only to private extensions you have registered in your
-- account. For public extensions, both those provided by Amazon and
-- published by third parties, CloudFormation returns @null@. For more
-- information, see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
--
-- To set the default version of an extension, use
-- @ @@SetTypeDefaultVersion@@ @.
--
-- 'description', 'typeSummary_description' - The description of the extension.
--
-- 'isActivated', 'typeSummary_isActivated' - Whether the extension is activated for this account and region.
--
-- This applies only to third-party public extensions. Extensions published
-- by Amazon are activated by default.
--
-- 'lastUpdated', 'typeSummary_lastUpdated' - When the specified extension version was registered. This applies only
-- to:
--
-- -   Private extensions you have registered in your account. For more
--     information, see
--     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
--
-- -   Public extensions you have activated in your account with
--     auto-update specified. For more information, see
--     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html ActivateType>.
--
-- For all other extension types, CloudFormation returns @null@.
--
-- 'latestPublicVersion', 'typeSummary_latestPublicVersion' - For public extensions that have been activated for this account and
-- region, the latest version of the public extension /that is available/.
-- For any extensions other than activated third-arty extensions,
-- CloudFormation returns @null@.
--
-- How you specified @AutoUpdate@ when enabling the extension affects
-- whether CloudFormation automatically updates the extension in this
-- account and region when a new version is released. For more information,
-- see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
-- in the /CloudFormation User Guide/.
--
-- 'originalTypeName', 'typeSummary_originalTypeName' - For public extensions that have been activated for this account and
-- region, the type name of the public extension.
--
-- If you specified a @TypeNameAlias@ when enabling the extension in this
-- account and region, CloudFormation treats that alias as the extension\'s
-- type name within the account and region, not the type name of the public
-- extension. For more information, see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-alias Specifying aliases to refer to extensions>
-- in the /CloudFormation User Guide/.
--
-- 'publicVersionNumber', 'typeSummary_publicVersionNumber' - For public extensions that have been activated for this account and
-- region, the version of the public extension to be used for
-- CloudFormation operations in this account and Region.
--
-- How you specified @AutoUpdate@ when enabling the extension affects
-- whether CloudFormation automatically updates the extension in this
-- account and region when a new version is released. For more information,
-- see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
-- in the /CloudFormation User Guide/.
--
-- 'publisherId', 'typeSummary_publisherId' - The ID of the extension publisher, if the extension is published by a
-- third party. Extensions published by Amazon don\'t return a publisher
-- ID.
--
-- 'publisherIdentity', 'typeSummary_publisherIdentity' - The service used to verify the publisher identity.
--
-- For more information, see
-- <https://docs.aws.amazon.com/cloudformation-cli/latest/userguide/publish-extension.html Registering your account to publish CloudFormation extensions>
-- in the /CFN-CLI User Guide for Extension Development/.
--
-- 'publisherName', 'typeSummary_publisherName' - The publisher name, as defined in the public profile for that publisher
-- in the service used to verify the publisher identity.
--
-- 'type'', 'typeSummary_type' - The kind of extension.
--
-- 'typeArn', 'typeSummary_typeArn' - The Amazon Resource Name (ARN) of the extension.
--
-- 'typeName', 'typeSummary_typeName' - The name of the extension.
--
-- If you specified a @TypeNameAlias@ when you
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html activate this extension>
-- in your account and region, CloudFormation considers that alias as the
-- type name.
newTypeSummary ::
  TypeSummary
newTypeSummary :: TypeSummary
newTypeSummary =
  TypeSummary'
    { $sel:defaultVersionId:TypeSummary' :: Maybe Text
defaultVersionId = forall a. Maybe a
Prelude.Nothing,
      $sel:description:TypeSummary' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:isActivated:TypeSummary' :: Maybe Bool
isActivated = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdated:TypeSummary' :: Maybe ISO8601
lastUpdated = forall a. Maybe a
Prelude.Nothing,
      $sel:latestPublicVersion:TypeSummary' :: Maybe Text
latestPublicVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:originalTypeName:TypeSummary' :: Maybe Text
originalTypeName = forall a. Maybe a
Prelude.Nothing,
      $sel:publicVersionNumber:TypeSummary' :: Maybe Text
publicVersionNumber = forall a. Maybe a
Prelude.Nothing,
      $sel:publisherId:TypeSummary' :: Maybe Text
publisherId = forall a. Maybe a
Prelude.Nothing,
      $sel:publisherIdentity:TypeSummary' :: Maybe IdentityProvider
publisherIdentity = forall a. Maybe a
Prelude.Nothing,
      $sel:publisherName:TypeSummary' :: Maybe Text
publisherName = forall a. Maybe a
Prelude.Nothing,
      $sel:type':TypeSummary' :: Maybe RegistryType
type' = forall a. Maybe a
Prelude.Nothing,
      $sel:typeArn:TypeSummary' :: Maybe Text
typeArn = forall a. Maybe a
Prelude.Nothing,
      $sel:typeName:TypeSummary' :: Maybe Text
typeName = forall a. Maybe a
Prelude.Nothing
    }

-- | The ID of the default version of the extension. The default version is
-- used when the extension version isn\'t specified.
--
-- This applies only to private extensions you have registered in your
-- account. For public extensions, both those provided by Amazon and
-- published by third parties, CloudFormation returns @null@. For more
-- information, see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
--
-- To set the default version of an extension, use
-- @ @@SetTypeDefaultVersion@@ @.
typeSummary_defaultVersionId :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_defaultVersionId :: Lens' TypeSummary (Maybe Text)
typeSummary_defaultVersionId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
defaultVersionId :: Maybe Text
$sel:defaultVersionId:TypeSummary' :: TypeSummary -> Maybe Text
defaultVersionId} -> Maybe Text
defaultVersionId) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:defaultVersionId:TypeSummary' :: Maybe Text
defaultVersionId = Maybe Text
a} :: TypeSummary)

-- | The description of the extension.
typeSummary_description :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_description :: Lens' TypeSummary (Maybe Text)
typeSummary_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
description :: Maybe Text
$sel:description:TypeSummary' :: TypeSummary -> Maybe Text
description} -> Maybe Text
description) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:description:TypeSummary' :: Maybe Text
description = Maybe Text
a} :: TypeSummary)

-- | Whether the extension is activated for this account and region.
--
-- This applies only to third-party public extensions. Extensions published
-- by Amazon are activated by default.
typeSummary_isActivated :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Bool)
typeSummary_isActivated :: Lens' TypeSummary (Maybe Bool)
typeSummary_isActivated = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Bool
isActivated :: Maybe Bool
$sel:isActivated:TypeSummary' :: TypeSummary -> Maybe Bool
isActivated} -> Maybe Bool
isActivated) (\s :: TypeSummary
s@TypeSummary' {} Maybe Bool
a -> TypeSummary
s {$sel:isActivated:TypeSummary' :: Maybe Bool
isActivated = Maybe Bool
a} :: TypeSummary)

-- | When the specified extension version was registered. This applies only
-- to:
--
-- -   Private extensions you have registered in your account. For more
--     information, see
--     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_RegisterType.html RegisterType>.
--
-- -   Public extensions you have activated in your account with
--     auto-update specified. For more information, see
--     <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html ActivateType>.
--
-- For all other extension types, CloudFormation returns @null@.
typeSummary_lastUpdated :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.UTCTime)
typeSummary_lastUpdated :: Lens' TypeSummary (Maybe UTCTime)
typeSummary_lastUpdated = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe ISO8601
lastUpdated :: Maybe ISO8601
$sel:lastUpdated:TypeSummary' :: TypeSummary -> Maybe ISO8601
lastUpdated} -> Maybe ISO8601
lastUpdated) (\s :: TypeSummary
s@TypeSummary' {} Maybe ISO8601
a -> TypeSummary
s {$sel:lastUpdated:TypeSummary' :: Maybe ISO8601
lastUpdated = Maybe ISO8601
a} :: TypeSummary) 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

-- | For public extensions that have been activated for this account and
-- region, the latest version of the public extension /that is available/.
-- For any extensions other than activated third-arty extensions,
-- CloudFormation returns @null@.
--
-- How you specified @AutoUpdate@ when enabling the extension affects
-- whether CloudFormation automatically updates the extension in this
-- account and region when a new version is released. For more information,
-- see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
-- in the /CloudFormation User Guide/.
typeSummary_latestPublicVersion :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_latestPublicVersion :: Lens' TypeSummary (Maybe Text)
typeSummary_latestPublicVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
latestPublicVersion :: Maybe Text
$sel:latestPublicVersion:TypeSummary' :: TypeSummary -> Maybe Text
latestPublicVersion} -> Maybe Text
latestPublicVersion) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:latestPublicVersion:TypeSummary' :: Maybe Text
latestPublicVersion = Maybe Text
a} :: TypeSummary)

-- | For public extensions that have been activated for this account and
-- region, the type name of the public extension.
--
-- If you specified a @TypeNameAlias@ when enabling the extension in this
-- account and region, CloudFormation treats that alias as the extension\'s
-- type name within the account and region, not the type name of the public
-- extension. For more information, see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-alias Specifying aliases to refer to extensions>
-- in the /CloudFormation User Guide/.
typeSummary_originalTypeName :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_originalTypeName :: Lens' TypeSummary (Maybe Text)
typeSummary_originalTypeName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
originalTypeName :: Maybe Text
$sel:originalTypeName:TypeSummary' :: TypeSummary -> Maybe Text
originalTypeName} -> Maybe Text
originalTypeName) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:originalTypeName:TypeSummary' :: Maybe Text
originalTypeName = Maybe Text
a} :: TypeSummary)

-- | For public extensions that have been activated for this account and
-- region, the version of the public extension to be used for
-- CloudFormation operations in this account and Region.
--
-- How you specified @AutoUpdate@ when enabling the extension affects
-- whether CloudFormation automatically updates the extension in this
-- account and region when a new version is released. For more information,
-- see
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/registry-public.html#registry-public-enable-auto Setting CloudFormation to automatically use new versions of extensions>
-- in the /CloudFormation User Guide/.
typeSummary_publicVersionNumber :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_publicVersionNumber :: Lens' TypeSummary (Maybe Text)
typeSummary_publicVersionNumber = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
publicVersionNumber :: Maybe Text
$sel:publicVersionNumber:TypeSummary' :: TypeSummary -> Maybe Text
publicVersionNumber} -> Maybe Text
publicVersionNumber) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:publicVersionNumber:TypeSummary' :: Maybe Text
publicVersionNumber = Maybe Text
a} :: TypeSummary)

-- | The ID of the extension publisher, if the extension is published by a
-- third party. Extensions published by Amazon don\'t return a publisher
-- ID.
typeSummary_publisherId :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_publisherId :: Lens' TypeSummary (Maybe Text)
typeSummary_publisherId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
publisherId :: Maybe Text
$sel:publisherId:TypeSummary' :: TypeSummary -> Maybe Text
publisherId} -> Maybe Text
publisherId) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:publisherId:TypeSummary' :: Maybe Text
publisherId = Maybe Text
a} :: TypeSummary)

-- | The service used to verify the publisher identity.
--
-- For more information, see
-- <https://docs.aws.amazon.com/cloudformation-cli/latest/userguide/publish-extension.html Registering your account to publish CloudFormation extensions>
-- in the /CFN-CLI User Guide for Extension Development/.
typeSummary_publisherIdentity :: Lens.Lens' TypeSummary (Prelude.Maybe IdentityProvider)
typeSummary_publisherIdentity :: Lens' TypeSummary (Maybe IdentityProvider)
typeSummary_publisherIdentity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe IdentityProvider
publisherIdentity :: Maybe IdentityProvider
$sel:publisherIdentity:TypeSummary' :: TypeSummary -> Maybe IdentityProvider
publisherIdentity} -> Maybe IdentityProvider
publisherIdentity) (\s :: TypeSummary
s@TypeSummary' {} Maybe IdentityProvider
a -> TypeSummary
s {$sel:publisherIdentity:TypeSummary' :: Maybe IdentityProvider
publisherIdentity = Maybe IdentityProvider
a} :: TypeSummary)

-- | The publisher name, as defined in the public profile for that publisher
-- in the service used to verify the publisher identity.
typeSummary_publisherName :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_publisherName :: Lens' TypeSummary (Maybe Text)
typeSummary_publisherName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
publisherName :: Maybe Text
$sel:publisherName:TypeSummary' :: TypeSummary -> Maybe Text
publisherName} -> Maybe Text
publisherName) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:publisherName:TypeSummary' :: Maybe Text
publisherName = Maybe Text
a} :: TypeSummary)

-- | The kind of extension.
typeSummary_type :: Lens.Lens' TypeSummary (Prelude.Maybe RegistryType)
typeSummary_type :: Lens' TypeSummary (Maybe RegistryType)
typeSummary_type = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe RegistryType
type' :: Maybe RegistryType
$sel:type':TypeSummary' :: TypeSummary -> Maybe RegistryType
type'} -> Maybe RegistryType
type') (\s :: TypeSummary
s@TypeSummary' {} Maybe RegistryType
a -> TypeSummary
s {$sel:type':TypeSummary' :: Maybe RegistryType
type' = Maybe RegistryType
a} :: TypeSummary)

-- | The Amazon Resource Name (ARN) of the extension.
typeSummary_typeArn :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_typeArn :: Lens' TypeSummary (Maybe Text)
typeSummary_typeArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
typeArn :: Maybe Text
$sel:typeArn:TypeSummary' :: TypeSummary -> Maybe Text
typeArn} -> Maybe Text
typeArn) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:typeArn:TypeSummary' :: Maybe Text
typeArn = Maybe Text
a} :: TypeSummary)

-- | The name of the extension.
--
-- If you specified a @TypeNameAlias@ when you
-- <https://docs.aws.amazon.com/AWSCloudFormation/latest/APIReference/API_ActivateType.html activate this extension>
-- in your account and region, CloudFormation considers that alias as the
-- type name.
typeSummary_typeName :: Lens.Lens' TypeSummary (Prelude.Maybe Prelude.Text)
typeSummary_typeName :: Lens' TypeSummary (Maybe Text)
typeSummary_typeName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TypeSummary' {Maybe Text
typeName :: Maybe Text
$sel:typeName:TypeSummary' :: TypeSummary -> Maybe Text
typeName} -> Maybe Text
typeName) (\s :: TypeSummary
s@TypeSummary' {} Maybe Text
a -> TypeSummary
s {$sel:typeName:TypeSummary' :: Maybe Text
typeName = Maybe Text
a} :: TypeSummary)

instance Data.FromXML TypeSummary where
  parseXML :: [Node] -> Either String TypeSummary
parseXML [Node]
x =
    Maybe Text
-> Maybe Text
-> Maybe Bool
-> Maybe ISO8601
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe IdentityProvider
-> Maybe Text
-> Maybe RegistryType
-> Maybe Text
-> Maybe Text
-> TypeSummary
TypeSummary'
      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
"DefaultVersionId")
      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
"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
"IsActivated")
      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
"LastUpdated")
      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
"LatestPublicVersion")
      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
"OriginalTypeName")
      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
"PublicVersionNumber")
      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
"PublisherId")
      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
"PublisherIdentity")
      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
"PublisherName")
      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
"Type")
      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
"TypeArn")
      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
"TypeName")

instance Prelude.Hashable TypeSummary where
  hashWithSalt :: Int -> TypeSummary -> Int
hashWithSalt Int
_salt TypeSummary' {Maybe Bool
Maybe Text
Maybe ISO8601
Maybe IdentityProvider
Maybe RegistryType
typeName :: Maybe Text
typeArn :: Maybe Text
type' :: Maybe RegistryType
publisherName :: Maybe Text
publisherIdentity :: Maybe IdentityProvider
publisherId :: Maybe Text
publicVersionNumber :: Maybe Text
originalTypeName :: Maybe Text
latestPublicVersion :: Maybe Text
lastUpdated :: Maybe ISO8601
isActivated :: Maybe Bool
description :: Maybe Text
defaultVersionId :: Maybe Text
$sel:typeName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:typeArn:TypeSummary' :: TypeSummary -> Maybe Text
$sel:type':TypeSummary' :: TypeSummary -> Maybe RegistryType
$sel:publisherName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:publisherIdentity:TypeSummary' :: TypeSummary -> Maybe IdentityProvider
$sel:publisherId:TypeSummary' :: TypeSummary -> Maybe Text
$sel:publicVersionNumber:TypeSummary' :: TypeSummary -> Maybe Text
$sel:originalTypeName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:latestPublicVersion:TypeSummary' :: TypeSummary -> Maybe Text
$sel:lastUpdated:TypeSummary' :: TypeSummary -> Maybe ISO8601
$sel:isActivated:TypeSummary' :: TypeSummary -> Maybe Bool
$sel:description:TypeSummary' :: TypeSummary -> Maybe Text
$sel:defaultVersionId:TypeSummary' :: TypeSummary -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
defaultVersionId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
isActivated
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ISO8601
lastUpdated
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
latestPublicVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
originalTypeName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
publicVersionNumber
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
publisherId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe IdentityProvider
publisherIdentity
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
publisherName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe RegistryType
type'
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
typeArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
typeName

instance Prelude.NFData TypeSummary where
  rnf :: TypeSummary -> ()
rnf TypeSummary' {Maybe Bool
Maybe Text
Maybe ISO8601
Maybe IdentityProvider
Maybe RegistryType
typeName :: Maybe Text
typeArn :: Maybe Text
type' :: Maybe RegistryType
publisherName :: Maybe Text
publisherIdentity :: Maybe IdentityProvider
publisherId :: Maybe Text
publicVersionNumber :: Maybe Text
originalTypeName :: Maybe Text
latestPublicVersion :: Maybe Text
lastUpdated :: Maybe ISO8601
isActivated :: Maybe Bool
description :: Maybe Text
defaultVersionId :: Maybe Text
$sel:typeName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:typeArn:TypeSummary' :: TypeSummary -> Maybe Text
$sel:type':TypeSummary' :: TypeSummary -> Maybe RegistryType
$sel:publisherName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:publisherIdentity:TypeSummary' :: TypeSummary -> Maybe IdentityProvider
$sel:publisherId:TypeSummary' :: TypeSummary -> Maybe Text
$sel:publicVersionNumber:TypeSummary' :: TypeSummary -> Maybe Text
$sel:originalTypeName:TypeSummary' :: TypeSummary -> Maybe Text
$sel:latestPublicVersion:TypeSummary' :: TypeSummary -> Maybe Text
$sel:lastUpdated:TypeSummary' :: TypeSummary -> Maybe ISO8601
$sel:isActivated:TypeSummary' :: TypeSummary -> Maybe Bool
$sel:description:TypeSummary' :: TypeSummary -> Maybe Text
$sel:defaultVersionId:TypeSummary' :: TypeSummary -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
defaultVersionId
      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 Bool
isActivated
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ISO8601
lastUpdated
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
latestPublicVersion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
originalTypeName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
publicVersionNumber
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
publisherId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IdentityProvider
publisherIdentity
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
publisherName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe RegistryType
type'
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
typeArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
typeName