module Stratosphere.Location.TrackerConsumer (
TrackerConsumer(..), mkTrackerConsumer
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TrackerConsumer
=
TrackerConsumer {TrackerConsumer -> ()
haddock_workaround_ :: (),
TrackerConsumer -> Value Text
consumerArn :: (Value Prelude.Text),
TrackerConsumer -> Value Text
trackerName :: (Value Prelude.Text)}
deriving stock (TrackerConsumer -> TrackerConsumer -> Bool
(TrackerConsumer -> TrackerConsumer -> Bool)
-> (TrackerConsumer -> TrackerConsumer -> Bool)
-> Eq TrackerConsumer
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TrackerConsumer -> TrackerConsumer -> Bool
== :: TrackerConsumer -> TrackerConsumer -> Bool
$c/= :: TrackerConsumer -> TrackerConsumer -> Bool
/= :: TrackerConsumer -> TrackerConsumer -> Bool
Prelude.Eq, Int -> TrackerConsumer -> ShowS
[TrackerConsumer] -> ShowS
TrackerConsumer -> String
(Int -> TrackerConsumer -> ShowS)
-> (TrackerConsumer -> String)
-> ([TrackerConsumer] -> ShowS)
-> Show TrackerConsumer
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TrackerConsumer -> ShowS
showsPrec :: Int -> TrackerConsumer -> ShowS
$cshow :: TrackerConsumer -> String
show :: TrackerConsumer -> String
$cshowList :: [TrackerConsumer] -> ShowS
showList :: [TrackerConsumer] -> ShowS
Prelude.Show)
mkTrackerConsumer ::
Value Prelude.Text -> Value Prelude.Text -> TrackerConsumer
mkTrackerConsumer :: Value Text -> Value Text -> TrackerConsumer
mkTrackerConsumer Value Text
consumerArn Value Text
trackerName
= TrackerConsumer
{haddock_workaround_ :: ()
haddock_workaround_ = (), consumerArn :: Value Text
consumerArn = Value Text
consumerArn,
trackerName :: Value Text
trackerName = Value Text
trackerName}
instance ToResourceProperties TrackerConsumer where
toResourceProperties :: TrackerConsumer -> ResourceProperties
toResourceProperties TrackerConsumer {()
Value Text
haddock_workaround_ :: TrackerConsumer -> ()
consumerArn :: TrackerConsumer -> Value Text
trackerName :: TrackerConsumer -> Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
trackerName :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Location::TrackerConsumer",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"ConsumerArn" 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
consumerArn,
Key
"TrackerName" 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
trackerName]}
instance JSON.ToJSON TrackerConsumer where
toJSON :: TrackerConsumer -> Value
toJSON TrackerConsumer {()
Value Text
haddock_workaround_ :: TrackerConsumer -> ()
consumerArn :: TrackerConsumer -> Value Text
trackerName :: TrackerConsumer -> Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
trackerName :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"ConsumerArn" 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
consumerArn,
Key
"TrackerName" 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
trackerName]
instance Property "ConsumerArn" TrackerConsumer where
type PropertyType "ConsumerArn" TrackerConsumer = Value Prelude.Text
set :: PropertyType "ConsumerArn" TrackerConsumer
-> TrackerConsumer -> TrackerConsumer
set PropertyType "ConsumerArn" TrackerConsumer
newValue TrackerConsumer {()
Value Text
haddock_workaround_ :: TrackerConsumer -> ()
consumerArn :: TrackerConsumer -> Value Text
trackerName :: TrackerConsumer -> Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
trackerName :: Value Text
..}
= TrackerConsumer {consumerArn :: Value Text
consumerArn = PropertyType "ConsumerArn" TrackerConsumer
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
trackerName :: Value Text
haddock_workaround_ :: ()
trackerName :: Value Text
..}
instance Property "TrackerName" TrackerConsumer where
type PropertyType "TrackerName" TrackerConsumer = Value Prelude.Text
set :: PropertyType "TrackerName" TrackerConsumer
-> TrackerConsumer -> TrackerConsumer
set PropertyType "TrackerName" TrackerConsumer
newValue TrackerConsumer {()
Value Text
haddock_workaround_ :: TrackerConsumer -> ()
consumerArn :: TrackerConsumer -> Value Text
trackerName :: TrackerConsumer -> Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
trackerName :: Value Text
..}
= TrackerConsumer {trackerName :: Value Text
trackerName = PropertyType "TrackerName" TrackerConsumer
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
haddock_workaround_ :: ()
consumerArn :: Value Text
..}