module Stratosphere.MediaPackage.Channel.IngestEndpointProperty (
        IngestEndpointProperty(..), mkIngestEndpointProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data IngestEndpointProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-mediapackage-channel-ingestendpoint.html>
    IngestEndpointProperty {IngestEndpointProperty -> ()
haddock_workaround_ :: (),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-mediapackage-channel-ingestendpoint.html#cfn-mediapackage-channel-ingestendpoint-id>
                            IngestEndpointProperty -> Value Text
id :: (Value Prelude.Text),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-mediapackage-channel-ingestendpoint.html#cfn-mediapackage-channel-ingestendpoint-password>
                            IngestEndpointProperty -> Value Text
password :: (Value Prelude.Text),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-mediapackage-channel-ingestendpoint.html#cfn-mediapackage-channel-ingestendpoint-url>
                            IngestEndpointProperty -> Value Text
url :: (Value Prelude.Text),
                            -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-mediapackage-channel-ingestendpoint.html#cfn-mediapackage-channel-ingestendpoint-username>
                            IngestEndpointProperty -> Value Text
username :: (Value Prelude.Text)}
  deriving stock (IngestEndpointProperty -> IngestEndpointProperty -> Bool
(IngestEndpointProperty -> IngestEndpointProperty -> Bool)
-> (IngestEndpointProperty -> IngestEndpointProperty -> Bool)
-> Eq IngestEndpointProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: IngestEndpointProperty -> IngestEndpointProperty -> Bool
== :: IngestEndpointProperty -> IngestEndpointProperty -> Bool
$c/= :: IngestEndpointProperty -> IngestEndpointProperty -> Bool
/= :: IngestEndpointProperty -> IngestEndpointProperty -> Bool
Prelude.Eq, Int -> IngestEndpointProperty -> ShowS
[IngestEndpointProperty] -> ShowS
IngestEndpointProperty -> String
(Int -> IngestEndpointProperty -> ShowS)
-> (IngestEndpointProperty -> String)
-> ([IngestEndpointProperty] -> ShowS)
-> Show IngestEndpointProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> IngestEndpointProperty -> ShowS
showsPrec :: Int -> IngestEndpointProperty -> ShowS
$cshow :: IngestEndpointProperty -> String
show :: IngestEndpointProperty -> String
$cshowList :: [IngestEndpointProperty] -> ShowS
showList :: [IngestEndpointProperty] -> ShowS
Prelude.Show)
mkIngestEndpointProperty ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text
        -> Value Prelude.Text -> IngestEndpointProperty
mkIngestEndpointProperty :: Value Text
-> Value Text -> Value Text -> Value Text -> IngestEndpointProperty
mkIngestEndpointProperty Value Text
id Value Text
password Value Text
url Value Text
username
  = IngestEndpointProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), id :: Value Text
id = Value Text
id, password :: Value Text
password = Value Text
password, url :: Value Text
url = Value Text
url,
       username :: Value Text
username = Value Text
username}
instance ToResourceProperties IngestEndpointProperty where
  toResourceProperties :: IngestEndpointProperty -> ResourceProperties
toResourceProperties IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::MediaPackage::Channel.IngestEndpoint",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"Id" 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
id, Key
"Password" 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
password,
                       Key
"Url" 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
url, Key
"Username" 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
username]}
instance JSON.ToJSON IngestEndpointProperty where
  toJSON :: IngestEndpointProperty -> Value
toJSON IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"Id" 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
id, Key
"Password" 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
password, Key
"Url" 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
url,
         Key
"Username" 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
username]
instance Property "Id" IngestEndpointProperty where
  type PropertyType "Id" IngestEndpointProperty = Value Prelude.Text
  set :: PropertyType "Id" IngestEndpointProperty
-> IngestEndpointProperty -> IngestEndpointProperty
set PropertyType "Id" IngestEndpointProperty
newValue IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = IngestEndpointProperty {id :: Value Text
id = PropertyType "Id" IngestEndpointProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
password :: Value Text
url :: Value Text
username :: Value Text
haddock_workaround_ :: ()
password :: Value Text
url :: Value Text
username :: Value Text
..}
instance Property "Password" IngestEndpointProperty where
  type PropertyType "Password" IngestEndpointProperty = Value Prelude.Text
  set :: PropertyType "Password" IngestEndpointProperty
-> IngestEndpointProperty -> IngestEndpointProperty
set PropertyType "Password" IngestEndpointProperty
newValue IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = IngestEndpointProperty {password :: Value Text
password = PropertyType "Password" IngestEndpointProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
id :: Value Text
url :: Value Text
username :: Value Text
haddock_workaround_ :: ()
id :: Value Text
url :: Value Text
username :: Value Text
..}
instance Property "Url" IngestEndpointProperty where
  type PropertyType "Url" IngestEndpointProperty = Value Prelude.Text
  set :: PropertyType "Url" IngestEndpointProperty
-> IngestEndpointProperty -> IngestEndpointProperty
set PropertyType "Url" IngestEndpointProperty
newValue IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = IngestEndpointProperty {url :: Value Text
url = PropertyType "Url" IngestEndpointProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
username :: Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
username :: Value Text
..}
instance Property "Username" IngestEndpointProperty where
  type PropertyType "Username" IngestEndpointProperty = Value Prelude.Text
  set :: PropertyType "Username" IngestEndpointProperty
-> IngestEndpointProperty -> IngestEndpointProperty
set PropertyType "Username" IngestEndpointProperty
newValue IngestEndpointProperty {()
Value Text
haddock_workaround_ :: IngestEndpointProperty -> ()
id :: IngestEndpointProperty -> Value Text
password :: IngestEndpointProperty -> Value Text
url :: IngestEndpointProperty -> Value Text
username :: IngestEndpointProperty -> Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
username :: Value Text
..}
    = IngestEndpointProperty {username :: Value Text
username = PropertyType "Username" IngestEndpointProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
haddock_workaround_ :: ()
id :: Value Text
password :: Value Text
url :: Value Text
..}