module Stratosphere.GroundStation.DataflowEndpointGroup.EndpointDetailsProperty (
module Exports, EndpointDetailsProperty(..),
mkEndpointDetailsProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.GroundStation.DataflowEndpointGroup.AwsGroundStationAgentEndpointProperty as Exports
import {-# SOURCE #-} Stratosphere.GroundStation.DataflowEndpointGroup.DataflowEndpointProperty as Exports
import {-# SOURCE #-} Stratosphere.GroundStation.DataflowEndpointGroup.SecurityDetailsProperty as Exports
import Stratosphere.ResourceProperties
data EndpointDetailsProperty
=
EndpointDetailsProperty {EndpointDetailsProperty -> ()
haddock_workaround_ :: (),
EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
awsGroundStationAgentEndpoint :: (Prelude.Maybe AwsGroundStationAgentEndpointProperty),
EndpointDetailsProperty -> Maybe DataflowEndpointProperty
endpoint :: (Prelude.Maybe DataflowEndpointProperty),
EndpointDetailsProperty -> Maybe SecurityDetailsProperty
securityDetails :: (Prelude.Maybe SecurityDetailsProperty)}
deriving stock (EndpointDetailsProperty -> EndpointDetailsProperty -> Bool
(EndpointDetailsProperty -> EndpointDetailsProperty -> Bool)
-> (EndpointDetailsProperty -> EndpointDetailsProperty -> Bool)
-> Eq EndpointDetailsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: EndpointDetailsProperty -> EndpointDetailsProperty -> Bool
== :: EndpointDetailsProperty -> EndpointDetailsProperty -> Bool
$c/= :: EndpointDetailsProperty -> EndpointDetailsProperty -> Bool
/= :: EndpointDetailsProperty -> EndpointDetailsProperty -> Bool
Prelude.Eq, Int -> EndpointDetailsProperty -> ShowS
[EndpointDetailsProperty] -> ShowS
EndpointDetailsProperty -> String
(Int -> EndpointDetailsProperty -> ShowS)
-> (EndpointDetailsProperty -> String)
-> ([EndpointDetailsProperty] -> ShowS)
-> Show EndpointDetailsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> EndpointDetailsProperty -> ShowS
showsPrec :: Int -> EndpointDetailsProperty -> ShowS
$cshow :: EndpointDetailsProperty -> String
show :: EndpointDetailsProperty -> String
$cshowList :: [EndpointDetailsProperty] -> ShowS
showList :: [EndpointDetailsProperty] -> ShowS
Prelude.Show)
mkEndpointDetailsProperty :: EndpointDetailsProperty
mkEndpointDetailsProperty :: EndpointDetailsProperty
mkEndpointDetailsProperty
= EndpointDetailsProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
awsGroundStationAgentEndpoint = Maybe AwsGroundStationAgentEndpointProperty
forall a. Maybe a
Prelude.Nothing,
endpoint :: Maybe DataflowEndpointProperty
endpoint = Maybe DataflowEndpointProperty
forall a. Maybe a
Prelude.Nothing, securityDetails :: Maybe SecurityDetailsProperty
securityDetails = Maybe SecurityDetailsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties EndpointDetailsProperty where
toResourceProperties :: EndpointDetailsProperty -> ResourceProperties
toResourceProperties EndpointDetailsProperty {Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: EndpointDetailsProperty -> ()
awsGroundStationAgentEndpoint :: EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
endpoint :: EndpointDetailsProperty -> Maybe DataflowEndpointProperty
securityDetails :: EndpointDetailsProperty -> Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::GroundStation::DataflowEndpointGroup.EndpointDetails",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AwsGroundStationAgentEndpointProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AwsGroundStationAgentEndpoint"
(AwsGroundStationAgentEndpointProperty -> (Key, Value))
-> Maybe AwsGroundStationAgentEndpointProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AwsGroundStationAgentEndpointProperty
awsGroundStationAgentEndpoint,
Key -> DataflowEndpointProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Endpoint" (DataflowEndpointProperty -> (Key, Value))
-> Maybe DataflowEndpointProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataflowEndpointProperty
endpoint,
Key -> SecurityDetailsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SecurityDetails" (SecurityDetailsProperty -> (Key, Value))
-> Maybe SecurityDetailsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SecurityDetailsProperty
securityDetails])}
instance JSON.ToJSON EndpointDetailsProperty where
toJSON :: EndpointDetailsProperty -> Value
toJSON EndpointDetailsProperty {Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: EndpointDetailsProperty -> ()
awsGroundStationAgentEndpoint :: EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
endpoint :: EndpointDetailsProperty -> Maybe DataflowEndpointProperty
securityDetails :: EndpointDetailsProperty -> Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AwsGroundStationAgentEndpointProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AwsGroundStationAgentEndpoint"
(AwsGroundStationAgentEndpointProperty -> (Key, Value))
-> Maybe AwsGroundStationAgentEndpointProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AwsGroundStationAgentEndpointProperty
awsGroundStationAgentEndpoint,
Key -> DataflowEndpointProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Endpoint" (DataflowEndpointProperty -> (Key, Value))
-> Maybe DataflowEndpointProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataflowEndpointProperty
endpoint,
Key -> SecurityDetailsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SecurityDetails" (SecurityDetailsProperty -> (Key, Value))
-> Maybe SecurityDetailsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SecurityDetailsProperty
securityDetails]))
instance Property "AwsGroundStationAgentEndpoint" EndpointDetailsProperty where
type PropertyType "AwsGroundStationAgentEndpoint" EndpointDetailsProperty = AwsGroundStationAgentEndpointProperty
set :: PropertyType
"AwsGroundStationAgentEndpoint" EndpointDetailsProperty
-> EndpointDetailsProperty -> EndpointDetailsProperty
set PropertyType
"AwsGroundStationAgentEndpoint" EndpointDetailsProperty
newValue EndpointDetailsProperty {Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: EndpointDetailsProperty -> ()
awsGroundStationAgentEndpoint :: EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
endpoint :: EndpointDetailsProperty -> Maybe DataflowEndpointProperty
securityDetails :: EndpointDetailsProperty -> Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
= EndpointDetailsProperty
{awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
awsGroundStationAgentEndpoint = AwsGroundStationAgentEndpointProperty
-> Maybe AwsGroundStationAgentEndpointProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AwsGroundStationAgentEndpoint" EndpointDetailsProperty
AwsGroundStationAgentEndpointProperty
newValue, Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
()
haddock_workaround_ :: ()
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
instance Property "Endpoint" EndpointDetailsProperty where
type PropertyType "Endpoint" EndpointDetailsProperty = DataflowEndpointProperty
set :: PropertyType "Endpoint" EndpointDetailsProperty
-> EndpointDetailsProperty -> EndpointDetailsProperty
set PropertyType "Endpoint" EndpointDetailsProperty
newValue EndpointDetailsProperty {Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: EndpointDetailsProperty -> ()
awsGroundStationAgentEndpoint :: EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
endpoint :: EndpointDetailsProperty -> Maybe DataflowEndpointProperty
securityDetails :: EndpointDetailsProperty -> Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
= EndpointDetailsProperty {endpoint :: Maybe DataflowEndpointProperty
endpoint = DataflowEndpointProperty -> Maybe DataflowEndpointProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Endpoint" EndpointDetailsProperty
DataflowEndpointProperty
newValue, Maybe SecurityDetailsProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
instance Property "SecurityDetails" EndpointDetailsProperty where
type PropertyType "SecurityDetails" EndpointDetailsProperty = SecurityDetailsProperty
set :: PropertyType "SecurityDetails" EndpointDetailsProperty
-> EndpointDetailsProperty -> EndpointDetailsProperty
set PropertyType "SecurityDetails" EndpointDetailsProperty
newValue EndpointDetailsProperty {Maybe SecurityDetailsProperty
Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: EndpointDetailsProperty -> ()
awsGroundStationAgentEndpoint :: EndpointDetailsProperty
-> Maybe AwsGroundStationAgentEndpointProperty
endpoint :: EndpointDetailsProperty -> Maybe DataflowEndpointProperty
securityDetails :: EndpointDetailsProperty -> Maybe SecurityDetailsProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
securityDetails :: Maybe SecurityDetailsProperty
..}
= EndpointDetailsProperty
{securityDetails :: Maybe SecurityDetailsProperty
securityDetails = SecurityDetailsProperty -> Maybe SecurityDetailsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SecurityDetails" EndpointDetailsProperty
SecurityDetailsProperty
newValue, Maybe DataflowEndpointProperty
Maybe AwsGroundStationAgentEndpointProperty
()
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
haddock_workaround_ :: ()
awsGroundStationAgentEndpoint :: Maybe AwsGroundStationAgentEndpointProperty
endpoint :: Maybe DataflowEndpointProperty
..}