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

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

-- |
-- Module      : Amazonka.RedshiftServerLess.Types.EndpointAccess
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.RedshiftServerLess.Types.EndpointAccess where

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 Amazonka.RedshiftServerLess.Types.VpcEndpoint
import Amazonka.RedshiftServerLess.Types.VpcSecurityGroupMembership

-- | Information about an Amazon Redshift Serverless VPC endpoint.
--
-- /See:/ 'newEndpointAccess' smart constructor.
data EndpointAccess = EndpointAccess'
  { -- | The DNS address of the endpoint.
    EndpointAccess -> Maybe Text
address :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) of the VPC endpoint.
    EndpointAccess -> Maybe Text
endpointArn :: Prelude.Maybe Prelude.Text,
    -- | The time that the endpoint was created.
    EndpointAccess -> Maybe ISO8601
endpointCreateTime :: Prelude.Maybe Data.ISO8601,
    -- | The name of the VPC endpoint.
    EndpointAccess -> Maybe Text
endpointName :: Prelude.Maybe Prelude.Text,
    -- | The status of the VPC endpoint.
    EndpointAccess -> Maybe Text
endpointStatus :: Prelude.Maybe Prelude.Text,
    -- | The port number on which Amazon Redshift Serverless accepts incoming
    -- connections.
    EndpointAccess -> Maybe Int
port :: Prelude.Maybe Prelude.Int,
    -- | The unique identifier of subnets where Amazon Redshift Serverless choose
    -- to deploy the VPC endpoint.
    EndpointAccess -> Maybe [Text]
subnetIds :: Prelude.Maybe [Prelude.Text],
    -- | The connection endpoint for connecting to Amazon Redshift Serverless.
    EndpointAccess -> Maybe VpcEndpoint
vpcEndpoint :: Prelude.Maybe VpcEndpoint,
    -- | The security groups associated with the endpoint.
    EndpointAccess -> Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups :: Prelude.Maybe [VpcSecurityGroupMembership],
    -- | The name of the workgroup associated with the endpoint.
    EndpointAccess -> Maybe Text
workgroupName :: Prelude.Maybe Prelude.Text
  }
  deriving (EndpointAccess -> EndpointAccess -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EndpointAccess -> EndpointAccess -> Bool
$c/= :: EndpointAccess -> EndpointAccess -> Bool
== :: EndpointAccess -> EndpointAccess -> Bool
$c== :: EndpointAccess -> EndpointAccess -> Bool
Prelude.Eq, ReadPrec [EndpointAccess]
ReadPrec EndpointAccess
Int -> ReadS EndpointAccess
ReadS [EndpointAccess]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [EndpointAccess]
$creadListPrec :: ReadPrec [EndpointAccess]
readPrec :: ReadPrec EndpointAccess
$creadPrec :: ReadPrec EndpointAccess
readList :: ReadS [EndpointAccess]
$creadList :: ReadS [EndpointAccess]
readsPrec :: Int -> ReadS EndpointAccess
$creadsPrec :: Int -> ReadS EndpointAccess
Prelude.Read, Int -> EndpointAccess -> ShowS
[EndpointAccess] -> ShowS
EndpointAccess -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EndpointAccess] -> ShowS
$cshowList :: [EndpointAccess] -> ShowS
show :: EndpointAccess -> String
$cshow :: EndpointAccess -> String
showsPrec :: Int -> EndpointAccess -> ShowS
$cshowsPrec :: Int -> EndpointAccess -> ShowS
Prelude.Show, forall x. Rep EndpointAccess x -> EndpointAccess
forall x. EndpointAccess -> Rep EndpointAccess x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep EndpointAccess x -> EndpointAccess
$cfrom :: forall x. EndpointAccess -> Rep EndpointAccess x
Prelude.Generic)

-- |
-- Create a value of 'EndpointAccess' 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:
--
-- 'address', 'endpointAccess_address' - The DNS address of the endpoint.
--
-- 'endpointArn', 'endpointAccess_endpointArn' - The Amazon Resource Name (ARN) of the VPC endpoint.
--
-- 'endpointCreateTime', 'endpointAccess_endpointCreateTime' - The time that the endpoint was created.
--
-- 'endpointName', 'endpointAccess_endpointName' - The name of the VPC endpoint.
--
-- 'endpointStatus', 'endpointAccess_endpointStatus' - The status of the VPC endpoint.
--
-- 'port', 'endpointAccess_port' - The port number on which Amazon Redshift Serverless accepts incoming
-- connections.
--
-- 'subnetIds', 'endpointAccess_subnetIds' - The unique identifier of subnets where Amazon Redshift Serverless choose
-- to deploy the VPC endpoint.
--
-- 'vpcEndpoint', 'endpointAccess_vpcEndpoint' - The connection endpoint for connecting to Amazon Redshift Serverless.
--
-- 'vpcSecurityGroups', 'endpointAccess_vpcSecurityGroups' - The security groups associated with the endpoint.
--
-- 'workgroupName', 'endpointAccess_workgroupName' - The name of the workgroup associated with the endpoint.
newEndpointAccess ::
  EndpointAccess
newEndpointAccess :: EndpointAccess
newEndpointAccess =
  EndpointAccess'
    { $sel:address:EndpointAccess' :: Maybe Text
address = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointArn:EndpointAccess' :: Maybe Text
endpointArn = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointCreateTime:EndpointAccess' :: Maybe ISO8601
endpointCreateTime = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointName:EndpointAccess' :: Maybe Text
endpointName = forall a. Maybe a
Prelude.Nothing,
      $sel:endpointStatus:EndpointAccess' :: Maybe Text
endpointStatus = forall a. Maybe a
Prelude.Nothing,
      $sel:port:EndpointAccess' :: Maybe Int
port = forall a. Maybe a
Prelude.Nothing,
      $sel:subnetIds:EndpointAccess' :: Maybe [Text]
subnetIds = forall a. Maybe a
Prelude.Nothing,
      $sel:vpcEndpoint:EndpointAccess' :: Maybe VpcEndpoint
vpcEndpoint = forall a. Maybe a
Prelude.Nothing,
      $sel:vpcSecurityGroups:EndpointAccess' :: Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups = forall a. Maybe a
Prelude.Nothing,
      $sel:workgroupName:EndpointAccess' :: Maybe Text
workgroupName = forall a. Maybe a
Prelude.Nothing
    }

-- | The DNS address of the endpoint.
endpointAccess_address :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Text)
endpointAccess_address :: Lens' EndpointAccess (Maybe Text)
endpointAccess_address = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Text
address :: Maybe Text
$sel:address:EndpointAccess' :: EndpointAccess -> Maybe Text
address} -> Maybe Text
address) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Text
a -> EndpointAccess
s {$sel:address:EndpointAccess' :: Maybe Text
address = Maybe Text
a} :: EndpointAccess)

-- | The Amazon Resource Name (ARN) of the VPC endpoint.
endpointAccess_endpointArn :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Text)
endpointAccess_endpointArn :: Lens' EndpointAccess (Maybe Text)
endpointAccess_endpointArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Text
endpointArn :: Maybe Text
$sel:endpointArn:EndpointAccess' :: EndpointAccess -> Maybe Text
endpointArn} -> Maybe Text
endpointArn) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Text
a -> EndpointAccess
s {$sel:endpointArn:EndpointAccess' :: Maybe Text
endpointArn = Maybe Text
a} :: EndpointAccess)

-- | The time that the endpoint was created.
endpointAccess_endpointCreateTime :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.UTCTime)
endpointAccess_endpointCreateTime :: Lens' EndpointAccess (Maybe UTCTime)
endpointAccess_endpointCreateTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe ISO8601
endpointCreateTime :: Maybe ISO8601
$sel:endpointCreateTime:EndpointAccess' :: EndpointAccess -> Maybe ISO8601
endpointCreateTime} -> Maybe ISO8601
endpointCreateTime) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe ISO8601
a -> EndpointAccess
s {$sel:endpointCreateTime:EndpointAccess' :: Maybe ISO8601
endpointCreateTime = Maybe ISO8601
a} :: EndpointAccess) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The name of the VPC endpoint.
endpointAccess_endpointName :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Text)
endpointAccess_endpointName :: Lens' EndpointAccess (Maybe Text)
endpointAccess_endpointName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Text
endpointName :: Maybe Text
$sel:endpointName:EndpointAccess' :: EndpointAccess -> Maybe Text
endpointName} -> Maybe Text
endpointName) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Text
a -> EndpointAccess
s {$sel:endpointName:EndpointAccess' :: Maybe Text
endpointName = Maybe Text
a} :: EndpointAccess)

-- | The status of the VPC endpoint.
endpointAccess_endpointStatus :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Text)
endpointAccess_endpointStatus :: Lens' EndpointAccess (Maybe Text)
endpointAccess_endpointStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Text
endpointStatus :: Maybe Text
$sel:endpointStatus:EndpointAccess' :: EndpointAccess -> Maybe Text
endpointStatus} -> Maybe Text
endpointStatus) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Text
a -> EndpointAccess
s {$sel:endpointStatus:EndpointAccess' :: Maybe Text
endpointStatus = Maybe Text
a} :: EndpointAccess)

-- | The port number on which Amazon Redshift Serverless accepts incoming
-- connections.
endpointAccess_port :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Int)
endpointAccess_port :: Lens' EndpointAccess (Maybe Int)
endpointAccess_port = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Int
port :: Maybe Int
$sel:port:EndpointAccess' :: EndpointAccess -> Maybe Int
port} -> Maybe Int
port) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Int
a -> EndpointAccess
s {$sel:port:EndpointAccess' :: Maybe Int
port = Maybe Int
a} :: EndpointAccess)

-- | The unique identifier of subnets where Amazon Redshift Serverless choose
-- to deploy the VPC endpoint.
endpointAccess_subnetIds :: Lens.Lens' EndpointAccess (Prelude.Maybe [Prelude.Text])
endpointAccess_subnetIds :: Lens' EndpointAccess (Maybe [Text])
endpointAccess_subnetIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe [Text]
subnetIds :: Maybe [Text]
$sel:subnetIds:EndpointAccess' :: EndpointAccess -> Maybe [Text]
subnetIds} -> Maybe [Text]
subnetIds) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe [Text]
a -> EndpointAccess
s {$sel:subnetIds:EndpointAccess' :: Maybe [Text]
subnetIds = Maybe [Text]
a} :: EndpointAccess) 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 connection endpoint for connecting to Amazon Redshift Serverless.
endpointAccess_vpcEndpoint :: Lens.Lens' EndpointAccess (Prelude.Maybe VpcEndpoint)
endpointAccess_vpcEndpoint :: Lens' EndpointAccess (Maybe VpcEndpoint)
endpointAccess_vpcEndpoint = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe VpcEndpoint
vpcEndpoint :: Maybe VpcEndpoint
$sel:vpcEndpoint:EndpointAccess' :: EndpointAccess -> Maybe VpcEndpoint
vpcEndpoint} -> Maybe VpcEndpoint
vpcEndpoint) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe VpcEndpoint
a -> EndpointAccess
s {$sel:vpcEndpoint:EndpointAccess' :: Maybe VpcEndpoint
vpcEndpoint = Maybe VpcEndpoint
a} :: EndpointAccess)

-- | The security groups associated with the endpoint.
endpointAccess_vpcSecurityGroups :: Lens.Lens' EndpointAccess (Prelude.Maybe [VpcSecurityGroupMembership])
endpointAccess_vpcSecurityGroups :: Lens' EndpointAccess (Maybe [VpcSecurityGroupMembership])
endpointAccess_vpcSecurityGroups = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups :: Maybe [VpcSecurityGroupMembership]
$sel:vpcSecurityGroups:EndpointAccess' :: EndpointAccess -> Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups} -> Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe [VpcSecurityGroupMembership]
a -> EndpointAccess
s {$sel:vpcSecurityGroups:EndpointAccess' :: Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups = Maybe [VpcSecurityGroupMembership]
a} :: EndpointAccess) 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 name of the workgroup associated with the endpoint.
endpointAccess_workgroupName :: Lens.Lens' EndpointAccess (Prelude.Maybe Prelude.Text)
endpointAccess_workgroupName :: Lens' EndpointAccess (Maybe Text)
endpointAccess_workgroupName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\EndpointAccess' {Maybe Text
workgroupName :: Maybe Text
$sel:workgroupName:EndpointAccess' :: EndpointAccess -> Maybe Text
workgroupName} -> Maybe Text
workgroupName) (\s :: EndpointAccess
s@EndpointAccess' {} Maybe Text
a -> EndpointAccess
s {$sel:workgroupName:EndpointAccess' :: Maybe Text
workgroupName = Maybe Text
a} :: EndpointAccess)

instance Data.FromJSON EndpointAccess where
  parseJSON :: Value -> Parser EndpointAccess
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"EndpointAccess"
      ( \Object
x ->
          Maybe Text
-> Maybe Text
-> Maybe ISO8601
-> Maybe Text
-> Maybe Text
-> Maybe Int
-> Maybe [Text]
-> Maybe VpcEndpoint
-> Maybe [VpcSecurityGroupMembership]
-> Maybe Text
-> EndpointAccess
EndpointAccess'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"address")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"endpointArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"endpointCreateTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"endpointName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"endpointStatus")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"port")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"subnetIds" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"vpcEndpoint")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( Object
x
                            forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"vpcSecurityGroups"
                            forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty
                        )
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"workgroupName")
      )

instance Prelude.Hashable EndpointAccess where
  hashWithSalt :: Int -> EndpointAccess -> Int
hashWithSalt Int
_salt EndpointAccess' {Maybe Int
Maybe [Text]
Maybe [VpcSecurityGroupMembership]
Maybe Text
Maybe ISO8601
Maybe VpcEndpoint
workgroupName :: Maybe Text
vpcSecurityGroups :: Maybe [VpcSecurityGroupMembership]
vpcEndpoint :: Maybe VpcEndpoint
subnetIds :: Maybe [Text]
port :: Maybe Int
endpointStatus :: Maybe Text
endpointName :: Maybe Text
endpointCreateTime :: Maybe ISO8601
endpointArn :: Maybe Text
address :: Maybe Text
$sel:workgroupName:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:vpcSecurityGroups:EndpointAccess' :: EndpointAccess -> Maybe [VpcSecurityGroupMembership]
$sel:vpcEndpoint:EndpointAccess' :: EndpointAccess -> Maybe VpcEndpoint
$sel:subnetIds:EndpointAccess' :: EndpointAccess -> Maybe [Text]
$sel:port:EndpointAccess' :: EndpointAccess -> Maybe Int
$sel:endpointStatus:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:endpointName:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:endpointCreateTime:EndpointAccess' :: EndpointAccess -> Maybe ISO8601
$sel:endpointArn:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:address:EndpointAccess' :: EndpointAccess -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
address
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
endpointArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ISO8601
endpointCreateTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
endpointName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
endpointStatus
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
port
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
subnetIds
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe VpcEndpoint
vpcEndpoint
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
workgroupName

instance Prelude.NFData EndpointAccess where
  rnf :: EndpointAccess -> ()
rnf EndpointAccess' {Maybe Int
Maybe [Text]
Maybe [VpcSecurityGroupMembership]
Maybe Text
Maybe ISO8601
Maybe VpcEndpoint
workgroupName :: Maybe Text
vpcSecurityGroups :: Maybe [VpcSecurityGroupMembership]
vpcEndpoint :: Maybe VpcEndpoint
subnetIds :: Maybe [Text]
port :: Maybe Int
endpointStatus :: Maybe Text
endpointName :: Maybe Text
endpointCreateTime :: Maybe ISO8601
endpointArn :: Maybe Text
address :: Maybe Text
$sel:workgroupName:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:vpcSecurityGroups:EndpointAccess' :: EndpointAccess -> Maybe [VpcSecurityGroupMembership]
$sel:vpcEndpoint:EndpointAccess' :: EndpointAccess -> Maybe VpcEndpoint
$sel:subnetIds:EndpointAccess' :: EndpointAccess -> Maybe [Text]
$sel:port:EndpointAccess' :: EndpointAccess -> Maybe Int
$sel:endpointStatus:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:endpointName:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:endpointCreateTime:EndpointAccess' :: EndpointAccess -> Maybe ISO8601
$sel:endpointArn:EndpointAccess' :: EndpointAccess -> Maybe Text
$sel:address:EndpointAccess' :: EndpointAccess -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
address
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
endpointArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ISO8601
endpointCreateTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
endpointName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
endpointStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
port
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
subnetIds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe VpcEndpoint
vpcEndpoint
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [VpcSecurityGroupMembership]
vpcSecurityGroups
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
workgroupName