{-# 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.DirectConnect.Types.DirectConnectGatewayAttachment
-- 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.DirectConnect.Types.DirectConnectGatewayAttachment where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.DirectConnect.Types.DirectConnectGatewayAttachmentState
import Amazonka.DirectConnect.Types.DirectConnectGatewayAttachmentType
import qualified Amazonka.Prelude as Prelude

-- | Information about an attachment between a Direct Connect gateway and a
-- virtual interface.
--
-- /See:/ 'newDirectConnectGatewayAttachment' smart constructor.
data DirectConnectGatewayAttachment = DirectConnectGatewayAttachment'
  { -- | The state of the attachment. The following are the possible values:
    --
    -- -   @attaching@: The initial state after a virtual interface is created
    --     using the Direct Connect gateway.
    --
    -- -   @attached@: The Direct Connect gateway and virtual interface are
    --     attached and ready to pass traffic.
    --
    -- -   @detaching@: The initial state after calling DeleteVirtualInterface.
    --
    -- -   @detached@: The virtual interface is detached from the Direct
    --     Connect gateway. Traffic flow between the Direct Connect gateway and
    --     virtual interface is stopped.
    DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentState
attachmentState :: Prelude.Maybe DirectConnectGatewayAttachmentState,
    -- | The type of attachment.
    DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentType
attachmentType :: Prelude.Maybe DirectConnectGatewayAttachmentType,
    -- | The ID of the Direct Connect gateway.
    DirectConnectGatewayAttachment -> Maybe Text
directConnectGatewayId :: Prelude.Maybe Prelude.Text,
    -- | The error message if the state of an object failed to advance.
    DirectConnectGatewayAttachment -> Maybe Text
stateChangeError :: Prelude.Maybe Prelude.Text,
    -- | The ID of the virtual interface.
    DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceId :: Prelude.Maybe Prelude.Text,
    -- | The ID of the Amazon Web Services account that owns the virtual
    -- interface.
    DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceOwnerAccount :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Web Services Region where the virtual interface is located.
    DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceRegion :: Prelude.Maybe Prelude.Text
  }
  deriving (DirectConnectGatewayAttachment
-> DirectConnectGatewayAttachment -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DirectConnectGatewayAttachment
-> DirectConnectGatewayAttachment -> Bool
$c/= :: DirectConnectGatewayAttachment
-> DirectConnectGatewayAttachment -> Bool
== :: DirectConnectGatewayAttachment
-> DirectConnectGatewayAttachment -> Bool
$c== :: DirectConnectGatewayAttachment
-> DirectConnectGatewayAttachment -> Bool
Prelude.Eq, ReadPrec [DirectConnectGatewayAttachment]
ReadPrec DirectConnectGatewayAttachment
Int -> ReadS DirectConnectGatewayAttachment
ReadS [DirectConnectGatewayAttachment]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DirectConnectGatewayAttachment]
$creadListPrec :: ReadPrec [DirectConnectGatewayAttachment]
readPrec :: ReadPrec DirectConnectGatewayAttachment
$creadPrec :: ReadPrec DirectConnectGatewayAttachment
readList :: ReadS [DirectConnectGatewayAttachment]
$creadList :: ReadS [DirectConnectGatewayAttachment]
readsPrec :: Int -> ReadS DirectConnectGatewayAttachment
$creadsPrec :: Int -> ReadS DirectConnectGatewayAttachment
Prelude.Read, Int -> DirectConnectGatewayAttachment -> ShowS
[DirectConnectGatewayAttachment] -> ShowS
DirectConnectGatewayAttachment -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DirectConnectGatewayAttachment] -> ShowS
$cshowList :: [DirectConnectGatewayAttachment] -> ShowS
show :: DirectConnectGatewayAttachment -> String
$cshow :: DirectConnectGatewayAttachment -> String
showsPrec :: Int -> DirectConnectGatewayAttachment -> ShowS
$cshowsPrec :: Int -> DirectConnectGatewayAttachment -> ShowS
Prelude.Show, forall x.
Rep DirectConnectGatewayAttachment x
-> DirectConnectGatewayAttachment
forall x.
DirectConnectGatewayAttachment
-> Rep DirectConnectGatewayAttachment x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DirectConnectGatewayAttachment x
-> DirectConnectGatewayAttachment
$cfrom :: forall x.
DirectConnectGatewayAttachment
-> Rep DirectConnectGatewayAttachment x
Prelude.Generic)

-- |
-- Create a value of 'DirectConnectGatewayAttachment' 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:
--
-- 'attachmentState', 'directConnectGatewayAttachment_attachmentState' - The state of the attachment. The following are the possible values:
--
-- -   @attaching@: The initial state after a virtual interface is created
--     using the Direct Connect gateway.
--
-- -   @attached@: The Direct Connect gateway and virtual interface are
--     attached and ready to pass traffic.
--
-- -   @detaching@: The initial state after calling DeleteVirtualInterface.
--
-- -   @detached@: The virtual interface is detached from the Direct
--     Connect gateway. Traffic flow between the Direct Connect gateway and
--     virtual interface is stopped.
--
-- 'attachmentType', 'directConnectGatewayAttachment_attachmentType' - The type of attachment.
--
-- 'directConnectGatewayId', 'directConnectGatewayAttachment_directConnectGatewayId' - The ID of the Direct Connect gateway.
--
-- 'stateChangeError', 'directConnectGatewayAttachment_stateChangeError' - The error message if the state of an object failed to advance.
--
-- 'virtualInterfaceId', 'directConnectGatewayAttachment_virtualInterfaceId' - The ID of the virtual interface.
--
-- 'virtualInterfaceOwnerAccount', 'directConnectGatewayAttachment_virtualInterfaceOwnerAccount' - The ID of the Amazon Web Services account that owns the virtual
-- interface.
--
-- 'virtualInterfaceRegion', 'directConnectGatewayAttachment_virtualInterfaceRegion' - The Amazon Web Services Region where the virtual interface is located.
newDirectConnectGatewayAttachment ::
  DirectConnectGatewayAttachment
newDirectConnectGatewayAttachment :: DirectConnectGatewayAttachment
newDirectConnectGatewayAttachment =
  DirectConnectGatewayAttachment'
    { $sel:attachmentState:DirectConnectGatewayAttachment' :: Maybe DirectConnectGatewayAttachmentState
attachmentState =
        forall a. Maybe a
Prelude.Nothing,
      $sel:attachmentType:DirectConnectGatewayAttachment' :: Maybe DirectConnectGatewayAttachmentType
attachmentType = forall a. Maybe a
Prelude.Nothing,
      $sel:directConnectGatewayId:DirectConnectGatewayAttachment' :: Maybe Text
directConnectGatewayId = forall a. Maybe a
Prelude.Nothing,
      $sel:stateChangeError:DirectConnectGatewayAttachment' :: Maybe Text
stateChangeError = forall a. Maybe a
Prelude.Nothing,
      $sel:virtualInterfaceId:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceId = forall a. Maybe a
Prelude.Nothing,
      $sel:virtualInterfaceOwnerAccount:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceOwnerAccount =
        forall a. Maybe a
Prelude.Nothing,
      $sel:virtualInterfaceRegion:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceRegion = forall a. Maybe a
Prelude.Nothing
    }

-- | The state of the attachment. The following are the possible values:
--
-- -   @attaching@: The initial state after a virtual interface is created
--     using the Direct Connect gateway.
--
-- -   @attached@: The Direct Connect gateway and virtual interface are
--     attached and ready to pass traffic.
--
-- -   @detaching@: The initial state after calling DeleteVirtualInterface.
--
-- -   @detached@: The virtual interface is detached from the Direct
--     Connect gateway. Traffic flow between the Direct Connect gateway and
--     virtual interface is stopped.
directConnectGatewayAttachment_attachmentState :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe DirectConnectGatewayAttachmentState)
directConnectGatewayAttachment_attachmentState :: Lens'
  DirectConnectGatewayAttachment
  (Maybe DirectConnectGatewayAttachmentState)
directConnectGatewayAttachment_attachmentState = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe DirectConnectGatewayAttachmentState
attachmentState :: Maybe DirectConnectGatewayAttachmentState
$sel:attachmentState:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentState
attachmentState} -> Maybe DirectConnectGatewayAttachmentState
attachmentState) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe DirectConnectGatewayAttachmentState
a -> DirectConnectGatewayAttachment
s {$sel:attachmentState:DirectConnectGatewayAttachment' :: Maybe DirectConnectGatewayAttachmentState
attachmentState = Maybe DirectConnectGatewayAttachmentState
a} :: DirectConnectGatewayAttachment)

-- | The type of attachment.
directConnectGatewayAttachment_attachmentType :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe DirectConnectGatewayAttachmentType)
directConnectGatewayAttachment_attachmentType :: Lens'
  DirectConnectGatewayAttachment
  (Maybe DirectConnectGatewayAttachmentType)
directConnectGatewayAttachment_attachmentType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe DirectConnectGatewayAttachmentType
attachmentType :: Maybe DirectConnectGatewayAttachmentType
$sel:attachmentType:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentType
attachmentType} -> Maybe DirectConnectGatewayAttachmentType
attachmentType) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe DirectConnectGatewayAttachmentType
a -> DirectConnectGatewayAttachment
s {$sel:attachmentType:DirectConnectGatewayAttachment' :: Maybe DirectConnectGatewayAttachmentType
attachmentType = Maybe DirectConnectGatewayAttachmentType
a} :: DirectConnectGatewayAttachment)

-- | The ID of the Direct Connect gateway.
directConnectGatewayAttachment_directConnectGatewayId :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe Prelude.Text)
directConnectGatewayAttachment_directConnectGatewayId :: Lens' DirectConnectGatewayAttachment (Maybe Text)
directConnectGatewayAttachment_directConnectGatewayId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe Text
directConnectGatewayId :: Maybe Text
$sel:directConnectGatewayId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
directConnectGatewayId} -> Maybe Text
directConnectGatewayId) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe Text
a -> DirectConnectGatewayAttachment
s {$sel:directConnectGatewayId:DirectConnectGatewayAttachment' :: Maybe Text
directConnectGatewayId = Maybe Text
a} :: DirectConnectGatewayAttachment)

-- | The error message if the state of an object failed to advance.
directConnectGatewayAttachment_stateChangeError :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe Prelude.Text)
directConnectGatewayAttachment_stateChangeError :: Lens' DirectConnectGatewayAttachment (Maybe Text)
directConnectGatewayAttachment_stateChangeError = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe Text
stateChangeError :: Maybe Text
$sel:stateChangeError:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
stateChangeError} -> Maybe Text
stateChangeError) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe Text
a -> DirectConnectGatewayAttachment
s {$sel:stateChangeError:DirectConnectGatewayAttachment' :: Maybe Text
stateChangeError = Maybe Text
a} :: DirectConnectGatewayAttachment)

-- | The ID of the virtual interface.
directConnectGatewayAttachment_virtualInterfaceId :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe Prelude.Text)
directConnectGatewayAttachment_virtualInterfaceId :: Lens' DirectConnectGatewayAttachment (Maybe Text)
directConnectGatewayAttachment_virtualInterfaceId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe Text
virtualInterfaceId :: Maybe Text
$sel:virtualInterfaceId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceId} -> Maybe Text
virtualInterfaceId) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe Text
a -> DirectConnectGatewayAttachment
s {$sel:virtualInterfaceId:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceId = Maybe Text
a} :: DirectConnectGatewayAttachment)

-- | The ID of the Amazon Web Services account that owns the virtual
-- interface.
directConnectGatewayAttachment_virtualInterfaceOwnerAccount :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe Prelude.Text)
directConnectGatewayAttachment_virtualInterfaceOwnerAccount :: Lens' DirectConnectGatewayAttachment (Maybe Text)
directConnectGatewayAttachment_virtualInterfaceOwnerAccount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe Text
virtualInterfaceOwnerAccount :: Maybe Text
$sel:virtualInterfaceOwnerAccount:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceOwnerAccount} -> Maybe Text
virtualInterfaceOwnerAccount) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe Text
a -> DirectConnectGatewayAttachment
s {$sel:virtualInterfaceOwnerAccount:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceOwnerAccount = Maybe Text
a} :: DirectConnectGatewayAttachment)

-- | The Amazon Web Services Region where the virtual interface is located.
directConnectGatewayAttachment_virtualInterfaceRegion :: Lens.Lens' DirectConnectGatewayAttachment (Prelude.Maybe Prelude.Text)
directConnectGatewayAttachment_virtualInterfaceRegion :: Lens' DirectConnectGatewayAttachment (Maybe Text)
directConnectGatewayAttachment_virtualInterfaceRegion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DirectConnectGatewayAttachment' {Maybe Text
virtualInterfaceRegion :: Maybe Text
$sel:virtualInterfaceRegion:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
virtualInterfaceRegion} -> Maybe Text
virtualInterfaceRegion) (\s :: DirectConnectGatewayAttachment
s@DirectConnectGatewayAttachment' {} Maybe Text
a -> DirectConnectGatewayAttachment
s {$sel:virtualInterfaceRegion:DirectConnectGatewayAttachment' :: Maybe Text
virtualInterfaceRegion = Maybe Text
a} :: DirectConnectGatewayAttachment)

instance Data.FromJSON DirectConnectGatewayAttachment where
  parseJSON :: Value -> Parser DirectConnectGatewayAttachment
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"DirectConnectGatewayAttachment"
      ( \Object
x ->
          Maybe DirectConnectGatewayAttachmentState
-> Maybe DirectConnectGatewayAttachmentType
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> DirectConnectGatewayAttachment
DirectConnectGatewayAttachment'
            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
"attachmentState")
            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
"attachmentType")
            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
"directConnectGatewayId")
            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
"stateChangeError")
            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
"virtualInterfaceId")
            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
"virtualInterfaceOwnerAccount")
            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
"virtualInterfaceRegion")
      )

instance
  Prelude.Hashable
    DirectConnectGatewayAttachment
  where
  hashWithSalt :: Int -> DirectConnectGatewayAttachment -> Int
hashWithSalt
    Int
_salt
    DirectConnectGatewayAttachment' {Maybe Text
Maybe DirectConnectGatewayAttachmentState
Maybe DirectConnectGatewayAttachmentType
virtualInterfaceRegion :: Maybe Text
virtualInterfaceOwnerAccount :: Maybe Text
virtualInterfaceId :: Maybe Text
stateChangeError :: Maybe Text
directConnectGatewayId :: Maybe Text
attachmentType :: Maybe DirectConnectGatewayAttachmentType
attachmentState :: Maybe DirectConnectGatewayAttachmentState
$sel:virtualInterfaceRegion:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:virtualInterfaceOwnerAccount:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:virtualInterfaceId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:stateChangeError:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:directConnectGatewayId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:attachmentType:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentType
$sel:attachmentState:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentState
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DirectConnectGatewayAttachmentState
attachmentState
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DirectConnectGatewayAttachmentType
attachmentType
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
directConnectGatewayId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
stateChangeError
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
virtualInterfaceId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
virtualInterfaceOwnerAccount
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
virtualInterfaceRegion

instance
  Prelude.NFData
    DirectConnectGatewayAttachment
  where
  rnf :: DirectConnectGatewayAttachment -> ()
rnf DirectConnectGatewayAttachment' {Maybe Text
Maybe DirectConnectGatewayAttachmentState
Maybe DirectConnectGatewayAttachmentType
virtualInterfaceRegion :: Maybe Text
virtualInterfaceOwnerAccount :: Maybe Text
virtualInterfaceId :: Maybe Text
stateChangeError :: Maybe Text
directConnectGatewayId :: Maybe Text
attachmentType :: Maybe DirectConnectGatewayAttachmentType
attachmentState :: Maybe DirectConnectGatewayAttachmentState
$sel:virtualInterfaceRegion:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:virtualInterfaceOwnerAccount:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:virtualInterfaceId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:stateChangeError:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:directConnectGatewayId:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment -> Maybe Text
$sel:attachmentType:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentType
$sel:attachmentState:DirectConnectGatewayAttachment' :: DirectConnectGatewayAttachment
-> Maybe DirectConnectGatewayAttachmentState
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe DirectConnectGatewayAttachmentState
attachmentState
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DirectConnectGatewayAttachmentType
attachmentType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
directConnectGatewayId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
stateChangeError
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
virtualInterfaceId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
virtualInterfaceOwnerAccount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
virtualInterfaceRegion