{-# LANGUAGE DisambiguateRecordFields #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.ELBV2.Types
(
defaultService,
_ALPNPolicyNotSupportedException,
_AllocationIdNotFoundException,
_AvailabilityZoneNotSupportedException,
_CertificateNotFoundException,
_DuplicateListenerException,
_DuplicateLoadBalancerNameException,
_DuplicateTagKeysException,
_DuplicateTargetGroupNameException,
_HealthUnavailableException,
_IncompatibleProtocolsException,
_InvalidConfigurationRequestException,
_InvalidLoadBalancerActionException,
_InvalidSchemeException,
_InvalidSecurityGroupException,
_InvalidSubnetException,
_InvalidTargetException,
_ListenerNotFoundException,
_LoadBalancerNotFoundException,
_OperationNotPermittedException,
_PriorityInUseException,
_ResourceInUseException,
_RuleNotFoundException,
_SSLPolicyNotFoundException,
_SubnetNotFoundException,
_TargetGroupAssociationLimitException,
_TargetGroupNotFoundException,
_TooManyActionsException,
_TooManyCertificatesException,
_TooManyListenersException,
_TooManyLoadBalancersException,
_TooManyRegistrationsForTargetIdException,
_TooManyRulesException,
_TooManyTagsException,
_TooManyTargetGroupsException,
_TooManyTargetsException,
_TooManyUniqueTargetGroupsPerLoadBalancerException,
_UnsupportedProtocolException,
ActionTypeEnum (..),
AuthenticateCognitoActionConditionalBehaviorEnum (..),
AuthenticateOidcActionConditionalBehaviorEnum (..),
IpAddressType (..),
LoadBalancerSchemeEnum (..),
LoadBalancerStateEnum (..),
LoadBalancerTypeEnum (..),
ProtocolEnum (..),
RedirectActionStatusCodeEnum (..),
TargetGroupIpAddressTypeEnum (..),
TargetHealthReasonEnum (..),
TargetHealthStateEnum (..),
TargetTypeEnum (..),
Action (..),
newAction,
action_authenticateCognitoConfig,
action_authenticateOidcConfig,
action_fixedResponseConfig,
action_forwardConfig,
action_order,
action_redirectConfig,
action_targetGroupArn,
action_type,
AuthenticateCognitoActionConfig (..),
newAuthenticateCognitoActionConfig,
authenticateCognitoActionConfig_authenticationRequestExtraParams,
authenticateCognitoActionConfig_onUnauthenticatedRequest,
authenticateCognitoActionConfig_scope,
authenticateCognitoActionConfig_sessionCookieName,
authenticateCognitoActionConfig_sessionTimeout,
authenticateCognitoActionConfig_userPoolArn,
authenticateCognitoActionConfig_userPoolClientId,
authenticateCognitoActionConfig_userPoolDomain,
AuthenticateOidcActionConfig (..),
newAuthenticateOidcActionConfig,
authenticateOidcActionConfig_authenticationRequestExtraParams,
authenticateOidcActionConfig_clientSecret,
authenticateOidcActionConfig_onUnauthenticatedRequest,
authenticateOidcActionConfig_scope,
authenticateOidcActionConfig_sessionCookieName,
authenticateOidcActionConfig_sessionTimeout,
authenticateOidcActionConfig_useExistingClientSecret,
authenticateOidcActionConfig_issuer,
authenticateOidcActionConfig_authorizationEndpoint,
authenticateOidcActionConfig_tokenEndpoint,
authenticateOidcActionConfig_userInfoEndpoint,
authenticateOidcActionConfig_clientId,
AvailabilityZone (..),
newAvailabilityZone,
availabilityZone_loadBalancerAddresses,
availabilityZone_outpostId,
availabilityZone_subnetId,
availabilityZone_zoneName,
Certificate (..),
newCertificate,
certificate_certificateArn,
certificate_isDefault,
Cipher (..),
newCipher,
cipher_name,
cipher_priority,
FixedResponseActionConfig (..),
newFixedResponseActionConfig,
fixedResponseActionConfig_contentType,
fixedResponseActionConfig_messageBody,
fixedResponseActionConfig_statusCode,
ForwardActionConfig (..),
newForwardActionConfig,
forwardActionConfig_targetGroupStickinessConfig,
forwardActionConfig_targetGroups,
HostHeaderConditionConfig (..),
newHostHeaderConditionConfig,
hostHeaderConditionConfig_values,
HttpHeaderConditionConfig (..),
newHttpHeaderConditionConfig,
httpHeaderConditionConfig_httpHeaderName,
httpHeaderConditionConfig_values,
HttpRequestMethodConditionConfig (..),
newHttpRequestMethodConditionConfig,
httpRequestMethodConditionConfig_values,
Limit (..),
newLimit,
limit_max,
limit_name,
Listener (..),
newListener,
listener_alpnPolicy,
listener_certificates,
listener_defaultActions,
listener_listenerArn,
listener_loadBalancerArn,
listener_port,
listener_protocol,
listener_sslPolicy,
LoadBalancer (..),
newLoadBalancer,
loadBalancer_availabilityZones,
loadBalancer_canonicalHostedZoneId,
loadBalancer_createdTime,
loadBalancer_customerOwnedIpv4Pool,
loadBalancer_dNSName,
loadBalancer_ipAddressType,
loadBalancer_loadBalancerArn,
loadBalancer_loadBalancerName,
loadBalancer_scheme,
loadBalancer_securityGroups,
loadBalancer_state,
loadBalancer_type,
loadBalancer_vpcId,
LoadBalancerAddress (..),
newLoadBalancerAddress,
loadBalancerAddress_allocationId,
loadBalancerAddress_iPv6Address,
loadBalancerAddress_ipAddress,
loadBalancerAddress_privateIPv4Address,
LoadBalancerAttribute (..),
newLoadBalancerAttribute,
loadBalancerAttribute_key,
loadBalancerAttribute_value,
LoadBalancerState (..),
newLoadBalancerState,
loadBalancerState_code,
loadBalancerState_reason,
Matcher (..),
newMatcher,
matcher_grpcCode,
matcher_httpCode,
PathPatternConditionConfig (..),
newPathPatternConditionConfig,
pathPatternConditionConfig_values,
QueryStringConditionConfig (..),
newQueryStringConditionConfig,
queryStringConditionConfig_values,
QueryStringKeyValuePair (..),
newQueryStringKeyValuePair,
queryStringKeyValuePair_key,
queryStringKeyValuePair_value,
RedirectActionConfig (..),
newRedirectActionConfig,
redirectActionConfig_host,
redirectActionConfig_path,
redirectActionConfig_port,
redirectActionConfig_protocol,
redirectActionConfig_query,
redirectActionConfig_statusCode,
Rule (..),
newRule,
rule_actions,
rule_conditions,
rule_isDefault,
rule_priority,
rule_ruleArn,
RuleCondition (..),
newRuleCondition,
ruleCondition_field,
ruleCondition_hostHeaderConfig,
ruleCondition_httpHeaderConfig,
ruleCondition_httpRequestMethodConfig,
ruleCondition_pathPatternConfig,
ruleCondition_queryStringConfig,
ruleCondition_sourceIpConfig,
ruleCondition_values,
RulePriorityPair (..),
newRulePriorityPair,
rulePriorityPair_priority,
rulePriorityPair_ruleArn,
SourceIpConditionConfig (..),
newSourceIpConditionConfig,
sourceIpConditionConfig_values,
SslPolicy (..),
newSslPolicy,
sslPolicy_ciphers,
sslPolicy_name,
sslPolicy_sslProtocols,
sslPolicy_supportedLoadBalancerTypes,
SubnetMapping (..),
newSubnetMapping,
subnetMapping_allocationId,
subnetMapping_iPv6Address,
subnetMapping_privateIPv4Address,
subnetMapping_subnetId,
Tag (..),
newTag,
tag_value,
tag_key,
TagDescription (..),
newTagDescription,
tagDescription_resourceArn,
tagDescription_tags,
TargetDescription (..),
newTargetDescription,
targetDescription_availabilityZone,
targetDescription_port,
targetDescription_id,
TargetGroup (..),
newTargetGroup,
targetGroup_healthCheckEnabled,
targetGroup_healthCheckIntervalSeconds,
targetGroup_healthCheckPath,
targetGroup_healthCheckPort,
targetGroup_healthCheckProtocol,
targetGroup_healthCheckTimeoutSeconds,
targetGroup_healthyThresholdCount,
targetGroup_ipAddressType,
targetGroup_loadBalancerArns,
targetGroup_matcher,
targetGroup_port,
targetGroup_protocol,
targetGroup_protocolVersion,
targetGroup_targetGroupArn,
targetGroup_targetGroupName,
targetGroup_targetType,
targetGroup_unhealthyThresholdCount,
targetGroup_vpcId,
TargetGroupAttribute (..),
newTargetGroupAttribute,
targetGroupAttribute_key,
targetGroupAttribute_value,
TargetGroupStickinessConfig (..),
newTargetGroupStickinessConfig,
targetGroupStickinessConfig_durationSeconds,
targetGroupStickinessConfig_enabled,
TargetGroupTuple (..),
newTargetGroupTuple,
targetGroupTuple_targetGroupArn,
targetGroupTuple_weight,
TargetHealth (..),
newTargetHealth,
targetHealth_description,
targetHealth_reason,
targetHealth_state,
TargetHealthDescription (..),
newTargetHealthDescription,
targetHealthDescription_healthCheckPort,
targetHealthDescription_target,
targetHealthDescription_targetHealth,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import Amazonka.ELBV2.Types.Action
import Amazonka.ELBV2.Types.ActionTypeEnum
import Amazonka.ELBV2.Types.AuthenticateCognitoActionConditionalBehaviorEnum
import Amazonka.ELBV2.Types.AuthenticateCognitoActionConfig
import Amazonka.ELBV2.Types.AuthenticateOidcActionConditionalBehaviorEnum
import Amazonka.ELBV2.Types.AuthenticateOidcActionConfig
import Amazonka.ELBV2.Types.AvailabilityZone
import Amazonka.ELBV2.Types.Certificate
import Amazonka.ELBV2.Types.Cipher
import Amazonka.ELBV2.Types.FixedResponseActionConfig
import Amazonka.ELBV2.Types.ForwardActionConfig
import Amazonka.ELBV2.Types.HostHeaderConditionConfig
import Amazonka.ELBV2.Types.HttpHeaderConditionConfig
import Amazonka.ELBV2.Types.HttpRequestMethodConditionConfig
import Amazonka.ELBV2.Types.IpAddressType
import Amazonka.ELBV2.Types.Limit
import Amazonka.ELBV2.Types.Listener
import Amazonka.ELBV2.Types.LoadBalancer
import Amazonka.ELBV2.Types.LoadBalancerAddress
import Amazonka.ELBV2.Types.LoadBalancerAttribute
import Amazonka.ELBV2.Types.LoadBalancerSchemeEnum
import Amazonka.ELBV2.Types.LoadBalancerState
import Amazonka.ELBV2.Types.LoadBalancerStateEnum
import Amazonka.ELBV2.Types.LoadBalancerTypeEnum
import Amazonka.ELBV2.Types.Matcher
import Amazonka.ELBV2.Types.PathPatternConditionConfig
import Amazonka.ELBV2.Types.ProtocolEnum
import Amazonka.ELBV2.Types.QueryStringConditionConfig
import Amazonka.ELBV2.Types.QueryStringKeyValuePair
import Amazonka.ELBV2.Types.RedirectActionConfig
import Amazonka.ELBV2.Types.RedirectActionStatusCodeEnum
import Amazonka.ELBV2.Types.Rule
import Amazonka.ELBV2.Types.RuleCondition
import Amazonka.ELBV2.Types.RulePriorityPair
import Amazonka.ELBV2.Types.SourceIpConditionConfig
import Amazonka.ELBV2.Types.SslPolicy
import Amazonka.ELBV2.Types.SubnetMapping
import Amazonka.ELBV2.Types.Tag
import Amazonka.ELBV2.Types.TagDescription
import Amazonka.ELBV2.Types.TargetDescription
import Amazonka.ELBV2.Types.TargetGroup
import Amazonka.ELBV2.Types.TargetGroupAttribute
import Amazonka.ELBV2.Types.TargetGroupIpAddressTypeEnum
import Amazonka.ELBV2.Types.TargetGroupStickinessConfig
import Amazonka.ELBV2.Types.TargetGroupTuple
import Amazonka.ELBV2.Types.TargetHealth
import Amazonka.ELBV2.Types.TargetHealthDescription
import Amazonka.ELBV2.Types.TargetHealthReasonEnum
import Amazonka.ELBV2.Types.TargetHealthStateEnum
import Amazonka.ELBV2.Types.TargetTypeEnum
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Sign.V4 as Sign
defaultService :: Core.Service
defaultService :: Service
defaultService =
Core.Service
{ $sel:abbrev:Service :: Abbrev
Core.abbrev = Abbrev
"ELBV2",
$sel:signer:Service :: Signer
Core.signer = Signer
Sign.v4,
$sel:endpointPrefix:Service :: ByteString
Core.endpointPrefix = ByteString
"elasticloadbalancing",
$sel:signingName:Service :: ByteString
Core.signingName = ByteString
"elasticloadbalancing",
$sel:version:Service :: ByteString
Core.version = ByteString
"2015-12-01",
$sel:s3AddressingStyle:Service :: S3AddressingStyle
Core.s3AddressingStyle = S3AddressingStyle
Core.S3AddressingStyleAuto,
$sel:endpoint:Service :: Region -> Endpoint
Core.endpoint = Service -> Region -> Endpoint
Core.defaultEndpoint Service
defaultService,
$sel:timeout:Service :: Maybe Seconds
Core.timeout = forall a. a -> Maybe a
Prelude.Just Seconds
70,
$sel:check:Service :: Status -> Bool
Core.check = Status -> Bool
Core.statusSuccess,
$sel:error:Service :: Status -> [Header] -> ByteStringLazy -> Error
Core.error = Abbrev -> Status -> [Header] -> ByteStringLazy -> Error
Core.parseXMLError Abbrev
"ELBV2",
$sel:retry:Service :: Retry
Core.retry = Retry
retry
}
where
retry :: Retry
retry =
Core.Exponential
{ $sel:base:Exponential :: Double
Core.base = Double
5.0e-2,
$sel:growth:Exponential :: Int
Core.growth = Int
2,
$sel:attempts:Exponential :: Int
Core.attempts = Int
5,
$sel:check:Exponential :: ServiceError -> Maybe Text
Core.check = forall {a}. IsString a => ServiceError -> Maybe a
check
}
check :: ServiceError -> Maybe a
check ServiceError
e
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
502) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"bad_gateway"
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
504) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"gateway_timeout"
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
500) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"general_server_error"
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
509) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"limit_exceeded"
| forall s a. Getting Any s a -> s -> Bool
Lens.has
( forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
ErrorCode -> Optic' p f ServiceError ServiceError
Core.hasCode ErrorCode
"RequestThrottledException"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
)
ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"request_throttled_exception"
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
503) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"service_unavailable"
| forall s a. Getting Any s a -> s -> Bool
Lens.has
( forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
ErrorCode -> Optic' p f ServiceError ServiceError
Core.hasCode ErrorCode
"ThrottledException"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
)
ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"throttled_exception"
| forall s a. Getting Any s a -> s -> Bool
Lens.has
( forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
ErrorCode -> Optic' p f ServiceError ServiceError
Core.hasCode ErrorCode
"Throttling"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
)
ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"throttling"
| forall s a. Getting Any s a -> s -> Bool
Lens.has
( forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
ErrorCode -> Optic' p f ServiceError ServiceError
Core.hasCode ErrorCode
"ThrottlingException"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
)
ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"throttling_exception"
| forall s a. Getting Any s a -> s -> Bool
Lens.has
( forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
ErrorCode -> Optic' p f ServiceError ServiceError
Core.hasCode
ErrorCode
"ProvisionedThroughputExceededException"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
)
ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"throughput_exceeded"
| forall s a. Getting Any s a -> s -> Bool
Lens.has (forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
429) ServiceError
e =
forall a. a -> Maybe a
Prelude.Just a
"too_many_requests"
| Bool
Prelude.otherwise = forall a. Maybe a
Prelude.Nothing
_ALPNPolicyNotSupportedException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_ALPNPolicyNotSupportedException :: forall a. AsError a => Fold a ServiceError
_ALPNPolicyNotSupportedException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"ALPNPolicyNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_AllocationIdNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_AllocationIdNotFoundException :: forall a. AsError a => Fold a ServiceError
_AllocationIdNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"AllocationIdNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_AvailabilityZoneNotSupportedException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_AvailabilityZoneNotSupportedException :: forall a. AsError a => Fold a ServiceError
_AvailabilityZoneNotSupportedException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"AvailabilityZoneNotSupported"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_CertificateNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_CertificateNotFoundException :: forall a. AsError a => Fold a ServiceError
_CertificateNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"CertificateNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_DuplicateListenerException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_DuplicateListenerException :: forall a. AsError a => Fold a ServiceError
_DuplicateListenerException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"DuplicateListener"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_DuplicateLoadBalancerNameException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_DuplicateLoadBalancerNameException :: forall a. AsError a => Fold a ServiceError
_DuplicateLoadBalancerNameException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"DuplicateLoadBalancerName"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_DuplicateTagKeysException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_DuplicateTagKeysException :: forall a. AsError a => Fold a ServiceError
_DuplicateTagKeysException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"DuplicateTagKeys"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_DuplicateTargetGroupNameException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_DuplicateTargetGroupNameException :: forall a. AsError a => Fold a ServiceError
_DuplicateTargetGroupNameException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"DuplicateTargetGroupName"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_HealthUnavailableException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_HealthUnavailableException :: forall a. AsError a => Fold a ServiceError
_HealthUnavailableException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"HealthUnavailable"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
500
_IncompatibleProtocolsException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_IncompatibleProtocolsException :: forall a. AsError a => Fold a ServiceError
_IncompatibleProtocolsException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"IncompatibleProtocols"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidConfigurationRequestException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidConfigurationRequestException :: forall a. AsError a => Fold a ServiceError
_InvalidConfigurationRequestException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidConfigurationRequest"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidLoadBalancerActionException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidLoadBalancerActionException :: forall a. AsError a => Fold a ServiceError
_InvalidLoadBalancerActionException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidLoadBalancerAction"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidSchemeException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidSchemeException :: forall a. AsError a => Fold a ServiceError
_InvalidSchemeException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidScheme"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidSecurityGroupException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidSecurityGroupException :: forall a. AsError a => Fold a ServiceError
_InvalidSecurityGroupException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidSecurityGroup"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidSubnetException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidSubnetException :: forall a. AsError a => Fold a ServiceError
_InvalidSubnetException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidSubnet"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_InvalidTargetException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_InvalidTargetException :: forall a. AsError a => Fold a ServiceError
_InvalidTargetException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"InvalidTarget"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_ListenerNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_ListenerNotFoundException :: forall a. AsError a => Fold a ServiceError
_ListenerNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"ListenerNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_LoadBalancerNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_LoadBalancerNotFoundException :: forall a. AsError a => Fold a ServiceError
_LoadBalancerNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"LoadBalancerNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_OperationNotPermittedException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_OperationNotPermittedException :: forall a. AsError a => Fold a ServiceError
_OperationNotPermittedException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"OperationNotPermitted"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_PriorityInUseException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_PriorityInUseException :: forall a. AsError a => Fold a ServiceError
_PriorityInUseException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"PriorityInUse"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_ResourceInUseException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_ResourceInUseException :: forall a. AsError a => Fold a ServiceError
_ResourceInUseException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"ResourceInUse"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_RuleNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_RuleNotFoundException :: forall a. AsError a => Fold a ServiceError
_RuleNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"RuleNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_SSLPolicyNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_SSLPolicyNotFoundException :: forall a. AsError a => Fold a ServiceError
_SSLPolicyNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"SSLPolicyNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_SubnetNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_SubnetNotFoundException :: forall a. AsError a => Fold a ServiceError
_SubnetNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"SubnetNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TargetGroupAssociationLimitException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TargetGroupAssociationLimitException :: forall a. AsError a => Fold a ServiceError
_TargetGroupAssociationLimitException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TargetGroupAssociationLimit"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TargetGroupNotFoundException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TargetGroupNotFoundException :: forall a. AsError a => Fold a ServiceError
_TargetGroupNotFoundException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TargetGroupNotFound"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyActionsException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyActionsException :: forall a. AsError a => Fold a ServiceError
_TooManyActionsException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyActions"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyCertificatesException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyCertificatesException :: forall a. AsError a => Fold a ServiceError
_TooManyCertificatesException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyCertificates"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyListenersException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyListenersException :: forall a. AsError a => Fold a ServiceError
_TooManyListenersException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyListeners"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyLoadBalancersException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyLoadBalancersException :: forall a. AsError a => Fold a ServiceError
_TooManyLoadBalancersException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyLoadBalancers"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyRegistrationsForTargetIdException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyRegistrationsForTargetIdException :: forall a. AsError a => Fold a ServiceError
_TooManyRegistrationsForTargetIdException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyRegistrationsForTargetId"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyRulesException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyRulesException :: forall a. AsError a => Fold a ServiceError
_TooManyRulesException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyRules"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyTagsException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyTagsException :: forall a. AsError a => Fold a ServiceError
_TooManyTagsException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyTags"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyTargetGroupsException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyTargetGroupsException :: forall a. AsError a => Fold a ServiceError
_TooManyTargetGroupsException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyTargetGroups"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyTargetsException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyTargetsException :: forall a. AsError a => Fold a ServiceError
_TooManyTargetsException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyTargets"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_TooManyUniqueTargetGroupsPerLoadBalancerException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_TooManyUniqueTargetGroupsPerLoadBalancerException :: forall a. AsError a => Fold a ServiceError
_TooManyUniqueTargetGroupsPerLoadBalancerException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"TooManyUniqueTargetGroupsPerLoadBalancer"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400
_UnsupportedProtocolException :: (Core.AsError a) => Lens.Fold a Core.ServiceError
_UnsupportedProtocolException :: forall a. AsError a => Fold a ServiceError
_UnsupportedProtocolException =
forall a. AsError a => Service -> ErrorCode -> Fold a ServiceError
Core._MatchServiceError
Service
defaultService
ErrorCode
"UnsupportedProtocol"
forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (p :: * -> * -> *).
(Applicative f, Choice p) =>
Int -> Optic' p f ServiceError ServiceError
Core.hasStatus Int
400