{-# 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 #-}
module Amazonka.EC2.Types.VpnTunnelOptionsSpecification 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.IKEVersionsRequestListValue
import Amazonka.EC2.Types.Phase1DHGroupNumbersRequestListValue
import Amazonka.EC2.Types.Phase1EncryptionAlgorithmsRequestListValue
import Amazonka.EC2.Types.Phase1IntegrityAlgorithmsRequestListValue
import Amazonka.EC2.Types.Phase2DHGroupNumbersRequestListValue
import Amazonka.EC2.Types.Phase2EncryptionAlgorithmsRequestListValue
import Amazonka.EC2.Types.Phase2IntegrityAlgorithmsRequestListValue
import Amazonka.EC2.Types.VpnTunnelLogOptionsSpecification
import qualified Amazonka.Prelude as Prelude
data VpnTunnelOptionsSpecification = VpnTunnelOptionsSpecification'
{
VpnTunnelOptionsSpecification -> Maybe Text
dPDTimeoutAction :: Prelude.Maybe Prelude.Text,
VpnTunnelOptionsSpecification -> Maybe Int
dPDTimeoutSeconds :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification
-> Maybe [IKEVersionsRequestListValue]
iKEVersions :: Prelude.Maybe [IKEVersionsRequestListValue],
VpnTunnelOptionsSpecification
-> Maybe VpnTunnelLogOptionsSpecification
logOptions :: Prelude.Maybe VpnTunnelLogOptionsSpecification,
VpnTunnelOptionsSpecification
-> Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers :: Prelude.Maybe [Phase1DHGroupNumbersRequestListValue],
VpnTunnelOptionsSpecification
-> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms :: Prelude.Maybe [Phase1EncryptionAlgorithmsRequestListValue],
VpnTunnelOptionsSpecification
-> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms :: Prelude.Maybe [Phase1IntegrityAlgorithmsRequestListValue],
VpnTunnelOptionsSpecification -> Maybe Int
phase1LifetimeSeconds :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification
-> Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers :: Prelude.Maybe [Phase2DHGroupNumbersRequestListValue],
VpnTunnelOptionsSpecification
-> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms :: Prelude.Maybe [Phase2EncryptionAlgorithmsRequestListValue],
VpnTunnelOptionsSpecification
-> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms :: Prelude.Maybe [Phase2IntegrityAlgorithmsRequestListValue],
VpnTunnelOptionsSpecification -> Maybe Int
phase2LifetimeSeconds :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification -> Maybe Text
preSharedKey :: Prelude.Maybe Prelude.Text,
VpnTunnelOptionsSpecification -> Maybe Int
rekeyFuzzPercentage :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification -> Maybe Int
rekeyMarginTimeSeconds :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification -> Maybe Int
replayWindowSize :: Prelude.Maybe Prelude.Int,
VpnTunnelOptionsSpecification -> Maybe Text
startupAction :: Prelude.Maybe Prelude.Text,
VpnTunnelOptionsSpecification -> Maybe Text
tunnelInsideCidr :: Prelude.Maybe Prelude.Text,
VpnTunnelOptionsSpecification -> Maybe Text
tunnelInsideIpv6Cidr :: Prelude.Maybe Prelude.Text
}
deriving (VpnTunnelOptionsSpecification
-> VpnTunnelOptionsSpecification -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: VpnTunnelOptionsSpecification
-> VpnTunnelOptionsSpecification -> Bool
$c/= :: VpnTunnelOptionsSpecification
-> VpnTunnelOptionsSpecification -> Bool
== :: VpnTunnelOptionsSpecification
-> VpnTunnelOptionsSpecification -> Bool
$c== :: VpnTunnelOptionsSpecification
-> VpnTunnelOptionsSpecification -> Bool
Prelude.Eq, ReadPrec [VpnTunnelOptionsSpecification]
ReadPrec VpnTunnelOptionsSpecification
Int -> ReadS VpnTunnelOptionsSpecification
ReadS [VpnTunnelOptionsSpecification]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [VpnTunnelOptionsSpecification]
$creadListPrec :: ReadPrec [VpnTunnelOptionsSpecification]
readPrec :: ReadPrec VpnTunnelOptionsSpecification
$creadPrec :: ReadPrec VpnTunnelOptionsSpecification
readList :: ReadS [VpnTunnelOptionsSpecification]
$creadList :: ReadS [VpnTunnelOptionsSpecification]
readsPrec :: Int -> ReadS VpnTunnelOptionsSpecification
$creadsPrec :: Int -> ReadS VpnTunnelOptionsSpecification
Prelude.Read, Int -> VpnTunnelOptionsSpecification -> ShowS
[VpnTunnelOptionsSpecification] -> ShowS
VpnTunnelOptionsSpecification -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [VpnTunnelOptionsSpecification] -> ShowS
$cshowList :: [VpnTunnelOptionsSpecification] -> ShowS
show :: VpnTunnelOptionsSpecification -> String
$cshow :: VpnTunnelOptionsSpecification -> String
showsPrec :: Int -> VpnTunnelOptionsSpecification -> ShowS
$cshowsPrec :: Int -> VpnTunnelOptionsSpecification -> ShowS
Prelude.Show, forall x.
Rep VpnTunnelOptionsSpecification x
-> VpnTunnelOptionsSpecification
forall x.
VpnTunnelOptionsSpecification
-> Rep VpnTunnelOptionsSpecification x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep VpnTunnelOptionsSpecification x
-> VpnTunnelOptionsSpecification
$cfrom :: forall x.
VpnTunnelOptionsSpecification
-> Rep VpnTunnelOptionsSpecification x
Prelude.Generic)
newVpnTunnelOptionsSpecification ::
VpnTunnelOptionsSpecification
newVpnTunnelOptionsSpecification :: VpnTunnelOptionsSpecification
newVpnTunnelOptionsSpecification =
VpnTunnelOptionsSpecification'
{ $sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: Maybe Text
dPDTimeoutAction =
forall a. Maybe a
Prelude.Nothing,
$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
dPDTimeoutSeconds = forall a. Maybe a
Prelude.Nothing,
$sel:iKEVersions:VpnTunnelOptionsSpecification' :: Maybe [IKEVersionsRequestListValue]
iKEVersions = forall a. Maybe a
Prelude.Nothing,
$sel:logOptions:VpnTunnelOptionsSpecification' :: Maybe VpnTunnelLogOptionsSpecification
logOptions = forall a. Maybe a
Prelude.Nothing,
$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers = forall a. Maybe a
Prelude.Nothing,
$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms = forall a. Maybe a
Prelude.Nothing,
$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms = forall a. Maybe a
Prelude.Nothing,
$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
phase1LifetimeSeconds = forall a. Maybe a
Prelude.Nothing,
$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers = forall a. Maybe a
Prelude.Nothing,
$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms = forall a. Maybe a
Prelude.Nothing,
$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms = forall a. Maybe a
Prelude.Nothing,
$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
phase2LifetimeSeconds = forall a. Maybe a
Prelude.Nothing,
$sel:preSharedKey:VpnTunnelOptionsSpecification' :: Maybe Text
preSharedKey = forall a. Maybe a
Prelude.Nothing,
$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: Maybe Int
rekeyFuzzPercentage = forall a. Maybe a
Prelude.Nothing,
$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
rekeyMarginTimeSeconds = forall a. Maybe a
Prelude.Nothing,
$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: Maybe Int
replayWindowSize = forall a. Maybe a
Prelude.Nothing,
$sel:startupAction:VpnTunnelOptionsSpecification' :: Maybe Text
startupAction = forall a. Maybe a
Prelude.Nothing,
$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: Maybe Text
tunnelInsideCidr = forall a. Maybe a
Prelude.Nothing,
$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: Maybe Text
tunnelInsideIpv6Cidr = forall a. Maybe a
Prelude.Nothing
}
vpnTunnelOptionsSpecification_dPDTimeoutAction :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Text)
vpnTunnelOptionsSpecification_dPDTimeoutAction :: Lens' VpnTunnelOptionsSpecification (Maybe Text)
vpnTunnelOptionsSpecification_dPDTimeoutAction = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Text
dPDTimeoutAction :: Maybe Text
$sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
dPDTimeoutAction} -> Maybe Text
dPDTimeoutAction) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Text
a -> VpnTunnelOptionsSpecification
s {$sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: Maybe Text
dPDTimeoutAction = Maybe Text
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_dPDTimeoutSeconds :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_dPDTimeoutSeconds :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_dPDTimeoutSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
dPDTimeoutSeconds :: Maybe Int
$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
dPDTimeoutSeconds} -> Maybe Int
dPDTimeoutSeconds) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
dPDTimeoutSeconds = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_iKEVersions :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [IKEVersionsRequestListValue])
vpnTunnelOptionsSpecification_iKEVersions :: Lens'
VpnTunnelOptionsSpecification (Maybe [IKEVersionsRequestListValue])
vpnTunnelOptionsSpecification_iKEVersions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [IKEVersionsRequestListValue]
iKEVersions :: Maybe [IKEVersionsRequestListValue]
$sel:iKEVersions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [IKEVersionsRequestListValue]
iKEVersions} -> Maybe [IKEVersionsRequestListValue]
iKEVersions) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [IKEVersionsRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:iKEVersions:VpnTunnelOptionsSpecification' :: Maybe [IKEVersionsRequestListValue]
iKEVersions = Maybe [IKEVersionsRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_logOptions :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe VpnTunnelLogOptionsSpecification)
vpnTunnelOptionsSpecification_logOptions :: Lens'
VpnTunnelOptionsSpecification
(Maybe VpnTunnelLogOptionsSpecification)
vpnTunnelOptionsSpecification_logOptions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe VpnTunnelLogOptionsSpecification
logOptions :: Maybe VpnTunnelLogOptionsSpecification
$sel:logOptions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe VpnTunnelLogOptionsSpecification
logOptions} -> Maybe VpnTunnelLogOptionsSpecification
logOptions) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe VpnTunnelLogOptionsSpecification
a -> VpnTunnelOptionsSpecification
s {$sel:logOptions:VpnTunnelOptionsSpecification' :: Maybe VpnTunnelLogOptionsSpecification
logOptions = Maybe VpnTunnelLogOptionsSpecification
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_phase1DHGroupNumbers :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase1DHGroupNumbersRequestListValue])
vpnTunnelOptionsSpecification_phase1DHGroupNumbers :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase1DHGroupNumbersRequestListValue])
vpnTunnelOptionsSpecification_phase1DHGroupNumbers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers :: Maybe [Phase1DHGroupNumbersRequestListValue]
$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers} -> Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase1DHGroupNumbersRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers = Maybe [Phase1DHGroupNumbersRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase1EncryptionAlgorithms :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase1EncryptionAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase1EncryptionAlgorithms :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase1EncryptionAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase1EncryptionAlgorithms = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms} -> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase1EncryptionAlgorithmsRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms = Maybe [Phase1EncryptionAlgorithmsRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase1IntegrityAlgorithms :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase1IntegrityAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase1IntegrityAlgorithms :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase1IntegrityAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase1IntegrityAlgorithms = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms} -> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase1IntegrityAlgorithmsRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms = Maybe [Phase1IntegrityAlgorithmsRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase1LifetimeSeconds :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_phase1LifetimeSeconds :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_phase1LifetimeSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
phase1LifetimeSeconds :: Maybe Int
$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
phase1LifetimeSeconds} -> Maybe Int
phase1LifetimeSeconds) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
phase1LifetimeSeconds = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_phase2DHGroupNumbers :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase2DHGroupNumbersRequestListValue])
vpnTunnelOptionsSpecification_phase2DHGroupNumbers :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase2DHGroupNumbersRequestListValue])
vpnTunnelOptionsSpecification_phase2DHGroupNumbers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers :: Maybe [Phase2DHGroupNumbersRequestListValue]
$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers} -> Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase2DHGroupNumbersRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers = Maybe [Phase2DHGroupNumbersRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase2EncryptionAlgorithms :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase2EncryptionAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase2EncryptionAlgorithms :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase2EncryptionAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase2EncryptionAlgorithms = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms} -> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase2EncryptionAlgorithmsRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms = Maybe [Phase2EncryptionAlgorithmsRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase2IntegrityAlgorithms :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe [Phase2IntegrityAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase2IntegrityAlgorithms :: Lens'
VpnTunnelOptionsSpecification
(Maybe [Phase2IntegrityAlgorithmsRequestListValue])
vpnTunnelOptionsSpecification_phase2IntegrityAlgorithms = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms} -> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe [Phase2IntegrityAlgorithmsRequestListValue]
a -> VpnTunnelOptionsSpecification
s {$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms = Maybe [Phase2IntegrityAlgorithmsRequestListValue]
a} :: VpnTunnelOptionsSpecification) 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
vpnTunnelOptionsSpecification_phase2LifetimeSeconds :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_phase2LifetimeSeconds :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_phase2LifetimeSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
phase2LifetimeSeconds :: Maybe Int
$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
phase2LifetimeSeconds} -> Maybe Int
phase2LifetimeSeconds) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
phase2LifetimeSeconds = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_preSharedKey :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Text)
vpnTunnelOptionsSpecification_preSharedKey :: Lens' VpnTunnelOptionsSpecification (Maybe Text)
vpnTunnelOptionsSpecification_preSharedKey = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Text
preSharedKey :: Maybe Text
$sel:preSharedKey:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
preSharedKey} -> Maybe Text
preSharedKey) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Text
a -> VpnTunnelOptionsSpecification
s {$sel:preSharedKey:VpnTunnelOptionsSpecification' :: Maybe Text
preSharedKey = Maybe Text
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_rekeyFuzzPercentage :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_rekeyFuzzPercentage :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_rekeyFuzzPercentage = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
rekeyFuzzPercentage :: Maybe Int
$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
rekeyFuzzPercentage} -> Maybe Int
rekeyFuzzPercentage) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: Maybe Int
rekeyFuzzPercentage = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_rekeyMarginTimeSeconds :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_rekeyMarginTimeSeconds :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_rekeyMarginTimeSeconds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
rekeyMarginTimeSeconds :: Maybe Int
$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
rekeyMarginTimeSeconds} -> Maybe Int
rekeyMarginTimeSeconds) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: Maybe Int
rekeyMarginTimeSeconds = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_replayWindowSize :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Int)
vpnTunnelOptionsSpecification_replayWindowSize :: Lens' VpnTunnelOptionsSpecification (Maybe Int)
vpnTunnelOptionsSpecification_replayWindowSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Int
replayWindowSize :: Maybe Int
$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
replayWindowSize} -> Maybe Int
replayWindowSize) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Int
a -> VpnTunnelOptionsSpecification
s {$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: Maybe Int
replayWindowSize = Maybe Int
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_startupAction :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Text)
vpnTunnelOptionsSpecification_startupAction :: Lens' VpnTunnelOptionsSpecification (Maybe Text)
vpnTunnelOptionsSpecification_startupAction = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Text
startupAction :: Maybe Text
$sel:startupAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
startupAction} -> Maybe Text
startupAction) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Text
a -> VpnTunnelOptionsSpecification
s {$sel:startupAction:VpnTunnelOptionsSpecification' :: Maybe Text
startupAction = Maybe Text
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_tunnelInsideCidr :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Text)
vpnTunnelOptionsSpecification_tunnelInsideCidr :: Lens' VpnTunnelOptionsSpecification (Maybe Text)
vpnTunnelOptionsSpecification_tunnelInsideCidr = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Text
tunnelInsideCidr :: Maybe Text
$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
tunnelInsideCidr} -> Maybe Text
tunnelInsideCidr) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Text
a -> VpnTunnelOptionsSpecification
s {$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: Maybe Text
tunnelInsideCidr = Maybe Text
a} :: VpnTunnelOptionsSpecification)
vpnTunnelOptionsSpecification_tunnelInsideIpv6Cidr :: Lens.Lens' VpnTunnelOptionsSpecification (Prelude.Maybe Prelude.Text)
vpnTunnelOptionsSpecification_tunnelInsideIpv6Cidr :: Lens' VpnTunnelOptionsSpecification (Maybe Text)
vpnTunnelOptionsSpecification_tunnelInsideIpv6Cidr = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\VpnTunnelOptionsSpecification' {Maybe Text
tunnelInsideIpv6Cidr :: Maybe Text
$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
tunnelInsideIpv6Cidr} -> Maybe Text
tunnelInsideIpv6Cidr) (\s :: VpnTunnelOptionsSpecification
s@VpnTunnelOptionsSpecification' {} Maybe Text
a -> VpnTunnelOptionsSpecification
s {$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: Maybe Text
tunnelInsideIpv6Cidr = Maybe Text
a} :: VpnTunnelOptionsSpecification)
instance
Prelude.Hashable
VpnTunnelOptionsSpecification
where
hashWithSalt :: Int -> VpnTunnelOptionsSpecification -> Int
hashWithSalt Int
_salt VpnTunnelOptionsSpecification' {Maybe Int
Maybe [IKEVersionsRequestListValue]
Maybe [Phase1DHGroupNumbersRequestListValue]
Maybe [Phase1EncryptionAlgorithmsRequestListValue]
Maybe [Phase1IntegrityAlgorithmsRequestListValue]
Maybe [Phase2DHGroupNumbersRequestListValue]
Maybe [Phase2EncryptionAlgorithmsRequestListValue]
Maybe [Phase2IntegrityAlgorithmsRequestListValue]
Maybe Text
Maybe VpnTunnelLogOptionsSpecification
tunnelInsideIpv6Cidr :: Maybe Text
tunnelInsideCidr :: Maybe Text
startupAction :: Maybe Text
replayWindowSize :: Maybe Int
rekeyMarginTimeSeconds :: Maybe Int
rekeyFuzzPercentage :: Maybe Int
preSharedKey :: Maybe Text
phase2LifetimeSeconds :: Maybe Int
phase2IntegrityAlgorithms :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2EncryptionAlgorithms :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2DHGroupNumbers :: Maybe [Phase2DHGroupNumbersRequestListValue]
phase1LifetimeSeconds :: Maybe Int
phase1IntegrityAlgorithms :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1EncryptionAlgorithms :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1DHGroupNumbers :: Maybe [Phase1DHGroupNumbersRequestListValue]
logOptions :: Maybe VpnTunnelLogOptionsSpecification
iKEVersions :: Maybe [IKEVersionsRequestListValue]
dPDTimeoutSeconds :: Maybe Int
dPDTimeoutAction :: Maybe Text
$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:startupAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:preSharedKey:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2DHGroupNumbersRequestListValue]
$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1DHGroupNumbersRequestListValue]
$sel:logOptions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe VpnTunnelLogOptionsSpecification
$sel:iKEVersions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [IKEVersionsRequestListValue]
$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dPDTimeoutAction
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
dPDTimeoutSeconds
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [IKEVersionsRequestListValue]
iKEVersions
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe VpnTunnelLogOptionsSpecification
logOptions
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
phase1LifetimeSeconds
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
phase2LifetimeSeconds
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
preSharedKey
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
rekeyFuzzPercentage
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
rekeyMarginTimeSeconds
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
replayWindowSize
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
startupAction
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tunnelInsideCidr
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tunnelInsideIpv6Cidr
instance Prelude.NFData VpnTunnelOptionsSpecification where
rnf :: VpnTunnelOptionsSpecification -> ()
rnf VpnTunnelOptionsSpecification' {Maybe Int
Maybe [IKEVersionsRequestListValue]
Maybe [Phase1DHGroupNumbersRequestListValue]
Maybe [Phase1EncryptionAlgorithmsRequestListValue]
Maybe [Phase1IntegrityAlgorithmsRequestListValue]
Maybe [Phase2DHGroupNumbersRequestListValue]
Maybe [Phase2EncryptionAlgorithmsRequestListValue]
Maybe [Phase2IntegrityAlgorithmsRequestListValue]
Maybe Text
Maybe VpnTunnelLogOptionsSpecification
tunnelInsideIpv6Cidr :: Maybe Text
tunnelInsideCidr :: Maybe Text
startupAction :: Maybe Text
replayWindowSize :: Maybe Int
rekeyMarginTimeSeconds :: Maybe Int
rekeyFuzzPercentage :: Maybe Int
preSharedKey :: Maybe Text
phase2LifetimeSeconds :: Maybe Int
phase2IntegrityAlgorithms :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2EncryptionAlgorithms :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2DHGroupNumbers :: Maybe [Phase2DHGroupNumbersRequestListValue]
phase1LifetimeSeconds :: Maybe Int
phase1IntegrityAlgorithms :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1EncryptionAlgorithms :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1DHGroupNumbers :: Maybe [Phase1DHGroupNumbersRequestListValue]
logOptions :: Maybe VpnTunnelLogOptionsSpecification
iKEVersions :: Maybe [IKEVersionsRequestListValue]
dPDTimeoutSeconds :: Maybe Int
dPDTimeoutAction :: Maybe Text
$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:startupAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:preSharedKey:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2DHGroupNumbersRequestListValue]
$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1DHGroupNumbersRequestListValue]
$sel:logOptions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe VpnTunnelLogOptionsSpecification
$sel:iKEVersions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [IKEVersionsRequestListValue]
$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dPDTimeoutAction
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
dPDTimeoutSeconds
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [IKEVersionsRequestListValue]
iKEVersions
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VpnTunnelLogOptionsSpecification
logOptions
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
phase1LifetimeSeconds
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
phase2LifetimeSeconds
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
preSharedKey
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
rekeyFuzzPercentage
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
rekeyMarginTimeSeconds
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
replayWindowSize
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
startupAction
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tunnelInsideCidr
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tunnelInsideIpv6Cidr
instance Data.ToQuery VpnTunnelOptionsSpecification where
toQuery :: VpnTunnelOptionsSpecification -> QueryString
toQuery VpnTunnelOptionsSpecification' {Maybe Int
Maybe [IKEVersionsRequestListValue]
Maybe [Phase1DHGroupNumbersRequestListValue]
Maybe [Phase1EncryptionAlgorithmsRequestListValue]
Maybe [Phase1IntegrityAlgorithmsRequestListValue]
Maybe [Phase2DHGroupNumbersRequestListValue]
Maybe [Phase2EncryptionAlgorithmsRequestListValue]
Maybe [Phase2IntegrityAlgorithmsRequestListValue]
Maybe Text
Maybe VpnTunnelLogOptionsSpecification
tunnelInsideIpv6Cidr :: Maybe Text
tunnelInsideCidr :: Maybe Text
startupAction :: Maybe Text
replayWindowSize :: Maybe Int
rekeyMarginTimeSeconds :: Maybe Int
rekeyFuzzPercentage :: Maybe Int
preSharedKey :: Maybe Text
phase2LifetimeSeconds :: Maybe Int
phase2IntegrityAlgorithms :: Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2EncryptionAlgorithms :: Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2DHGroupNumbers :: Maybe [Phase2DHGroupNumbersRequestListValue]
phase1LifetimeSeconds :: Maybe Int
phase1IntegrityAlgorithms :: Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1EncryptionAlgorithms :: Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1DHGroupNumbers :: Maybe [Phase1DHGroupNumbersRequestListValue]
logOptions :: Maybe VpnTunnelLogOptionsSpecification
iKEVersions :: Maybe [IKEVersionsRequestListValue]
dPDTimeoutSeconds :: Maybe Int
dPDTimeoutAction :: Maybe Text
$sel:tunnelInsideIpv6Cidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:tunnelInsideCidr:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:startupAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:replayWindowSize:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyMarginTimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:rekeyFuzzPercentage:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:preSharedKey:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
$sel:phase2LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase2IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
$sel:phase2EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
$sel:phase2DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase2DHGroupNumbersRequestListValue]
$sel:phase1LifetimeSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:phase1IntegrityAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
$sel:phase1EncryptionAlgorithms:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
$sel:phase1DHGroupNumbers:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [Phase1DHGroupNumbersRequestListValue]
$sel:logOptions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe VpnTunnelLogOptionsSpecification
$sel:iKEVersions:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification
-> Maybe [IKEVersionsRequestListValue]
$sel:dPDTimeoutSeconds:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Int
$sel:dPDTimeoutAction:VpnTunnelOptionsSpecification' :: VpnTunnelOptionsSpecification -> Maybe Text
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ ByteString
"DPDTimeoutAction" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
dPDTimeoutAction,
ByteString
"DPDTimeoutSeconds" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
dPDTimeoutSeconds,
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"IKEVersion"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [IKEVersionsRequestListValue]
iKEVersions
),
ByteString
"LogOptions" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe VpnTunnelLogOptionsSpecification
logOptions,
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase1DHGroupNumber"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase1DHGroupNumbersRequestListValue]
phase1DHGroupNumbers
),
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase1EncryptionAlgorithm"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase1EncryptionAlgorithmsRequestListValue]
phase1EncryptionAlgorithms
),
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase1IntegrityAlgorithm"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase1IntegrityAlgorithmsRequestListValue]
phase1IntegrityAlgorithms
),
ByteString
"Phase1LifetimeSeconds"
forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
phase1LifetimeSeconds,
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase2DHGroupNumber"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase2DHGroupNumbersRequestListValue]
phase2DHGroupNumbers
),
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase2EncryptionAlgorithm"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase2EncryptionAlgorithmsRequestListValue]
phase2EncryptionAlgorithms
),
forall a. ToQuery a => a -> QueryString
Data.toQuery
( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"Phase2IntegrityAlgorithm"
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Phase2IntegrityAlgorithmsRequestListValue]
phase2IntegrityAlgorithms
),
ByteString
"Phase2LifetimeSeconds"
forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
phase2LifetimeSeconds,
ByteString
"PreSharedKey" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
preSharedKey,
ByteString
"RekeyFuzzPercentage" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
rekeyFuzzPercentage,
ByteString
"RekeyMarginTimeSeconds"
forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
rekeyMarginTimeSeconds,
ByteString
"ReplayWindowSize" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Int
replayWindowSize,
ByteString
"StartupAction" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
startupAction,
ByteString
"TunnelInsideCidr" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
tunnelInsideCidr,
ByteString
"TunnelInsideIpv6Cidr" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
tunnelInsideIpv6Cidr
]