module Stratosphere.GroundStation.MissionProfile (
module Exports, MissionProfile(..), mkMissionProfile
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.GroundStation.MissionProfile.DataflowEdgeProperty as Exports
import {-# SOURCE #-} Stratosphere.GroundStation.MissionProfile.StreamsKmsKeyProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data MissionProfile
=
MissionProfile {MissionProfile -> ()
haddock_workaround_ :: (),
MissionProfile -> Maybe (Value Integer)
contactPostPassDurationSeconds :: (Prelude.Maybe (Value Prelude.Integer)),
MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: (Prelude.Maybe (Value Prelude.Integer)),
MissionProfile -> [DataflowEdgeProperty]
dataflowEdges :: [DataflowEdgeProperty],
MissionProfile -> Value Integer
minimumViableContactDurationSeconds :: (Value Prelude.Integer),
MissionProfile -> Value Text
name :: (Value Prelude.Text),
MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsKey :: (Prelude.Maybe StreamsKmsKeyProperty),
MissionProfile -> Maybe (Value Text)
streamsKmsRole :: (Prelude.Maybe (Value Prelude.Text)),
MissionProfile -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
MissionProfile -> Value Text
trackingConfigArn :: (Value Prelude.Text)}
deriving stock (MissionProfile -> MissionProfile -> Bool
(MissionProfile -> MissionProfile -> Bool)
-> (MissionProfile -> MissionProfile -> Bool) -> Eq MissionProfile
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MissionProfile -> MissionProfile -> Bool
== :: MissionProfile -> MissionProfile -> Bool
$c/= :: MissionProfile -> MissionProfile -> Bool
/= :: MissionProfile -> MissionProfile -> Bool
Prelude.Eq, Int -> MissionProfile -> ShowS
[MissionProfile] -> ShowS
MissionProfile -> String
(Int -> MissionProfile -> ShowS)
-> (MissionProfile -> String)
-> ([MissionProfile] -> ShowS)
-> Show MissionProfile
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MissionProfile -> ShowS
showsPrec :: Int -> MissionProfile -> ShowS
$cshow :: MissionProfile -> String
show :: MissionProfile -> String
$cshowList :: [MissionProfile] -> ShowS
showList :: [MissionProfile] -> ShowS
Prelude.Show)
mkMissionProfile ::
[DataflowEdgeProperty]
-> Value Prelude.Integer
-> Value Prelude.Text -> Value Prelude.Text -> MissionProfile
mkMissionProfile :: [DataflowEdgeProperty]
-> Value Integer -> Value Text -> Value Text -> MissionProfile
mkMissionProfile
[DataflowEdgeProperty]
dataflowEdges
Value Integer
minimumViableContactDurationSeconds
Value Text
name
Value Text
trackingConfigArn
= MissionProfile
{haddock_workaround_ :: ()
haddock_workaround_ = (), dataflowEdges :: [DataflowEdgeProperty]
dataflowEdges = [DataflowEdgeProperty]
dataflowEdges,
minimumViableContactDurationSeconds :: Value Integer
minimumViableContactDurationSeconds = Value Integer
minimumViableContactDurationSeconds,
name :: Value Text
name = Value Text
name, trackingConfigArn :: Value Text
trackingConfigArn = Value Text
trackingConfigArn,
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPostPassDurationSeconds = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
contactPrePassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsKey = Maybe StreamsKmsKeyProperty
forall a. Maybe a
Prelude.Nothing, streamsKmsRole :: Maybe (Value Text)
streamsKmsRole = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties MissionProfile where
toResourceProperties :: MissionProfile -> ResourceProperties
toResourceProperties MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::GroundStation::MissionProfile",
supportsTags :: Bool
supportsTags = Bool
Prelude.True,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"DataflowEdges" Key -> [DataflowEdgeProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [DataflowEdgeProperty]
dataflowEdges,
Key
"MinimumViableContactDurationSeconds"
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
minimumViableContactDurationSeconds,
Key
"Name" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
name, Key
"TrackingConfigArn" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
trackingConfigArn]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactPostPassDurationSeconds"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
contactPostPassDurationSeconds,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactPrePassDurationSeconds"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
contactPrePassDurationSeconds,
Key -> StreamsKmsKeyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamsKmsKey" (StreamsKmsKeyProperty -> (Key, Value))
-> Maybe StreamsKmsKeyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StreamsKmsKeyProperty
streamsKmsKey,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamsKmsRole" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
streamsKmsRole,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON MissionProfile where
toJSON :: MissionProfile -> Value
toJSON MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"DataflowEdges" Key -> [DataflowEdgeProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [DataflowEdgeProperty]
dataflowEdges,
Key
"MinimumViableContactDurationSeconds"
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Integer
minimumViableContactDurationSeconds,
Key
"Name" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
name, Key
"TrackingConfigArn" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
trackingConfigArn]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactPostPassDurationSeconds"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
contactPostPassDurationSeconds,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContactPrePassDurationSeconds"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
contactPrePassDurationSeconds,
Key -> StreamsKmsKeyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamsKmsKey" (StreamsKmsKeyProperty -> (Key, Value))
-> Maybe StreamsKmsKeyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StreamsKmsKeyProperty
streamsKmsKey,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"StreamsKmsRole" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
streamsKmsRole,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "ContactPostPassDurationSeconds" MissionProfile where
type PropertyType "ContactPostPassDurationSeconds" MissionProfile = Value Prelude.Integer
set :: PropertyType "ContactPostPassDurationSeconds" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "ContactPostPassDurationSeconds" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile
{contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPostPassDurationSeconds = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ContactPostPassDurationSeconds" MissionProfile
Value Integer
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "ContactPrePassDurationSeconds" MissionProfile where
type PropertyType "ContactPrePassDurationSeconds" MissionProfile = Value Prelude.Integer
set :: PropertyType "ContactPrePassDurationSeconds" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "ContactPrePassDurationSeconds" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile
{contactPrePassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ContactPrePassDurationSeconds" MissionProfile
Value Integer
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "DataflowEdges" MissionProfile where
type PropertyType "DataflowEdges" MissionProfile = [DataflowEdgeProperty]
set :: PropertyType "DataflowEdges" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "DataflowEdges" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {dataflowEdges :: [DataflowEdgeProperty]
dataflowEdges = [DataflowEdgeProperty]
PropertyType "DataflowEdges" MissionProfile
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "MinimumViableContactDurationSeconds" MissionProfile where
type PropertyType "MinimumViableContactDurationSeconds" MissionProfile = Value Prelude.Integer
set :: PropertyType "MinimumViableContactDurationSeconds" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "MinimumViableContactDurationSeconds" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile
{minimumViableContactDurationSeconds :: Value Integer
minimumViableContactDurationSeconds = PropertyType "MinimumViableContactDurationSeconds" MissionProfile
Value Integer
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "Name" MissionProfile where
type PropertyType "Name" MissionProfile = Value Prelude.Text
set :: PropertyType "Name" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "Name" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {name :: Value Text
name = PropertyType "Name" MissionProfile
Value Text
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "StreamsKmsKey" MissionProfile where
type PropertyType "StreamsKmsKey" MissionProfile = StreamsKmsKeyProperty
set :: PropertyType "StreamsKmsKey" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "StreamsKmsKey" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsKey = StreamsKmsKeyProperty -> Maybe StreamsKmsKeyProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "StreamsKmsKey" MissionProfile
StreamsKmsKeyProperty
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "StreamsKmsRole" MissionProfile where
type PropertyType "StreamsKmsRole" MissionProfile = Value Prelude.Text
set :: PropertyType "StreamsKmsRole" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "StreamsKmsRole" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {streamsKmsRole :: Maybe (Value Text)
streamsKmsRole = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "StreamsKmsRole" MissionProfile
Value Text
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
instance Property "Tags" MissionProfile where
type PropertyType "Tags" MissionProfile = [Tag]
set :: PropertyType "Tags" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "Tags" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" MissionProfile
newValue, [DataflowEdgeProperty]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
trackingConfigArn :: Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
trackingConfigArn :: Value Text
..}
instance Property "TrackingConfigArn" MissionProfile where
type PropertyType "TrackingConfigArn" MissionProfile = Value Prelude.Text
set :: PropertyType "TrackingConfigArn" MissionProfile
-> MissionProfile -> MissionProfile
set PropertyType "TrackingConfigArn" MissionProfile
newValue MissionProfile {[DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: MissionProfile -> ()
contactPostPassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
contactPrePassDurationSeconds :: MissionProfile -> Maybe (Value Integer)
dataflowEdges :: MissionProfile -> [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: MissionProfile -> Value Integer
name :: MissionProfile -> Value Text
streamsKmsKey :: MissionProfile -> Maybe StreamsKmsKeyProperty
streamsKmsRole :: MissionProfile -> Maybe (Value Text)
tags :: MissionProfile -> Maybe [Tag]
trackingConfigArn :: MissionProfile -> Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
trackingConfigArn :: Value Text
..}
= MissionProfile {trackingConfigArn :: Value Text
trackingConfigArn = PropertyType "TrackingConfigArn" MissionProfile
Value Text
newValue, [DataflowEdgeProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe StreamsKmsKeyProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
contactPostPassDurationSeconds :: Maybe (Value Integer)
contactPrePassDurationSeconds :: Maybe (Value Integer)
dataflowEdges :: [DataflowEdgeProperty]
minimumViableContactDurationSeconds :: Value Integer
name :: Value Text
streamsKmsKey :: Maybe StreamsKmsKeyProperty
streamsKmsRole :: Maybe (Value Text)
tags :: Maybe [Tag]
..}