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

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

-- |
-- Module      : Amazonka.AlexaBusiness.UpdateNetworkProfile
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Updates a network profile by the network profile ARN.
module Amazonka.AlexaBusiness.UpdateNetworkProfile
  ( -- * Creating a Request
    UpdateNetworkProfile (..),
    newUpdateNetworkProfile,

    -- * Request Lenses
    updateNetworkProfile_certificateAuthorityArn,
    updateNetworkProfile_currentPassword,
    updateNetworkProfile_description,
    updateNetworkProfile_networkProfileName,
    updateNetworkProfile_nextPassword,
    updateNetworkProfile_trustAnchors,
    updateNetworkProfile_networkProfileArn,

    -- * Destructuring the Response
    UpdateNetworkProfileResponse (..),
    newUpdateNetworkProfileResponse,

    -- * Response Lenses
    updateNetworkProfileResponse_httpStatus,
  )
where

import Amazonka.AlexaBusiness.Types
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newUpdateNetworkProfile' smart constructor.
data UpdateNetworkProfile = UpdateNetworkProfile'
  { -- | The ARN of the Private Certificate Authority (PCA) created in AWS
    -- Certificate Manager (ACM). This is used to issue certificates to the
    -- devices.
    UpdateNetworkProfile -> Maybe Text
certificateAuthorityArn :: Prelude.Maybe Prelude.Text,
    -- | The current password of the Wi-Fi network.
    UpdateNetworkProfile -> Maybe (Sensitive Text)
currentPassword :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | Detailed information about a device\'s network profile.
    UpdateNetworkProfile -> Maybe Text
description :: Prelude.Maybe Prelude.Text,
    -- | The name of the network profile associated with a device.
    UpdateNetworkProfile -> Maybe Text
networkProfileName :: Prelude.Maybe Prelude.Text,
    -- | The next, or subsequent, password of the Wi-Fi network. This password is
    -- asynchronously transmitted to the device and is used when the password
    -- of the network changes to NextPassword.
    UpdateNetworkProfile -> Maybe (Sensitive Text)
nextPassword :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | The root certificate(s) of your authentication server that will be
    -- installed on your devices and used to trust your authentication server
    -- during EAP negotiation.
    UpdateNetworkProfile -> Maybe (NonEmpty Text)
trustAnchors :: Prelude.Maybe (Prelude.NonEmpty Prelude.Text),
    -- | The ARN of the network profile associated with a device.
    UpdateNetworkProfile -> Text
networkProfileArn :: Prelude.Text
  }
  deriving (UpdateNetworkProfile -> UpdateNetworkProfile -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateNetworkProfile -> UpdateNetworkProfile -> Bool
$c/= :: UpdateNetworkProfile -> UpdateNetworkProfile -> Bool
== :: UpdateNetworkProfile -> UpdateNetworkProfile -> Bool
$c== :: UpdateNetworkProfile -> UpdateNetworkProfile -> Bool
Prelude.Eq, Int -> UpdateNetworkProfile -> ShowS
[UpdateNetworkProfile] -> ShowS
UpdateNetworkProfile -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateNetworkProfile] -> ShowS
$cshowList :: [UpdateNetworkProfile] -> ShowS
show :: UpdateNetworkProfile -> String
$cshow :: UpdateNetworkProfile -> String
showsPrec :: Int -> UpdateNetworkProfile -> ShowS
$cshowsPrec :: Int -> UpdateNetworkProfile -> ShowS
Prelude.Show, forall x. Rep UpdateNetworkProfile x -> UpdateNetworkProfile
forall x. UpdateNetworkProfile -> Rep UpdateNetworkProfile x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UpdateNetworkProfile x -> UpdateNetworkProfile
$cfrom :: forall x. UpdateNetworkProfile -> Rep UpdateNetworkProfile x
Prelude.Generic)

-- |
-- Create a value of 'UpdateNetworkProfile' 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:
--
-- 'certificateAuthorityArn', 'updateNetworkProfile_certificateAuthorityArn' - The ARN of the Private Certificate Authority (PCA) created in AWS
-- Certificate Manager (ACM). This is used to issue certificates to the
-- devices.
--
-- 'currentPassword', 'updateNetworkProfile_currentPassword' - The current password of the Wi-Fi network.
--
-- 'description', 'updateNetworkProfile_description' - Detailed information about a device\'s network profile.
--
-- 'networkProfileName', 'updateNetworkProfile_networkProfileName' - The name of the network profile associated with a device.
--
-- 'nextPassword', 'updateNetworkProfile_nextPassword' - The next, or subsequent, password of the Wi-Fi network. This password is
-- asynchronously transmitted to the device and is used when the password
-- of the network changes to NextPassword.
--
-- 'trustAnchors', 'updateNetworkProfile_trustAnchors' - The root certificate(s) of your authentication server that will be
-- installed on your devices and used to trust your authentication server
-- during EAP negotiation.
--
-- 'networkProfileArn', 'updateNetworkProfile_networkProfileArn' - The ARN of the network profile associated with a device.
newUpdateNetworkProfile ::
  -- | 'networkProfileArn'
  Prelude.Text ->
  UpdateNetworkProfile
newUpdateNetworkProfile :: Text -> UpdateNetworkProfile
newUpdateNetworkProfile Text
pNetworkProfileArn_ =
  UpdateNetworkProfile'
    { $sel:certificateAuthorityArn:UpdateNetworkProfile' :: Maybe Text
certificateAuthorityArn =
        forall a. Maybe a
Prelude.Nothing,
      $sel:currentPassword:UpdateNetworkProfile' :: Maybe (Sensitive Text)
currentPassword = forall a. Maybe a
Prelude.Nothing,
      $sel:description:UpdateNetworkProfile' :: Maybe Text
description = forall a. Maybe a
Prelude.Nothing,
      $sel:networkProfileName:UpdateNetworkProfile' :: Maybe Text
networkProfileName = forall a. Maybe a
Prelude.Nothing,
      $sel:nextPassword:UpdateNetworkProfile' :: Maybe (Sensitive Text)
nextPassword = forall a. Maybe a
Prelude.Nothing,
      $sel:trustAnchors:UpdateNetworkProfile' :: Maybe (NonEmpty Text)
trustAnchors = forall a. Maybe a
Prelude.Nothing,
      $sel:networkProfileArn:UpdateNetworkProfile' :: Text
networkProfileArn = Text
pNetworkProfileArn_
    }

-- | The ARN of the Private Certificate Authority (PCA) created in AWS
-- Certificate Manager (ACM). This is used to issue certificates to the
-- devices.
updateNetworkProfile_certificateAuthorityArn :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe Prelude.Text)
updateNetworkProfile_certificateAuthorityArn :: Lens' UpdateNetworkProfile (Maybe Text)
updateNetworkProfile_certificateAuthorityArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe Text
certificateAuthorityArn :: Maybe Text
$sel:certificateAuthorityArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
certificateAuthorityArn} -> Maybe Text
certificateAuthorityArn) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe Text
a -> UpdateNetworkProfile
s {$sel:certificateAuthorityArn:UpdateNetworkProfile' :: Maybe Text
certificateAuthorityArn = Maybe Text
a} :: UpdateNetworkProfile)

-- | The current password of the Wi-Fi network.
updateNetworkProfile_currentPassword :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe Prelude.Text)
updateNetworkProfile_currentPassword :: Lens' UpdateNetworkProfile (Maybe Text)
updateNetworkProfile_currentPassword = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe (Sensitive Text)
currentPassword :: Maybe (Sensitive Text)
$sel:currentPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
currentPassword} -> Maybe (Sensitive Text)
currentPassword) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe (Sensitive Text)
a -> UpdateNetworkProfile
s {$sel:currentPassword:UpdateNetworkProfile' :: Maybe (Sensitive Text)
currentPassword = Maybe (Sensitive Text)
a} :: UpdateNetworkProfile) 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. Iso' (Sensitive a) a
Data._Sensitive

-- | Detailed information about a device\'s network profile.
updateNetworkProfile_description :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe Prelude.Text)
updateNetworkProfile_description :: Lens' UpdateNetworkProfile (Maybe Text)
updateNetworkProfile_description = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe Text
description :: Maybe Text
$sel:description:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
description} -> Maybe Text
description) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe Text
a -> UpdateNetworkProfile
s {$sel:description:UpdateNetworkProfile' :: Maybe Text
description = Maybe Text
a} :: UpdateNetworkProfile)

-- | The name of the network profile associated with a device.
updateNetworkProfile_networkProfileName :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe Prelude.Text)
updateNetworkProfile_networkProfileName :: Lens' UpdateNetworkProfile (Maybe Text)
updateNetworkProfile_networkProfileName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe Text
networkProfileName :: Maybe Text
$sel:networkProfileName:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
networkProfileName} -> Maybe Text
networkProfileName) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe Text
a -> UpdateNetworkProfile
s {$sel:networkProfileName:UpdateNetworkProfile' :: Maybe Text
networkProfileName = Maybe Text
a} :: UpdateNetworkProfile)

-- | The next, or subsequent, password of the Wi-Fi network. This password is
-- asynchronously transmitted to the device and is used when the password
-- of the network changes to NextPassword.
updateNetworkProfile_nextPassword :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe Prelude.Text)
updateNetworkProfile_nextPassword :: Lens' UpdateNetworkProfile (Maybe Text)
updateNetworkProfile_nextPassword = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe (Sensitive Text)
nextPassword :: Maybe (Sensitive Text)
$sel:nextPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
nextPassword} -> Maybe (Sensitive Text)
nextPassword) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe (Sensitive Text)
a -> UpdateNetworkProfile
s {$sel:nextPassword:UpdateNetworkProfile' :: Maybe (Sensitive Text)
nextPassword = Maybe (Sensitive Text)
a} :: UpdateNetworkProfile) 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. Iso' (Sensitive a) a
Data._Sensitive

-- | The root certificate(s) of your authentication server that will be
-- installed on your devices and used to trust your authentication server
-- during EAP negotiation.
updateNetworkProfile_trustAnchors :: Lens.Lens' UpdateNetworkProfile (Prelude.Maybe (Prelude.NonEmpty Prelude.Text))
updateNetworkProfile_trustAnchors :: Lens' UpdateNetworkProfile (Maybe (NonEmpty Text))
updateNetworkProfile_trustAnchors = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Maybe (NonEmpty Text)
trustAnchors :: Maybe (NonEmpty Text)
$sel:trustAnchors:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (NonEmpty Text)
trustAnchors} -> Maybe (NonEmpty Text)
trustAnchors) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Maybe (NonEmpty Text)
a -> UpdateNetworkProfile
s {$sel:trustAnchors:UpdateNetworkProfile' :: Maybe (NonEmpty Text)
trustAnchors = Maybe (NonEmpty Text)
a} :: UpdateNetworkProfile) 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 ARN of the network profile associated with a device.
updateNetworkProfile_networkProfileArn :: Lens.Lens' UpdateNetworkProfile Prelude.Text
updateNetworkProfile_networkProfileArn :: Lens' UpdateNetworkProfile Text
updateNetworkProfile_networkProfileArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateNetworkProfile' {Text
networkProfileArn :: Text
$sel:networkProfileArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Text
networkProfileArn} -> Text
networkProfileArn) (\s :: UpdateNetworkProfile
s@UpdateNetworkProfile' {} Text
a -> UpdateNetworkProfile
s {$sel:networkProfileArn:UpdateNetworkProfile' :: Text
networkProfileArn = Text
a} :: UpdateNetworkProfile)

instance Core.AWSRequest UpdateNetworkProfile where
  type
    AWSResponse UpdateNetworkProfile =
      UpdateNetworkProfileResponse
  request :: (Service -> Service)
-> UpdateNetworkProfile -> Request UpdateNetworkProfile
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy UpdateNetworkProfile
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse UpdateNetworkProfile)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> () -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveEmpty
      ( \Int
s ResponseHeaders
h ()
x ->
          Int -> UpdateNetworkProfileResponse
UpdateNetworkProfileResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable UpdateNetworkProfile where
  hashWithSalt :: Int -> UpdateNetworkProfile -> Int
hashWithSalt Int
_salt UpdateNetworkProfile' {Maybe (NonEmpty Text)
Maybe Text
Maybe (Sensitive Text)
Text
networkProfileArn :: Text
trustAnchors :: Maybe (NonEmpty Text)
nextPassword :: Maybe (Sensitive Text)
networkProfileName :: Maybe Text
description :: Maybe Text
currentPassword :: Maybe (Sensitive Text)
certificateAuthorityArn :: Maybe Text
$sel:networkProfileArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Text
$sel:trustAnchors:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (NonEmpty Text)
$sel:nextPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:networkProfileName:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:description:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:currentPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:certificateAuthorityArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
certificateAuthorityArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
currentPassword
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
description
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
networkProfileName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
nextPassword
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (NonEmpty Text)
trustAnchors
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
networkProfileArn

instance Prelude.NFData UpdateNetworkProfile where
  rnf :: UpdateNetworkProfile -> ()
rnf UpdateNetworkProfile' {Maybe (NonEmpty Text)
Maybe Text
Maybe (Sensitive Text)
Text
networkProfileArn :: Text
trustAnchors :: Maybe (NonEmpty Text)
nextPassword :: Maybe (Sensitive Text)
networkProfileName :: Maybe Text
description :: Maybe Text
currentPassword :: Maybe (Sensitive Text)
certificateAuthorityArn :: Maybe Text
$sel:networkProfileArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Text
$sel:trustAnchors:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (NonEmpty Text)
$sel:nextPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:networkProfileName:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:description:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:currentPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:certificateAuthorityArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
certificateAuthorityArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
currentPassword
      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
networkProfileName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
nextPassword
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe (NonEmpty Text)
trustAnchors
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
networkProfileArn

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

instance Data.ToJSON UpdateNetworkProfile where
  toJSON :: UpdateNetworkProfile -> Value
toJSON UpdateNetworkProfile' {Maybe (NonEmpty Text)
Maybe Text
Maybe (Sensitive Text)
Text
networkProfileArn :: Text
trustAnchors :: Maybe (NonEmpty Text)
nextPassword :: Maybe (Sensitive Text)
networkProfileName :: Maybe Text
description :: Maybe Text
currentPassword :: Maybe (Sensitive Text)
certificateAuthorityArn :: Maybe Text
$sel:networkProfileArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Text
$sel:trustAnchors:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (NonEmpty Text)
$sel:nextPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:networkProfileName:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:description:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
$sel:currentPassword:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe (Sensitive Text)
$sel:certificateAuthorityArn:UpdateNetworkProfile' :: UpdateNetworkProfile -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"CertificateAuthorityArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
certificateAuthorityArn,
            (Key
"CurrentPassword" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Sensitive Text)
currentPassword,
            (Key
"Description" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
description,
            (Key
"NetworkProfileName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
networkProfileName,
            (Key
"NextPassword" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Sensitive Text)
nextPassword,
            (Key
"TrustAnchors" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (NonEmpty Text)
trustAnchors,
            forall a. a -> Maybe a
Prelude.Just
              (Key
"NetworkProfileArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
networkProfileArn)
          ]
      )

instance Data.ToPath UpdateNetworkProfile where
  toPath :: UpdateNetworkProfile -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

instance Data.ToQuery UpdateNetworkProfile where
  toQuery :: UpdateNetworkProfile -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

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

-- |
-- Create a value of 'UpdateNetworkProfileResponse' 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:
--
-- 'httpStatus', 'updateNetworkProfileResponse_httpStatus' - The response's http status code.
newUpdateNetworkProfileResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  UpdateNetworkProfileResponse
newUpdateNetworkProfileResponse :: Int -> UpdateNetworkProfileResponse
newUpdateNetworkProfileResponse Int
pHttpStatus_ =
  UpdateNetworkProfileResponse'
    { $sel:httpStatus:UpdateNetworkProfileResponse' :: Int
httpStatus =
        Int
pHttpStatus_
    }

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

instance Prelude.NFData UpdateNetworkProfileResponse where
  rnf :: UpdateNetworkProfileResponse -> ()
rnf UpdateNetworkProfileResponse' {Int
httpStatus :: Int
$sel:httpStatus:UpdateNetworkProfileResponse' :: UpdateNetworkProfileResponse -> Int
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus