amazonka-pinpoint-1.6.1: Amazon Pinpoint SDK.

Copyright(c) 2013-2018 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay+amazonka@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.AWS.Pinpoint.Types

Contents

Description

 
Synopsis

Service Configuration

pinpoint :: Service Source #

API version 2016-12-01 of the Amazon Pinpoint SDK configuration.

Errors

Action

data Action Source #

Constructors

DeepLink 
OpenApp 
URL 
Instances
Bounded Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

(==) :: Action -> Action -> Bool #

(/=) :: Action -> Action -> Bool #

Data Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Action -> c Action #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Action #

toConstr :: Action -> Constr #

dataTypeOf :: Action -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Action) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Action) #

gmapT :: (forall b. Data b => b -> b) -> Action -> Action #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Action -> r #

gmapQ :: (forall d. Data d => d -> u) -> Action -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Action -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Action -> m Action #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Action -> m Action #

Ord Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep Action :: Type -> Type #

Methods

from :: Action -> Rep Action x #

to :: Rep Action x -> Action #

Hashable Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

hashWithSalt :: Int -> Action -> Int #

hash :: Action -> Int #

ToJSON Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toHeader :: HeaderName -> Action -> [Header] #

ToQuery Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toBS :: Action -> ByteString #

FromText Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

parser :: Parser Action #

ToText Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: Action -> Text #

NFData Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: Action -> () #

type Rep Action Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep Action = D1 (MetaData "Action" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "DeepLink" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "OpenApp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "URL" PrefixI False) (U1 :: Type -> Type)))

AttributeType

data AttributeType Source #

Constructors

Exclusive 
Inclusive 
Instances
Bounded AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AttributeType -> c AttributeType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AttributeType #

toConstr :: AttributeType -> Constr #

dataTypeOf :: AttributeType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AttributeType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AttributeType) #

gmapT :: (forall b. Data b => b -> b) -> AttributeType -> AttributeType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AttributeType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AttributeType -> r #

gmapQ :: (forall d. Data d => d -> u) -> AttributeType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AttributeType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AttributeType -> m AttributeType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AttributeType -> m AttributeType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AttributeType -> m AttributeType #

Ord AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep AttributeType :: Type -> Type #

Hashable AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: AttributeType -> Text #

NFData AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: AttributeType -> () #

type Rep AttributeType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep AttributeType = D1 (MetaData "AttributeType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "Exclusive" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Inclusive" PrefixI False) (U1 :: Type -> Type))

CampaignStatus

data CampaignStatus Source #

Instances
Bounded CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignStatus -> c CampaignStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignStatus #

toConstr :: CampaignStatus -> Constr #

dataTypeOf :: CampaignStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignStatus) #

gmapT :: (forall b. Data b => b -> b) -> CampaignStatus -> CampaignStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignStatus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignStatus -> m CampaignStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignStatus -> m CampaignStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignStatus -> m CampaignStatus #

Ord CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep CampaignStatus :: Type -> Type #

Hashable CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

NFData CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: CampaignStatus -> () #

type Rep CampaignStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep CampaignStatus = D1 (MetaData "CampaignStatus" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) ((C1 (MetaCons "Completed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Executing" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Paused" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PendingNextRun" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Scheduled" PrefixI False) (U1 :: Type -> Type))))

ChannelType

data ChannelType Source #

Instances
Bounded ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChannelType -> c ChannelType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChannelType #

toConstr :: ChannelType -> Constr #

dataTypeOf :: ChannelType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ChannelType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChannelType) #

gmapT :: (forall b. Data b => b -> b) -> ChannelType -> ChannelType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChannelType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChannelType -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChannelType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChannelType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChannelType -> m ChannelType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChannelType -> m ChannelType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChannelType -> m ChannelType #

Ord ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep ChannelType :: Type -> Type #

Hashable ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: ChannelType -> Text #

NFData ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: ChannelType -> () #

type Rep ChannelType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep ChannelType = D1 (MetaData "ChannelType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (((C1 (MetaCons "ADM" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "APNS" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "APNSSandbox" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "APNSVoip" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "APNSVoipSandbox" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "Baidu" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Custom" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Email" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GCM" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Sms" PrefixI False) (U1 :: Type -> Type)))))

DefinitionFormat

data DefinitionFormat Source #

Constructors

CSV 
JSON 
Instances
Bounded DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DefinitionFormat -> c DefinitionFormat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DefinitionFormat #

toConstr :: DefinitionFormat -> Constr #

dataTypeOf :: DefinitionFormat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DefinitionFormat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DefinitionFormat) #

gmapT :: (forall b. Data b => b -> b) -> DefinitionFormat -> DefinitionFormat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DefinitionFormat -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DefinitionFormat -> r #

gmapQ :: (forall d. Data d => d -> u) -> DefinitionFormat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DefinitionFormat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DefinitionFormat -> m DefinitionFormat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DefinitionFormat -> m DefinitionFormat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DefinitionFormat -> m DefinitionFormat #

Ord DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep DefinitionFormat :: Type -> Type #

Hashable DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

NFData DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: DefinitionFormat -> () #

type Rep DefinitionFormat Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep DefinitionFormat = D1 (MetaData "DefinitionFormat" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CSV" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "JSON" PrefixI False) (U1 :: Type -> Type))

DeliveryStatus

data DeliveryStatus Source #

Instances
Bounded DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeliveryStatus -> c DeliveryStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeliveryStatus #

toConstr :: DeliveryStatus -> Constr #

dataTypeOf :: DeliveryStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeliveryStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeliveryStatus) #

gmapT :: (forall b. Data b => b -> b) -> DeliveryStatus -> DeliveryStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeliveryStatus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeliveryStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeliveryStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeliveryStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeliveryStatus -> m DeliveryStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeliveryStatus -> m DeliveryStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeliveryStatus -> m DeliveryStatus #

Ord DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep DeliveryStatus :: Type -> Type #

Hashable DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

NFData DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: DeliveryStatus -> () #

type Rep DeliveryStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep DeliveryStatus = D1 (MetaData "DeliveryStatus" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) ((C1 (MetaCons "Duplicate" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "OptOut" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PermanentFailure" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Successful" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TemporaryFailure" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Throttled" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UnknownFailure" PrefixI False) (U1 :: Type -> Type))))

DimensionType

data DimensionType Source #

Constructors

DTExclusive 
DTInclusive 
Instances
Bounded DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DimensionType -> c DimensionType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DimensionType #

toConstr :: DimensionType -> Constr #

dataTypeOf :: DimensionType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DimensionType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DimensionType) #

gmapT :: (forall b. Data b => b -> b) -> DimensionType -> DimensionType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DimensionType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DimensionType -> r #

gmapQ :: (forall d. Data d => d -> u) -> DimensionType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DimensionType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DimensionType -> m DimensionType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionType -> m DimensionType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionType -> m DimensionType #

Ord DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep DimensionType :: Type -> Type #

Hashable DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: DimensionType -> Text #

NFData DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: DimensionType -> () #

type Rep DimensionType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep DimensionType = D1 (MetaData "DimensionType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "DTExclusive" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DTInclusive" PrefixI False) (U1 :: Type -> Type))

Duration

data Duration Source #

Constructors

Day14 
Day30 
Day7 
Hr24 
Instances
Bounded Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Duration -> c Duration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Duration #

toConstr :: Duration -> Constr #

dataTypeOf :: Duration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Duration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Duration) #

gmapT :: (forall b. Data b => b -> b) -> Duration -> Duration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Duration -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Duration -> r #

gmapQ :: (forall d. Data d => d -> u) -> Duration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Duration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Duration -> m Duration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Duration -> m Duration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Duration -> m Duration #

Ord Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep Duration :: Type -> Type #

Methods

from :: Duration -> Rep Duration x #

to :: Rep Duration x -> Duration #

Hashable Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

hashWithSalt :: Int -> Duration -> Int #

hash :: Duration -> Int #

ToJSON Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toHeader :: HeaderName -> Duration -> [Header] #

ToQuery Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toBS :: Duration -> ByteString #

FromText Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: Duration -> Text #

NFData Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: Duration -> () #

type Rep Duration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep Duration = D1 (MetaData "Duration" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) ((C1 (MetaCons "Day14" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Day30" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Day7" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Hr24" PrefixI False) (U1 :: Type -> Type)))

Frequency

data Frequency Source #

Constructors

Daily 
Hourly 
Monthly 
Once 
Weekly 
Instances
Bounded Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Frequency -> c Frequency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Frequency #

toConstr :: Frequency -> Constr #

dataTypeOf :: Frequency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Frequency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Frequency) #

gmapT :: (forall b. Data b => b -> b) -> Frequency -> Frequency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Frequency -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Frequency -> r #

gmapQ :: (forall d. Data d => d -> u) -> Frequency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Frequency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Frequency -> m Frequency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Frequency -> m Frequency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Frequency -> m Frequency #

Ord Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep Frequency :: Type -> Type #

Hashable Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toBS :: Frequency -> ByteString #

FromText Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: Frequency -> Text #

NFData Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: Frequency -> () #

type Rep Frequency Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep Frequency = D1 (MetaData "Frequency" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) ((C1 (MetaCons "Daily" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Hourly" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Monthly" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Once" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Weekly" PrefixI False) (U1 :: Type -> Type))))

JobStatus

data JobStatus Source #

Instances
Bounded JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JobStatus -> c JobStatus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c JobStatus #

toConstr :: JobStatus -> Constr #

dataTypeOf :: JobStatus -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c JobStatus) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c JobStatus) #

gmapT :: (forall b. Data b => b -> b) -> JobStatus -> JobStatus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JobStatus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JobStatus -> r #

gmapQ :: (forall d. Data d => d -> u) -> JobStatus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> JobStatus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> JobStatus -> m JobStatus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JobStatus -> m JobStatus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JobStatus -> m JobStatus #

Ord JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep JobStatus :: Type -> Type #

Hashable JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toBS :: JobStatus -> ByteString #

FromText JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: JobStatus -> Text #

NFData JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: JobStatus -> () #

type Rep JobStatus Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep JobStatus = D1 (MetaData "JobStatus" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) ((C1 (MetaCons "JSCompleted" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "JSCompleting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "JSCreated" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "JSFailed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "JSFailing" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "JSInitializing" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "JSProcessing" PrefixI False) (U1 :: Type -> Type))))

MessageType

data MessageType Source #

Constructors

Promotional 
Transactional 
Instances
Bounded MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageType -> c MessageType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageType #

toConstr :: MessageType -> Constr #

dataTypeOf :: MessageType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageType) #

gmapT :: (forall b. Data b => b -> b) -> MessageType -> MessageType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageType -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageType -> m MessageType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageType -> m MessageType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageType -> m MessageType #

Ord MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep MessageType :: Type -> Type #

Hashable MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: MessageType -> Text #

NFData MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: MessageType -> () #

type Rep MessageType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep MessageType = D1 (MetaData "MessageType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "Promotional" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Transactional" PrefixI False) (U1 :: Type -> Type))

Mode

data Mode Source #

Constructors

Delivery 
Filter 
Instances
Bounded Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

succ :: Mode -> Mode #

pred :: Mode -> Mode #

toEnum :: Int -> Mode #

fromEnum :: Mode -> Int #

enumFrom :: Mode -> [Mode] #

enumFromThen :: Mode -> Mode -> [Mode] #

enumFromTo :: Mode -> Mode -> [Mode] #

enumFromThenTo :: Mode -> Mode -> Mode -> [Mode] #

Eq Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

(==) :: Mode -> Mode -> Bool #

(/=) :: Mode -> Mode -> Bool #

Data Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Mode -> c Mode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Mode #

toConstr :: Mode -> Constr #

dataTypeOf :: Mode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Mode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Mode) #

gmapT :: (forall b. Data b => b -> b) -> Mode -> Mode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Mode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Mode -> r #

gmapQ :: (forall d. Data d => d -> u) -> Mode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Mode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

Ord Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

compare :: Mode -> Mode -> Ordering #

(<) :: Mode -> Mode -> Bool #

(<=) :: Mode -> Mode -> Bool #

(>) :: Mode -> Mode -> Bool #

(>=) :: Mode -> Mode -> Bool #

max :: Mode -> Mode -> Mode #

min :: Mode -> Mode -> Mode #

Read Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Generic Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep Mode :: Type -> Type #

Methods

from :: Mode -> Rep Mode x #

to :: Rep Mode x -> Mode #

Hashable Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

hashWithSalt :: Int -> Mode -> Int #

hash :: Mode -> Int #

ToJSON Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toHeader :: HeaderName -> Mode -> [Header] #

ToQuery Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toQuery :: Mode -> QueryString #

ToByteString Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toBS :: Mode -> ByteString #

FromText Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

parser :: Parser Mode #

ToText Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: Mode -> Text #

NFData Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: Mode -> () #

type Rep Mode Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep Mode = D1 (MetaData "Mode" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "Delivery" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Filter" PrefixI False) (U1 :: Type -> Type))

RecencyType

data RecencyType Source #

Constructors

Active 
Inactive 
Instances
Bounded RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecencyType -> c RecencyType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecencyType #

toConstr :: RecencyType -> Constr #

dataTypeOf :: RecencyType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecencyType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecencyType) #

gmapT :: (forall b. Data b => b -> b) -> RecencyType -> RecencyType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecencyType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecencyType -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecencyType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecencyType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecencyType -> m RecencyType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecencyType -> m RecencyType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecencyType -> m RecencyType #

Ord RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep RecencyType :: Type -> Type #

Hashable RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToJSON RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: RecencyType -> Text #

NFData RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: RecencyType -> () #

type Rep RecencyType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep RecencyType = D1 (MetaData "RecencyType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "Active" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Inactive" PrefixI False) (U1 :: Type -> Type))

SegmentType

data SegmentType Source #

Constructors

Dimensional 
Import 
Instances
Bounded SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Enum SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Eq SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Data SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentType -> c SegmentType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentType #

toConstr :: SegmentType -> Constr #

dataTypeOf :: SegmentType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentType) #

gmapT :: (forall b. Data b => b -> b) -> SegmentType -> SegmentType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentType -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentType -> m SegmentType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentType -> m SegmentType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentType -> m SegmentType #

Ord SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Read SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Show SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Generic SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Associated Types

type Rep SegmentType :: Type -> Type #

Hashable SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromJSON SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToHeader SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToQuery SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToByteString SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

FromText SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

ToText SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

toText :: SegmentType -> Text #

NFData SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

Methods

rnf :: SegmentType -> () #

type Rep SegmentType Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Sum

type Rep SegmentType = D1 (MetaData "SegmentType" "Network.AWS.Pinpoint.Types.Sum" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "Dimensional" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Import" PrefixI False) (U1 :: Type -> Type))

ADMChannelRequest

data ADMChannelRequest Source #

Amazon Device Messaging channel definition.

See: aDMChannelRequest smart constructor.

Instances
Eq ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ADMChannelRequest -> c ADMChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ADMChannelRequest #

toConstr :: ADMChannelRequest -> Constr #

dataTypeOf :: ADMChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ADMChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ADMChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> ADMChannelRequest -> ADMChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ADMChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ADMChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ADMChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ADMChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ADMChannelRequest -> m ADMChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMChannelRequest -> m ADMChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMChannelRequest -> m ADMChannelRequest #

Read ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ADMChannelRequest :: Type -> Type #

Hashable ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ADMChannelRequest -> () #

type Rep ADMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ADMChannelRequest = D1 (MetaData "ADMChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ADMChannelRequest'" PrefixI True) (S1 (MetaSel (Just "_admcrClientId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_admcrClientSecret") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admcrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

aDMChannelRequest :: ADMChannelRequest Source #

Creates a value of ADMChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

admcrClientId :: Lens' ADMChannelRequest (Maybe Text) Source #

Client ID as gotten from Amazon

admcrClientSecret :: Lens' ADMChannelRequest (Maybe Text) Source #

Client secret as gotten from Amazon

admcrEnabled :: Lens' ADMChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

ADMChannelResponse

data ADMChannelResponse Source #

Amazon Device Messaging channel definition.

See: aDMChannelResponse smart constructor.

Instances
Eq ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ADMChannelResponse -> c ADMChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ADMChannelResponse #

toConstr :: ADMChannelResponse -> Constr #

dataTypeOf :: ADMChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ADMChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ADMChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> ADMChannelResponse -> ADMChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ADMChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ADMChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ADMChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ADMChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ADMChannelResponse -> m ADMChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMChannelResponse -> m ADMChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMChannelResponse -> m ADMChannelResponse #

Read ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ADMChannelResponse :: Type -> Type #

Hashable ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ADMChannelResponse -> () #

type Rep ADMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ADMChannelResponse = D1 (MetaData "ADMChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ADMChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_admcPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admcLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admcEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_admcIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_admcApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_admcVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_admcId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admcCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_admcLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admcHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

aDMChannelResponse :: ADMChannelResponse Source #

Creates a value of ADMChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

admcEnabled :: Lens' ADMChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

admcApplicationId :: Lens' ADMChannelResponse (Maybe Text) Source #

The ID of the application to which the channel applies.

admcId :: Lens' ADMChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

admcCreationDate :: Lens' ADMChannelResponse (Maybe Text) Source #

When was this segment created

admcLastModifiedBy :: Lens' ADMChannelResponse (Maybe Text) Source #

Who last updated this entry

admcHasCredential :: Lens' ADMChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with ADM credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with ADM. Provide your credentials by setting the ClientId and ClientSecret attributes.

ADMMessage

data ADMMessage Source #

ADM Message.

See: aDMMessage smart constructor.

Instances
Eq ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ADMMessage -> c ADMMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ADMMessage #

toConstr :: ADMMessage -> Constr #

dataTypeOf :: ADMMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ADMMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ADMMessage) #

gmapT :: (forall b. Data b => b -> b) -> ADMMessage -> ADMMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ADMMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ADMMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> ADMMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ADMMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ADMMessage -> m ADMMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMMessage -> m ADMMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ADMMessage -> m ADMMessage #

Read ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ADMMessage :: Type -> Type #

Hashable ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ADMMessage -> () #

type Rep ADMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ADMMessage = D1 (MetaData "ADMMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ADMMessage'" PrefixI True) ((((S1 (MetaSel (Just "_admmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_admmExpiresAfter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admmMD5") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmSilentPush") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: ((S1 (MetaSel (Just "_admmImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admmData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: S1 (MetaSel (Just "_admmSmallImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: (((S1 (MetaSel (Just "_admmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admmSound") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Action)))) :*: ((S1 (MetaSel (Just "_admmImageURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmConsolidationKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_admmTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_admmIconReference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

aDMMessage :: ADMMessage Source #

Creates a value of ADMMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • admmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • admmExpiresAfter - Optional. Number of seconds ADM should retain the message if the device is offline
  • admmMD5 - Optional. Base-64-encoded MD5 checksum of the data parameter. Used to verify data integrity
  • admmSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • admmImageIconURL - The URL that points to an image used as the large icon to the notification content view.
  • admmRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • admmData - The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object
  • admmSmallImageIconURL - The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view
  • admmBody - The message body of the notification, the email body or the text message.
  • admmURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • admmSound - Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/
  • admmAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL
  • admmImageURL - The URL that points to an image used in the push notification.
  • admmConsolidationKey - Optional. Arbitrary string used to indicate multiple messages are logically the same and that ADM is allowed to drop previously enqueued messages in favor of this one.
  • admmTitle - The message title that displays above the message on the user's device.
  • admmIconReference - The icon image name of the asset saved in your application.

admmSubstitutions :: Lens' ADMMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

admmExpiresAfter :: Lens' ADMMessage (Maybe Text) Source #

Optional. Number of seconds ADM should retain the message if the device is offline

admmMD5 :: Lens' ADMMessage (Maybe Text) Source #

Optional. Base-64-encoded MD5 checksum of the data parameter. Used to verify data integrity

admmSilentPush :: Lens' ADMMessage (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

admmImageIconURL :: Lens' ADMMessage (Maybe Text) Source #

The URL that points to an image used as the large icon to the notification content view.

admmRawContent :: Lens' ADMMessage (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

admmData :: Lens' ADMMessage (HashMap Text Text) Source #

The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object

admmSmallImageIconURL :: Lens' ADMMessage (Maybe Text) Source #

The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view

admmBody :: Lens' ADMMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

admmURL :: Lens' ADMMessage (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

admmSound :: Lens' ADMMessage (Maybe Text) Source #

Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/

admmAction :: Lens' ADMMessage (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL

admmImageURL :: Lens' ADMMessage (Maybe Text) Source #

The URL that points to an image used in the push notification.

admmConsolidationKey :: Lens' ADMMessage (Maybe Text) Source #

Optional. Arbitrary string used to indicate multiple messages are logically the same and that ADM is allowed to drop previously enqueued messages in favor of this one.

admmTitle :: Lens' ADMMessage (Maybe Text) Source #

The message title that displays above the message on the user's device.

admmIconReference :: Lens' ADMMessage (Maybe Text) Source #

The icon image name of the asset saved in your application.

APNSChannelRequest

data APNSChannelRequest Source #

Apple Push Notification Service channel definition.

See: apnsChannelRequest smart constructor.

Instances
Eq APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSChannelRequest -> c APNSChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSChannelRequest #

toConstr :: APNSChannelRequest -> Constr #

dataTypeOf :: APNSChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> APNSChannelRequest -> APNSChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSChannelRequest -> m APNSChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSChannelRequest -> m APNSChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSChannelRequest -> m APNSChannelRequest #

Read APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSChannelRequest :: Type -> Type #

Hashable APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: APNSChannelRequest -> () #

type Rep APNSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSChannelRequest = D1 (MetaData "APNSChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSChannelRequest'" PrefixI True) (((S1 (MetaSel (Just "_acrTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acrPrivateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_acrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_acrTeamId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_acrBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acrDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_acrCertificate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acrTokenKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

apnsChannelRequest :: APNSChannelRequest Source #

Creates a value of APNSChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acrTokenKey :: Lens' APNSChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

acrPrivateKey :: Lens' APNSChannelRequest (Maybe Text) Source #

The certificate private key.

acrEnabled :: Lens' APNSChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

acrTeamId :: Lens' APNSChannelRequest (Maybe Text) Source #

The team id used for APNs Tokens.

acrBundleId :: Lens' APNSChannelRequest (Maybe Text) Source #

The bundle id used for APNs Tokens.

acrDefaultAuthenticationMethod :: Lens' APNSChannelRequest (Maybe Text) Source #

The default authentication method used for APNs.

acrCertificate :: Lens' APNSChannelRequest (Maybe Text) Source #

The distribution certificate from Apple.

acrTokenKeyId :: Lens' APNSChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

APNSChannelResponse

data APNSChannelResponse Source #

Apple Distribution Push Notification Service channel definition.

See: apnsChannelResponse smart constructor.

Instances
Eq APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSChannelResponse -> c APNSChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSChannelResponse #

toConstr :: APNSChannelResponse -> Constr #

dataTypeOf :: APNSChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> APNSChannelResponse -> APNSChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSChannelResponse -> m APNSChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSChannelResponse -> m APNSChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSChannelResponse -> m APNSChannelResponse #

Read APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSChannelResponse :: Type -> Type #

Hashable APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: APNSChannelResponse -> () #

type Rep APNSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSChannelResponse = D1 (MetaData "APNSChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_acPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_acHasTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_acDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_acApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_acId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_acCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

apnsChannelResponse :: APNSChannelResponse Source #

Creates a value of APNSChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • acPlatform - The platform type. Will be APNS.
  • acLastModifiedDate - Last date this was updated
  • acEnabled - If the channel is enabled for sending messages.
  • acHasTokenKey - Indicates whether the channel is configured with a key for APNs token authentication. Provide a token key by setting the TokenKey attribute.
  • acDefaultAuthenticationMethod - The default authentication method used for APNs.
  • acIsArchived - Is this channel archived
  • acApplicationId - The ID of the application to which the channel applies.
  • acVersion - Version of channel
  • acId - Channel ID. Not used. Present only for backwards compatibility.
  • acCreationDate - When was this segment created
  • acLastModifiedBy - Who last updated this entry
  • acHasCredential - Indicates whether the channel is configured with APNs credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with APNs. To use APNs token authentication, set the BundleId, TeamId, TokenKey, and TokenKeyId attributes. To use certificate authentication, set the Certificate and PrivateKey attributes.

acPlatform :: Lens' APNSChannelResponse (Maybe Text) Source #

The platform type. Will be APNS.

acEnabled :: Lens' APNSChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

acHasTokenKey :: Lens' APNSChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with a key for APNs token authentication. Provide a token key by setting the TokenKey attribute.

acDefaultAuthenticationMethod :: Lens' APNSChannelResponse (Maybe Text) Source #

The default authentication method used for APNs.

acIsArchived :: Lens' APNSChannelResponse (Maybe Bool) Source #

Is this channel archived

acApplicationId :: Lens' APNSChannelResponse (Maybe Text) Source #

The ID of the application to which the channel applies.

acId :: Lens' APNSChannelResponse (Maybe Text) Source #

Channel ID. Not used. Present only for backwards compatibility.

acCreationDate :: Lens' APNSChannelResponse (Maybe Text) Source #

When was this segment created

acLastModifiedBy :: Lens' APNSChannelResponse (Maybe Text) Source #

Who last updated this entry

acHasCredential :: Lens' APNSChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with APNs credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with APNs. To use APNs token authentication, set the BundleId, TeamId, TokenKey, and TokenKeyId attributes. To use certificate authentication, set the Certificate and PrivateKey attributes.

APNSMessage

data APNSMessage Source #

APNS Message.

See: apnsMessage smart constructor.

Instances
Eq APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSMessage -> c APNSMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSMessage #

toConstr :: APNSMessage -> Constr #

dataTypeOf :: APNSMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSMessage) #

gmapT :: (forall b. Data b => b -> b) -> APNSMessage -> APNSMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSMessage -> m APNSMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSMessage -> m APNSMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSMessage -> m APNSMessage #

Read APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSMessage :: Type -> Type #

Hashable APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: APNSMessage -> () #

type Rep APNSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSMessage = D1 (MetaData "APNSMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSMessage'" PrefixI True) ((((S1 (MetaSel (Just "_amSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_amSilentPush") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_amPriority") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_amRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_amData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: S1 (MetaSel (Just "_amBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_amCategory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_amTimeToLive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))))) :*: (((S1 (MetaSel (Just "_amURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_amSound") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_amAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Action)) :*: S1 (MetaSel (Just "_amMediaURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_amPreferredAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_amBadge") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))) :*: (S1 (MetaSel (Just "_amTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_amThreadId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_amCollapseId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

apnsMessage :: APNSMessage Source #

Creates a value of APNSMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • amSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • amSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • amPriority - The message priority. Amazon Pinpoint uses this value to set the apns-priority request header when it sends the message to APNs. Accepts the following values: "5" - Low priority. Messages might be delayed, delivered in groups, and throttled. "10" - High priority. Messages are sent immediately. High priority messages must cause an alert, sound, or badge on the receiving device. The default value is "10". The equivalent values for FCM or GCM messages are "normal" and "high". Amazon Pinpoint accepts these values for APNs messages and converts them. For more information about the apns-priority parameter, see Communicating with APNs in the APNs Local and Remote Notification Programming Guide.
  • amRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • amData - The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object
  • amBody - The message body of the notification, the email body or the text message.
  • amCategory - Provide this key with a string value that represents the notification's type. This value corresponds to the value in the identifier property of one of your app's registered categories.
  • amTimeToLive - The length of time (in seconds) that APNs stores and attempts to deliver the message. If the value is 0, APNs does not store the message or attempt to deliver it more than once. Amazon Pinpoint uses this value to set the apns-expiration request header when it sends the message to APNs.
  • amURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • amSound - Include this key when you want the system to play a sound. The value of this key is the name of a sound file in your app's main bundle or in the Library/Sounds folder of your app's data container. If the sound file cannot be found, or if you specify defaultfor the value, the system plays the default alert sound.
  • amAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL
  • amMediaURL - The URL that points to a video used in the push notification.
  • amPreferredAuthenticationMethod - The preferred authentication method, either CERTIFICATE or TOKEN
  • amBadge - Include this key when you want the system to modify the badge of your app icon. If this key is not included in the dictionary, the badge is not changed. To remove the badge, set the value of this key to 0.
  • amTitle - The message title that displays above the message on the user's device.
  • amThreadId - Provide this key with a string value that represents the app-specific identifier for grouping notifications. If you provide a Notification Content app extension, you can use this value to group your notifications together.
  • amCollapseId - An ID that, if assigned to multiple messages, causes APNs to coalesce the messages into a single push notification instead of delivering each message individually. The value must not exceed 64 bytes. Amazon Pinpoint uses this value to set the apns-collapse-id request header when it sends the message to APNs.

amSubstitutions :: Lens' APNSMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

amSilentPush :: Lens' APNSMessage (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

amPriority :: Lens' APNSMessage (Maybe Text) Source #

The message priority. Amazon Pinpoint uses this value to set the apns-priority request header when it sends the message to APNs. Accepts the following values: "5" - Low priority. Messages might be delayed, delivered in groups, and throttled. "10" - High priority. Messages are sent immediately. High priority messages must cause an alert, sound, or badge on the receiving device. The default value is "10". The equivalent values for FCM or GCM messages are "normal" and "high". Amazon Pinpoint accepts these values for APNs messages and converts them. For more information about the apns-priority parameter, see Communicating with APNs in the APNs Local and Remote Notification Programming Guide.

amRawContent :: Lens' APNSMessage (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

amData :: Lens' APNSMessage (HashMap Text Text) Source #

The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object

amBody :: Lens' APNSMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

amCategory :: Lens' APNSMessage (Maybe Text) Source #

Provide this key with a string value that represents the notification's type. This value corresponds to the value in the identifier property of one of your app's registered categories.

amTimeToLive :: Lens' APNSMessage (Maybe Int) Source #

The length of time (in seconds) that APNs stores and attempts to deliver the message. If the value is 0, APNs does not store the message or attempt to deliver it more than once. Amazon Pinpoint uses this value to set the apns-expiration request header when it sends the message to APNs.

amURL :: Lens' APNSMessage (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

amSound :: Lens' APNSMessage (Maybe Text) Source #

Include this key when you want the system to play a sound. The value of this key is the name of a sound file in your app's main bundle or in the Library/Sounds folder of your app's data container. If the sound file cannot be found, or if you specify defaultfor the value, the system plays the default alert sound.

amAction :: Lens' APNSMessage (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL

amMediaURL :: Lens' APNSMessage (Maybe Text) Source #

The URL that points to a video used in the push notification.

amPreferredAuthenticationMethod :: Lens' APNSMessage (Maybe Text) Source #

The preferred authentication method, either CERTIFICATE or TOKEN

amBadge :: Lens' APNSMessage (Maybe Int) Source #

Include this key when you want the system to modify the badge of your app icon. If this key is not included in the dictionary, the badge is not changed. To remove the badge, set the value of this key to 0.

amTitle :: Lens' APNSMessage (Maybe Text) Source #

The message title that displays above the message on the user's device.

amThreadId :: Lens' APNSMessage (Maybe Text) Source #

Provide this key with a string value that represents the app-specific identifier for grouping notifications. If you provide a Notification Content app extension, you can use this value to group your notifications together.

amCollapseId :: Lens' APNSMessage (Maybe Text) Source #

An ID that, if assigned to multiple messages, causes APNs to coalesce the messages into a single push notification instead of delivering each message individually. The value must not exceed 64 bytes. Amazon Pinpoint uses this value to set the apns-collapse-id request header when it sends the message to APNs.

APNSSandboxChannelRequest

data APNSSandboxChannelRequest Source #

Apple Development Push Notification Service channel definition.

See: apnsSandboxChannelRequest smart constructor.

Instances
Eq APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSSandboxChannelRequest -> c APNSSandboxChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSSandboxChannelRequest #

toConstr :: APNSSandboxChannelRequest -> Constr #

dataTypeOf :: APNSSandboxChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSSandboxChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSSandboxChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> APNSSandboxChannelRequest -> APNSSandboxChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSSandboxChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSSandboxChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSSandboxChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSSandboxChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSSandboxChannelRequest -> m APNSSandboxChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSSandboxChannelRequest -> m APNSSandboxChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSSandboxChannelRequest -> m APNSSandboxChannelRequest #

Read APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSSandboxChannelRequest :: Type -> Type #

Hashable APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSSandboxChannelRequest = D1 (MetaData "APNSSandboxChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSSandboxChannelRequest'" PrefixI True) (((S1 (MetaSel (Just "_ascrTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascrPrivateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ascrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ascrTeamId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_ascrBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascrDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ascrCertificate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascrTokenKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

apnsSandboxChannelRequest :: APNSSandboxChannelRequest Source #

Creates a value of APNSSandboxChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ascrTokenKey :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

ascrEnabled :: Lens' APNSSandboxChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

ascrTeamId :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The team id used for APNs Tokens.

ascrBundleId :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The bundle id used for APNs Tokens.

ascrDefaultAuthenticationMethod :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The default authentication method used for APNs.

ascrCertificate :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The distribution certificate from Apple.

ascrTokenKeyId :: Lens' APNSSandboxChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

APNSSandboxChannelResponse

data APNSSandboxChannelResponse Source #

Apple Development Push Notification Service channel definition.

See: apnsSandboxChannelResponse smart constructor.

Instances
Eq APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSSandboxChannelResponse -> c APNSSandboxChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSSandboxChannelResponse #

toConstr :: APNSSandboxChannelResponse -> Constr #

dataTypeOf :: APNSSandboxChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSSandboxChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSSandboxChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> APNSSandboxChannelResponse -> APNSSandboxChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSSandboxChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSSandboxChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSSandboxChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSSandboxChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSSandboxChannelResponse -> m APNSSandboxChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSSandboxChannelResponse -> m APNSSandboxChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSSandboxChannelResponse -> m APNSSandboxChannelResponse #

Read APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSSandboxChannelResponse :: Type -> Type #

Hashable APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSSandboxChannelResponse = D1 (MetaData "APNSSandboxChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSSandboxChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_ascPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ascLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_ascHasTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_ascDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_ascApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ascVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_ascId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ascCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ascLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ascHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

apnsSandboxChannelResponse :: APNSSandboxChannelResponse Source #

Creates a value of APNSSandboxChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ascPlatform - The platform type. Will be APNS_SANDBOX.
  • ascLastModifiedDate - Last date this was updated
  • ascEnabled - If the channel is enabled for sending messages.
  • ascHasTokenKey - Indicates whether the channel is configured with a key for APNs token authentication. Provide a token key by setting the TokenKey attribute.
  • ascDefaultAuthenticationMethod - The default authentication method used for APNs.
  • ascIsArchived - Is this channel archived
  • ascApplicationId - The ID of the application to which the channel applies.
  • ascVersion - Version of channel
  • ascId - Channel ID. Not used, only for backwards compatibility.
  • ascCreationDate - When was this segment created
  • ascLastModifiedBy - Who last updated this entry
  • ascHasCredential - Indicates whether the channel is configured with APNs credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with APNs. To use APNs token authentication, set the BundleId, TeamId, TokenKey, and TokenKeyId attributes. To use certificate authentication, set the Certificate and PrivateKey attributes.

ascPlatform :: Lens' APNSSandboxChannelResponse (Maybe Text) Source #

The platform type. Will be APNS_SANDBOX.

ascEnabled :: Lens' APNSSandboxChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

ascHasTokenKey :: Lens' APNSSandboxChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with a key for APNs token authentication. Provide a token key by setting the TokenKey attribute.

ascDefaultAuthenticationMethod :: Lens' APNSSandboxChannelResponse (Maybe Text) Source #

The default authentication method used for APNs.

ascApplicationId :: Lens' APNSSandboxChannelResponse (Maybe Text) Source #

The ID of the application to which the channel applies.

ascId :: Lens' APNSSandboxChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

ascHasCredential :: Lens' APNSSandboxChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with APNs credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with APNs. To use APNs token authentication, set the BundleId, TeamId, TokenKey, and TokenKeyId attributes. To use certificate authentication, set the Certificate and PrivateKey attributes.

APNSVoipChannelRequest

data APNSVoipChannelRequest Source #

Apple VoIP Push Notification Service channel definition.

See: apnsVoipChannelRequest smart constructor.

Instances
Eq APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSVoipChannelRequest -> c APNSVoipChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSVoipChannelRequest #

toConstr :: APNSVoipChannelRequest -> Constr #

dataTypeOf :: APNSVoipChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSVoipChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSVoipChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> APNSVoipChannelRequest -> APNSVoipChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSVoipChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSVoipChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSVoipChannelRequest -> m APNSVoipChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipChannelRequest -> m APNSVoipChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipChannelRequest -> m APNSVoipChannelRequest #

Read APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSVoipChannelRequest :: Type -> Type #

Hashable APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: APNSVoipChannelRequest -> () #

type Rep APNSVoipChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipChannelRequest = D1 (MetaData "APNSVoipChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSVoipChannelRequest'" PrefixI True) (((S1 (MetaSel (Just "_avcrTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcrPrivateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_avcrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_avcrTeamId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_avcrBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcrDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_avcrCertificate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcrTokenKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

apnsVoipChannelRequest :: APNSVoipChannelRequest Source #

Creates a value of APNSVoipChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

avcrTokenKey :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

avcrPrivateKey :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The certificate private key.

avcrEnabled :: Lens' APNSVoipChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

avcrTeamId :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The team id used for APNs Tokens.

avcrBundleId :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The bundle id used for APNs Tokens.

avcrDefaultAuthenticationMethod :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The default authentication method used for APNs.

avcrCertificate :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The distribution certificate from Apple.

avcrTokenKeyId :: Lens' APNSVoipChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

APNSVoipChannelResponse

data APNSVoipChannelResponse Source #

Apple VoIP Push Notification Service channel definition.

See: apnsVoipChannelResponse smart constructor.

Instances
Eq APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSVoipChannelResponse -> c APNSVoipChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSVoipChannelResponse #

toConstr :: APNSVoipChannelResponse -> Constr #

dataTypeOf :: APNSVoipChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSVoipChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSVoipChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> APNSVoipChannelResponse -> APNSVoipChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSVoipChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSVoipChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSVoipChannelResponse -> m APNSVoipChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipChannelResponse -> m APNSVoipChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipChannelResponse -> m APNSVoipChannelResponse #

Read APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSVoipChannelResponse :: Type -> Type #

Hashable APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: APNSVoipChannelResponse -> () #

type Rep APNSVoipChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipChannelResponse = D1 (MetaData "APNSVoipChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSVoipChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_avcPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avcLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_avcHasTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_avcDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_avcApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avcVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_avcId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_avcCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avcLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avcHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

apnsVoipChannelResponse :: APNSVoipChannelResponse Source #

Creates a value of APNSVoipChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

avcPlatform :: Lens' APNSVoipChannelResponse (Maybe Text) Source #

The platform type. Will be APNS.

avcEnabled :: Lens' APNSVoipChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

avcHasTokenKey :: Lens' APNSVoipChannelResponse (Maybe Bool) Source #

If the channel is registered with a token key for authentication.

avcDefaultAuthenticationMethod :: Lens' APNSVoipChannelResponse (Maybe Text) Source #

The default authentication method used for APNs.

avcId :: Lens' APNSVoipChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

avcCreationDate :: Lens' APNSVoipChannelResponse (Maybe Text) Source #

When was this segment created

avcHasCredential :: Lens' APNSVoipChannelResponse (Maybe Bool) Source #

If the channel is registered with a credential for authentication.

APNSVoipSandboxChannelRequest

data APNSVoipSandboxChannelRequest Source #

Apple VoIP Developer Push Notification Service channel definition.

See: apnsVoipSandboxChannelRequest smart constructor.

Instances
Eq APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSVoipSandboxChannelRequest -> c APNSVoipSandboxChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSVoipSandboxChannelRequest #

toConstr :: APNSVoipSandboxChannelRequest -> Constr #

dataTypeOf :: APNSVoipSandboxChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSVoipSandboxChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSVoipSandboxChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> APNSVoipSandboxChannelRequest -> APNSVoipSandboxChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipSandboxChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipSandboxChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSVoipSandboxChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSVoipSandboxChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelRequest -> m APNSVoipSandboxChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelRequest -> m APNSVoipSandboxChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelRequest -> m APNSVoipSandboxChannelRequest #

Read APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSVoipSandboxChannelRequest :: Type -> Type #

Hashable APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipSandboxChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipSandboxChannelRequest = D1 (MetaData "APNSVoipSandboxChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSVoipSandboxChannelRequest'" PrefixI True) (((S1 (MetaSel (Just "_avscrTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscrPrivateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_avscrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_avscrTeamId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_avscrBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscrDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_avscrCertificate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscrTokenKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

apnsVoipSandboxChannelRequest :: APNSVoipSandboxChannelRequest Source #

Creates a value of APNSVoipSandboxChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

avscrTokenKey :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

avscrEnabled :: Lens' APNSVoipSandboxChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

avscrTeamId :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The team id used for APNs Tokens.

avscrBundleId :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The bundle id used for APNs Tokens.

avscrDefaultAuthenticationMethod :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The default authentication method used for APNs.

avscrCertificate :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The distribution certificate from Apple.

avscrTokenKeyId :: Lens' APNSVoipSandboxChannelRequest (Maybe Text) Source #

The token key used for APNs Tokens.

APNSVoipSandboxChannelResponse

data APNSVoipSandboxChannelResponse Source #

Apple VoIP Developer Push Notification Service channel definition.

See: apnsVoipSandboxChannelResponse smart constructor.

Instances
Eq APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> APNSVoipSandboxChannelResponse -> c APNSVoipSandboxChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c APNSVoipSandboxChannelResponse #

toConstr :: APNSVoipSandboxChannelResponse -> Constr #

dataTypeOf :: APNSVoipSandboxChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c APNSVoipSandboxChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c APNSVoipSandboxChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> APNSVoipSandboxChannelResponse -> APNSVoipSandboxChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipSandboxChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> APNSVoipSandboxChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> APNSVoipSandboxChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> APNSVoipSandboxChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelResponse -> m APNSVoipSandboxChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelResponse -> m APNSVoipSandboxChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> APNSVoipSandboxChannelResponse -> m APNSVoipSandboxChannelResponse #

Read APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep APNSVoipSandboxChannelResponse :: Type -> Type #

Hashable APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipSandboxChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep APNSVoipSandboxChannelResponse = D1 (MetaData "APNSVoipSandboxChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "APNSVoipSandboxChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_avscPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avscLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_avscHasTokenKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_avscDefaultAuthenticationMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_avscApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avscVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_avscId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_avscCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avscLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_avscHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

apnsVoipSandboxChannelResponse :: APNSVoipSandboxChannelResponse Source #

Creates a value of APNSVoipSandboxChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

avscPlatform :: Lens' APNSVoipSandboxChannelResponse (Maybe Text) Source #

The platform type. Will be APNS.

avscEnabled :: Lens' APNSVoipSandboxChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

avscHasTokenKey :: Lens' APNSVoipSandboxChannelResponse (Maybe Bool) Source #

If the channel is registered with a token key for authentication.

avscDefaultAuthenticationMethod :: Lens' APNSVoipSandboxChannelResponse (Maybe Text) Source #

The default authentication method used for APNs.

avscId :: Lens' APNSVoipSandboxChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

avscHasCredential :: Lens' APNSVoipSandboxChannelResponse (Maybe Bool) Source #

If the channel is registered with a credential for authentication.

ActivitiesResponse

data ActivitiesResponse Source #

Activities for campaign.

See: activitiesResponse smart constructor.

Instances
Eq ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ActivitiesResponse -> c ActivitiesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ActivitiesResponse #

toConstr :: ActivitiesResponse -> Constr #

dataTypeOf :: ActivitiesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ActivitiesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ActivitiesResponse) #

gmapT :: (forall b. Data b => b -> b) -> ActivitiesResponse -> ActivitiesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ActivitiesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ActivitiesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ActivitiesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ActivitiesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ActivitiesResponse -> m ActivitiesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ActivitiesResponse -> m ActivitiesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ActivitiesResponse -> m ActivitiesResponse #

Read ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ActivitiesResponse :: Type -> Type #

Hashable ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ActivitiesResponse -> () #

type Rep ActivitiesResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ActivitiesResponse = D1 (MetaData "ActivitiesResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "ActivitiesResponse'" PrefixI True) (S1 (MetaSel (Just "_aItem") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ActivityResponse]))))

activitiesResponse :: ActivitiesResponse Source #

Creates a value of ActivitiesResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • aItem - List of campaign activities

aItem :: Lens' ActivitiesResponse [ActivityResponse] Source #

List of campaign activities

ActivityResponse

data ActivityResponse Source #

Activity definition

See: activityResponse smart constructor.

Instances
Eq ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ActivityResponse -> c ActivityResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ActivityResponse #

toConstr :: ActivityResponse -> Constr #

dataTypeOf :: ActivityResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ActivityResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ActivityResponse) #

gmapT :: (forall b. Data b => b -> b) -> ActivityResponse -> ActivityResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ActivityResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ActivityResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ActivityResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ActivityResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ActivityResponse -> m ActivityResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ActivityResponse -> m ActivityResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ActivityResponse -> m ActivityResponse #

Read ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ActivityResponse :: Type -> Type #

Hashable ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ActivityResponse -> () #

type Rep ActivityResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ActivityResponse = D1 (MetaData "ActivityResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ActivityResponse'" PrefixI True) (((S1 (MetaSel (Just "_aState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aCampaignId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_aTimezonesCompletedCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_aTimezonesTotalCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_aResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_aTreatmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aSuccessfulEndpointCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_aEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_aApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aTotalEndpointCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))) :*: (S1 (MetaSel (Just "_aId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aScheduledStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

activityResponse :: ActivityResponse Source #

Creates a value of ActivityResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • aState - The state of the activity. Valid values: PENDING, INITIALIZING, RUNNING, PAUSED, CANCELLED, COMPLETED
  • aStart - The actual start time of the activity in ISO 8601 format.
  • aCampaignId - The ID of the campaign to which the activity applies.
  • aTimezonesCompletedCount - The total number of timezones completed.
  • aTimezonesTotalCount - The total number of unique timezones present in the segment.
  • aResult - Indicates whether the activity succeeded. Valid values: SUCCESS, FAIL
  • aTreatmentId - The ID of a variation of the campaign used for A/B testing.
  • aSuccessfulEndpointCount - The total number of endpoints to which the campaign successfully delivered messages.
  • aEnd - The actual time the activity was marked CANCELLED or COMPLETED. Provided in ISO 8601 format.
  • aApplicationId - The ID of the application to which the campaign applies.
  • aTotalEndpointCount - The total number of endpoints to which the campaign attempts to deliver messages.
  • aId - The unique activity ID.
  • aScheduledStart - The scheduled start time for the activity in ISO 8601 format.

aState :: Lens' ActivityResponse (Maybe Text) Source #

The state of the activity. Valid values: PENDING, INITIALIZING, RUNNING, PAUSED, CANCELLED, COMPLETED

aStart :: Lens' ActivityResponse (Maybe Text) Source #

The actual start time of the activity in ISO 8601 format.

aCampaignId :: Lens' ActivityResponse (Maybe Text) Source #

The ID of the campaign to which the activity applies.

aTimezonesCompletedCount :: Lens' ActivityResponse (Maybe Int) Source #

The total number of timezones completed.

aTimezonesTotalCount :: Lens' ActivityResponse (Maybe Int) Source #

The total number of unique timezones present in the segment.

aResult :: Lens' ActivityResponse (Maybe Text) Source #

Indicates whether the activity succeeded. Valid values: SUCCESS, FAIL

aTreatmentId :: Lens' ActivityResponse (Maybe Text) Source #

The ID of a variation of the campaign used for A/B testing.

aSuccessfulEndpointCount :: Lens' ActivityResponse (Maybe Int) Source #

The total number of endpoints to which the campaign successfully delivered messages.

aEnd :: Lens' ActivityResponse (Maybe Text) Source #

The actual time the activity was marked CANCELLED or COMPLETED. Provided in ISO 8601 format.

aApplicationId :: Lens' ActivityResponse (Maybe Text) Source #

The ID of the application to which the campaign applies.

aTotalEndpointCount :: Lens' ActivityResponse (Maybe Int) Source #

The total number of endpoints to which the campaign attempts to deliver messages.

aId :: Lens' ActivityResponse (Maybe Text) Source #

The unique activity ID.

aScheduledStart :: Lens' ActivityResponse (Maybe Text) Source #

The scheduled start time for the activity in ISO 8601 format.

AddressConfiguration

data AddressConfiguration Source #

Address configuration.

See: addressConfiguration smart constructor.

Instances
Eq AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddressConfiguration -> c AddressConfiguration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddressConfiguration #

toConstr :: AddressConfiguration -> Constr #

dataTypeOf :: AddressConfiguration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddressConfiguration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddressConfiguration) #

gmapT :: (forall b. Data b => b -> b) -> AddressConfiguration -> AddressConfiguration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddressConfiguration -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddressConfiguration -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddressConfiguration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddressConfiguration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddressConfiguration -> m AddressConfiguration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddressConfiguration -> m AddressConfiguration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddressConfiguration -> m AddressConfiguration #

Read AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep AddressConfiguration :: Type -> Type #

Hashable AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: AddressConfiguration -> () #

type Rep AddressConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep AddressConfiguration = D1 (MetaData "AddressConfiguration" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "AddressConfiguration'" PrefixI True) ((S1 (MetaSel (Just "_acSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: (S1 (MetaSel (Just "_acTitleOverride") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))))) :*: (S1 (MetaSel (Just "_acRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acBodyOverride") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acChannelType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChannelType))))))

addressConfiguration :: AddressConfiguration Source #

Creates a value of AddressConfiguration with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • acSubstitutions - A map of substitution values for the message to be merged with the DefaultMessage's substitutions. Substitutions on this map take precedence over the all other substitutions.
  • acTitleOverride - Title override. If specified will override default title if applicable.
  • acContext - A map of custom attributes to attributes to be attached to the message for this address. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.
  • acRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • acBodyOverride - Body override. If specified will override default body.
  • acChannelType - The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

acSubstitutions :: Lens' AddressConfiguration (HashMap Text [Text]) Source #

A map of substitution values for the message to be merged with the DefaultMessage's substitutions. Substitutions on this map take precedence over the all other substitutions.

acTitleOverride :: Lens' AddressConfiguration (Maybe Text) Source #

Title override. If specified will override default title if applicable.

acContext :: Lens' AddressConfiguration (HashMap Text Text) Source #

A map of custom attributes to attributes to be attached to the message for this address. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.

acRawContent :: Lens' AddressConfiguration (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

acBodyOverride :: Lens' AddressConfiguration (Maybe Text) Source #

Body override. If specified will override default body.

acChannelType :: Lens' AddressConfiguration (Maybe ChannelType) Source #

The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

ApplicationResponse

data ApplicationResponse Source #

Application Response.

See: applicationResponse smart constructor.

Instances
Eq ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ApplicationResponse -> c ApplicationResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ApplicationResponse #

toConstr :: ApplicationResponse -> Constr #

dataTypeOf :: ApplicationResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ApplicationResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ApplicationResponse) #

gmapT :: (forall b. Data b => b -> b) -> ApplicationResponse -> ApplicationResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ApplicationResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ApplicationResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ApplicationResponse -> m ApplicationResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationResponse -> m ApplicationResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationResponse -> m ApplicationResponse #

Read ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ApplicationResponse :: Type -> Type #

Hashable ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ApplicationResponse -> () #

type Rep ApplicationResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ApplicationResponse = D1 (MetaData "ApplicationResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ApplicationResponse'" PrefixI True) (S1 (MetaSel (Just "_appName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_appId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

applicationResponse :: ApplicationResponse Source #

Creates a value of ApplicationResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • appName - The display name of the application.
  • appId - The unique application ID.

appName :: Lens' ApplicationResponse (Maybe Text) Source #

The display name of the application.

appId :: Lens' ApplicationResponse (Maybe Text) Source #

The unique application ID.

ApplicationSettingsResource

data ApplicationSettingsResource Source #

Application settings.

See: applicationSettingsResource smart constructor.

Instances
Eq ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ApplicationSettingsResource -> c ApplicationSettingsResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ApplicationSettingsResource #

toConstr :: ApplicationSettingsResource -> Constr #

dataTypeOf :: ApplicationSettingsResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ApplicationSettingsResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ApplicationSettingsResource) #

gmapT :: (forall b. Data b => b -> b) -> ApplicationSettingsResource -> ApplicationSettingsResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationSettingsResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationSettingsResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> ApplicationSettingsResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ApplicationSettingsResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ApplicationSettingsResource -> m ApplicationSettingsResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationSettingsResource -> m ApplicationSettingsResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationSettingsResource -> m ApplicationSettingsResource #

Read ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ApplicationSettingsResource :: Type -> Type #

Hashable ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ApplicationSettingsResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ApplicationSettingsResource = D1 (MetaData "ApplicationSettingsResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ApplicationSettingsResource'" PrefixI True) ((S1 (MetaSel (Just "_asrLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asrLimits") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignLimits))) :*: (S1 (MetaSel (Just "_asrQuietTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe QuietTime)) :*: (S1 (MetaSel (Just "_asrApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asrCampaignHook") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignHook))))))

applicationSettingsResource :: ApplicationSettingsResource Source #

Creates a value of ApplicationSettingsResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • asrLastModifiedDate - The date that the settings were last updated in ISO 8601 format.
  • asrLimits - The default campaign limits for the app. These limits apply to each campaign for the app, unless the campaign overrides the default with limits of its own.
  • asrQuietTime - The default quiet time for the app. Each campaign for this app sends no messages during this time unless the campaign overrides the default with a quiet time of its own.
  • asrApplicationId - The unique ID for the application.
  • asrCampaignHook - Default campaign hook.

asrLastModifiedDate :: Lens' ApplicationSettingsResource (Maybe Text) Source #

The date that the settings were last updated in ISO 8601 format.

asrLimits :: Lens' ApplicationSettingsResource (Maybe CampaignLimits) Source #

The default campaign limits for the app. These limits apply to each campaign for the app, unless the campaign overrides the default with limits of its own.

asrQuietTime :: Lens' ApplicationSettingsResource (Maybe QuietTime) Source #

The default quiet time for the app. Each campaign for this app sends no messages during this time unless the campaign overrides the default with a quiet time of its own.

asrApplicationId :: Lens' ApplicationSettingsResource (Maybe Text) Source #

The unique ID for the application.

ApplicationsResponse

data ApplicationsResponse Source #

Get Applications Result.

See: applicationsResponse smart constructor.

Instances
Eq ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ApplicationsResponse -> c ApplicationsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ApplicationsResponse #

toConstr :: ApplicationsResponse -> Constr #

dataTypeOf :: ApplicationsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ApplicationsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ApplicationsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ApplicationsResponse -> ApplicationsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ApplicationsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ApplicationsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ApplicationsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ApplicationsResponse -> m ApplicationsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationsResponse -> m ApplicationsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ApplicationsResponse -> m ApplicationsResponse #

Read ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ApplicationsResponse :: Type -> Type #

Hashable ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ApplicationsResponse -> () #

type Rep ApplicationsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ApplicationsResponse = D1 (MetaData "ApplicationsResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ApplicationsResponse'" PrefixI True) (S1 (MetaSel (Just "_appNextToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_appItem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ApplicationResponse]))))

applicationsResponse :: ApplicationsResponse Source #

Creates a value of ApplicationsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • appNextToken - The string that you use in a subsequent request to get the next page of results in a paginated response.
  • appItem - List of applications returned in this page.

appNextToken :: Lens' ApplicationsResponse (Maybe Text) Source #

The string that you use in a subsequent request to get the next page of results in a paginated response.

appItem :: Lens' ApplicationsResponse [ApplicationResponse] Source #

List of applications returned in this page.

AttributeDimension

data AttributeDimension Source #

Custom attibute dimension

See: attributeDimension smart constructor.

Instances
Eq AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AttributeDimension -> c AttributeDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AttributeDimension #

toConstr :: AttributeDimension -> Constr #

dataTypeOf :: AttributeDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AttributeDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AttributeDimension) #

gmapT :: (forall b. Data b => b -> b) -> AttributeDimension -> AttributeDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AttributeDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AttributeDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> AttributeDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AttributeDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AttributeDimension -> m AttributeDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AttributeDimension -> m AttributeDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AttributeDimension -> m AttributeDimension #

Read AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep AttributeDimension :: Type -> Type #

Hashable AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: AttributeDimension -> () #

type Rep AttributeDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep AttributeDimension = D1 (MetaData "AttributeDimension" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "AttributeDimension'" PrefixI True) (S1 (MetaSel (Just "_adValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_adAttributeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AttributeType))))

attributeDimension :: AttributeDimension Source #

Creates a value of AttributeDimension with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • adValues - The criteria values for the segment dimension. Endpoints with matching attribute values are included or excluded from the segment, depending on the setting for Type.
  • adAttributeType - The type of dimension: INCLUSIVE - Endpoints that match the criteria are included in the segment. EXCLUSIVE - Endpoints that match the criteria are excluded from the segment.

adValues :: Lens' AttributeDimension [Text] Source #

The criteria values for the segment dimension. Endpoints with matching attribute values are included or excluded from the segment, depending on the setting for Type.

adAttributeType :: Lens' AttributeDimension (Maybe AttributeType) Source #

The type of dimension: INCLUSIVE - Endpoints that match the criteria are included in the segment. EXCLUSIVE - Endpoints that match the criteria are excluded from the segment.

BaiduChannelRequest

data BaiduChannelRequest Source #

Baidu Cloud Push credentials

See: baiduChannelRequest smart constructor.

Instances
Eq BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BaiduChannelRequest -> c BaiduChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BaiduChannelRequest #

toConstr :: BaiduChannelRequest -> Constr #

dataTypeOf :: BaiduChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BaiduChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BaiduChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> BaiduChannelRequest -> BaiduChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BaiduChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BaiduChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BaiduChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BaiduChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BaiduChannelRequest -> m BaiduChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduChannelRequest -> m BaiduChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduChannelRequest -> m BaiduChannelRequest #

Read BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep BaiduChannelRequest :: Type -> Type #

Hashable BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: BaiduChannelRequest -> () #

type Rep BaiduChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep BaiduChannelRequest = D1 (MetaData "BaiduChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "BaiduChannelRequest'" PrefixI True) (S1 (MetaSel (Just "_bcrAPIKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bcrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bcrSecretKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

baiduChannelRequest :: BaiduChannelRequest Source #

Creates a value of BaiduChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bcrAPIKey - Platform credential API key from Baidu.
  • bcrEnabled - If the channel is enabled for sending messages.
  • bcrSecretKey - Platform credential Secret key from Baidu.

bcrAPIKey :: Lens' BaiduChannelRequest (Maybe Text) Source #

Platform credential API key from Baidu.

bcrEnabled :: Lens' BaiduChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

bcrSecretKey :: Lens' BaiduChannelRequest (Maybe Text) Source #

Platform credential Secret key from Baidu.

BaiduChannelResponse

data BaiduChannelResponse Source #

Baidu Cloud Messaging channel definition

See: baiduChannelResponse smart constructor.

Instances
Eq BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BaiduChannelResponse -> c BaiduChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BaiduChannelResponse #

toConstr :: BaiduChannelResponse -> Constr #

dataTypeOf :: BaiduChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BaiduChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BaiduChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> BaiduChannelResponse -> BaiduChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BaiduChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BaiduChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BaiduChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BaiduChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BaiduChannelResponse -> m BaiduChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduChannelResponse -> m BaiduChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduChannelResponse -> m BaiduChannelResponse #

Read BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep BaiduChannelResponse :: Type -> Type #

Hashable BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: BaiduChannelResponse -> () #

type Rep BaiduChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

baiduChannelResponse :: BaiduChannelResponse Source #

Creates a value of BaiduChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bcPlatform - The platform type. Will be BAIDU
  • bcLastModifiedDate - Last date this was updated
  • bcEnabled - If the channel is enabled for sending messages.
  • bcCredential - The Baidu API key from Baidu.
  • bcIsArchived - Is this channel archived
  • bcApplicationId - Application id
  • bcVersion - Version of channel
  • bcId - Channel ID. Not used, only for backwards compatibility.
  • bcCreationDate - When was this segment created
  • bcLastModifiedBy - Who made the last change
  • bcHasCredential - Indicates whether the channel is configured with Baidu Cloud Push credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with Baidu Cloud Push. Provide your credentials by setting the ApiKey and SecretKey attributes.

bcPlatform :: Lens' BaiduChannelResponse (Maybe Text) Source #

The platform type. Will be BAIDU

bcEnabled :: Lens' BaiduChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

bcCredential :: Lens' BaiduChannelResponse (Maybe Text) Source #

The Baidu API key from Baidu.

bcId :: Lens' BaiduChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

bcCreationDate :: Lens' BaiduChannelResponse (Maybe Text) Source #

When was this segment created

bcHasCredential :: Lens' BaiduChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with Baidu Cloud Push credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with Baidu Cloud Push. Provide your credentials by setting the ApiKey and SecretKey attributes.

BaiduMessage

data BaiduMessage Source #

Baidu Message.

See: baiduMessage smart constructor.

Instances
Eq BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BaiduMessage -> c BaiduMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BaiduMessage #

toConstr :: BaiduMessage -> Constr #

dataTypeOf :: BaiduMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BaiduMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BaiduMessage) #

gmapT :: (forall b. Data b => b -> b) -> BaiduMessage -> BaiduMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BaiduMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BaiduMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> BaiduMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BaiduMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BaiduMessage -> m BaiduMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduMessage -> m BaiduMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BaiduMessage -> m BaiduMessage #

Read BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep BaiduMessage :: Type -> Type #

Hashable BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: BaiduMessage -> () #

type Rep BaiduMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep BaiduMessage = D1 (MetaData "BaiduMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "BaiduMessage'" PrefixI True) (((S1 (MetaSel (Just "_bmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: (S1 (MetaSel (Just "_bmSilentPush") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bmImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_bmRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bmData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: S1 (MetaSel (Just "_bmSmallImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_bmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bmURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bmSound") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_bmAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Action)) :*: S1 (MetaSel (Just "_bmImageURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_bmTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bmIconReference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

baiduMessage :: BaiduMessage Source #

Creates a value of BaiduMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • bmSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • bmImageIconURL - The URL that points to an image used as the large icon to the notification content view.
  • bmRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • bmData - The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object
  • bmSmallImageIconURL - The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view
  • bmBody - The message body of the notification, the email body or the text message.
  • bmURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • bmSound - Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/
  • bmAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL
  • bmImageURL - The URL that points to an image used in the push notification.
  • bmTitle - The message title that displays above the message on the user's device.
  • bmIconReference - The icon image name of the asset saved in your application.

bmSubstitutions :: Lens' BaiduMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

bmSilentPush :: Lens' BaiduMessage (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

bmImageIconURL :: Lens' BaiduMessage (Maybe Text) Source #

The URL that points to an image used as the large icon to the notification content view.

bmRawContent :: Lens' BaiduMessage (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

bmData :: Lens' BaiduMessage (HashMap Text Text) Source #

The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object

bmSmallImageIconURL :: Lens' BaiduMessage (Maybe Text) Source #

The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view

bmBody :: Lens' BaiduMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

bmURL :: Lens' BaiduMessage (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

bmSound :: Lens' BaiduMessage (Maybe Text) Source #

Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/

bmAction :: Lens' BaiduMessage (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL

bmImageURL :: Lens' BaiduMessage (Maybe Text) Source #

The URL that points to an image used in the push notification.

bmTitle :: Lens' BaiduMessage (Maybe Text) Source #

The message title that displays above the message on the user's device.

bmIconReference :: Lens' BaiduMessage (Maybe Text) Source #

The icon image name of the asset saved in your application.

CampaignEmailMessage

data CampaignEmailMessage Source #

The email message configuration.

See: campaignEmailMessage smart constructor.

Instances
Eq CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignEmailMessage -> c CampaignEmailMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignEmailMessage #

toConstr :: CampaignEmailMessage -> Constr #

dataTypeOf :: CampaignEmailMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignEmailMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignEmailMessage) #

gmapT :: (forall b. Data b => b -> b) -> CampaignEmailMessage -> CampaignEmailMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignEmailMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignEmailMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignEmailMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignEmailMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignEmailMessage -> m CampaignEmailMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignEmailMessage -> m CampaignEmailMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignEmailMessage -> m CampaignEmailMessage #

Read CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignEmailMessage :: Type -> Type #

Hashable CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignEmailMessage -> () #

type Rep CampaignEmailMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignEmailMessage = D1 (MetaData "CampaignEmailMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignEmailMessage'" PrefixI True) ((S1 (MetaSel (Just "_cemBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cemFromAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_cemHTMLBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cemTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

campaignEmailMessage :: CampaignEmailMessage Source #

Creates a value of CampaignEmailMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • cemBody - The email text body.
  • cemFromAddress - The email address used to send the email from. Defaults to use FromAddress specified in the Email Channel.
  • cemHTMLBody - The email html body.
  • cemTitle - The email title (Or subject).

cemFromAddress :: Lens' CampaignEmailMessage (Maybe Text) Source #

The email address used to send the email from. Defaults to use FromAddress specified in the Email Channel.

cemTitle :: Lens' CampaignEmailMessage (Maybe Text) Source #

The email title (Or subject).

CampaignHook

data CampaignHook Source #

See: campaignHook smart constructor.

Instances
Eq CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignHook -> c CampaignHook #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignHook #

toConstr :: CampaignHook -> Constr #

dataTypeOf :: CampaignHook -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignHook) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignHook) #

gmapT :: (forall b. Data b => b -> b) -> CampaignHook -> CampaignHook #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignHook -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignHook -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignHook -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignHook -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignHook -> m CampaignHook #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignHook -> m CampaignHook #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignHook -> m CampaignHook #

Read CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignHook :: Type -> Type #

Hashable CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignHook -> () #

type Rep CampaignHook Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignHook = D1 (MetaData "CampaignHook" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignHook'" PrefixI True) (S1 (MetaSel (Just "_chLambdaFunctionName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_chMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Mode)) :*: S1 (MetaSel (Just "_chWebURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

campaignHook :: CampaignHook Source #

Creates a value of CampaignHook with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • chLambdaFunctionName - Lambda function name or arn to be called for delivery
  • chMode - What mode Lambda should be invoked in.
  • chWebURL - Web URL to call for hook. If the URL has authentication specified it will be added as authentication to the request

chLambdaFunctionName :: Lens' CampaignHook (Maybe Text) Source #

Lambda function name or arn to be called for delivery

chMode :: Lens' CampaignHook (Maybe Mode) Source #

What mode Lambda should be invoked in.

chWebURL :: Lens' CampaignHook (Maybe Text) Source #

Web URL to call for hook. If the URL has authentication specified it will be added as authentication to the request

CampaignLimits

data CampaignLimits Source #

Campaign Limits are used to limit the number of messages that can be sent to a user.

See: campaignLimits smart constructor.

Instances
Eq CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignLimits -> c CampaignLimits #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignLimits #

toConstr :: CampaignLimits -> Constr #

dataTypeOf :: CampaignLimits -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignLimits) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignLimits) #

gmapT :: (forall b. Data b => b -> b) -> CampaignLimits -> CampaignLimits #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignLimits -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignLimits -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignLimits -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignLimits -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignLimits -> m CampaignLimits #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignLimits -> m CampaignLimits #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignLimits -> m CampaignLimits #

Read CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignLimits :: Type -> Type #

Hashable CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignLimits -> () #

type Rep CampaignLimits Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignLimits = D1 (MetaData "CampaignLimits" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignLimits'" PrefixI True) ((S1 (MetaSel (Just "_clMessagesPerSecond") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_clDaily") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))) :*: (S1 (MetaSel (Just "_clTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_clMaximumDuration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))

campaignLimits :: CampaignLimits Source #

Creates a value of CampaignLimits with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • clMessagesPerSecond - The number of messages that the campaign can send per second. The minimum value is 50, and the maximum is 20000.
  • clDaily - The maximum number of messages that the campaign can send daily.
  • clTotal - The maximum total number of messages that the campaign can send.
  • clMaximumDuration - The length of time (in seconds) that the campaign can run before it ends and message deliveries stop. This duration begins at the scheduled start time for the campaign. The minimum value is 60.

clMessagesPerSecond :: Lens' CampaignLimits (Maybe Int) Source #

The number of messages that the campaign can send per second. The minimum value is 50, and the maximum is 20000.

clDaily :: Lens' CampaignLimits (Maybe Int) Source #

The maximum number of messages that the campaign can send daily.

clTotal :: Lens' CampaignLimits (Maybe Int) Source #

The maximum total number of messages that the campaign can send.

clMaximumDuration :: Lens' CampaignLimits (Maybe Int) Source #

The length of time (in seconds) that the campaign can run before it ends and message deliveries stop. This duration begins at the scheduled start time for the campaign. The minimum value is 60.

CampaignResponse

data CampaignResponse Source #

Campaign definition

See: campaignResponse smart constructor.

Instances
Eq CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignResponse -> c CampaignResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignResponse #

toConstr :: CampaignResponse -> Constr #

dataTypeOf :: CampaignResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignResponse) #

gmapT :: (forall b. Data b => b -> b) -> CampaignResponse -> CampaignResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignResponse -> m CampaignResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignResponse -> m CampaignResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignResponse -> m CampaignResponse #

Read CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignResponse :: Type -> Type #

Hashable CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignResponse -> () #

type Rep CampaignResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignResponse = D1 (MetaData "CampaignResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignResponse'" PrefixI True) ((((S1 (MetaSel (Just "_cState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignState)) :*: S1 (MetaSel (Just "_cLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_cSchedule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Schedule)) :*: (S1 (MetaSel (Just "_cHook") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignHook)) :*: S1 (MetaSel (Just "_cTreatmentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_cLimits") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignLimits)) :*: S1 (MetaSel (Just "_cIsPaused") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_cDefaultState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignState)) :*: (S1 (MetaSel (Just "_cApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_cVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_cHoldoutPercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))) :*: (S1 (MetaSel (Just "_cTreatmentDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_cMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageConfiguration)) :*: S1 (MetaSel (Just "_cDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_cSegmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cAdditionalTreatments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [TreatmentResource])) :*: S1 (MetaSel (Just "_cSegmentVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))))))))

campaignResponse :: CampaignResponse Source #

Creates a value of CampaignResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • cState - The campaign status. An A/B test campaign will have a status of COMPLETED only when all treatments have a status of COMPLETED.
  • cLastModifiedDate - The date the campaign was last updated in ISO 8601 format.
  • cSchedule - The campaign schedule.
  • cHook - Campaign hook information.
  • cTreatmentName - The custom name of a variation of the campaign used for A/B testing.
  • cLimits - The campaign limits settings.
  • cIsPaused - Indicates whether the campaign is paused. A paused campaign does not send messages unless you resume it by setting IsPaused to false.
  • cDefaultState - The status of the campaign's default treatment. Only present for A/B test campaigns.
  • cApplicationId - The ID of the application to which the campaign applies.
  • cName - The custom name of the campaign.
  • cVersion - The campaign version number.
  • cHoldoutPercent - The allocated percentage of end users who will not receive messages from this campaign.
  • cTreatmentDescription - A custom description for the treatment.
  • cId - The unique campaign ID.
  • cCreationDate - The date the campaign was created in ISO 8601 format.
  • cMessageConfiguration - The message configuration settings.
  • cDescription - A description of the campaign.
  • cSegmentId - The ID of the segment to which the campaign sends messages.
  • cAdditionalTreatments - Treatments that are defined in addition to the default treatment.
  • cSegmentVersion - The version of the segment to which the campaign sends messages.

cState :: Lens' CampaignResponse (Maybe CampaignState) Source #

The campaign status. An A/B test campaign will have a status of COMPLETED only when all treatments have a status of COMPLETED.

cLastModifiedDate :: Lens' CampaignResponse (Maybe Text) Source #

The date the campaign was last updated in ISO 8601 format.

cHook :: Lens' CampaignResponse (Maybe CampaignHook) Source #

Campaign hook information.

cTreatmentName :: Lens' CampaignResponse (Maybe Text) Source #

The custom name of a variation of the campaign used for A/B testing.

cLimits :: Lens' CampaignResponse (Maybe CampaignLimits) Source #

The campaign limits settings.

cIsPaused :: Lens' CampaignResponse (Maybe Bool) Source #

Indicates whether the campaign is paused. A paused campaign does not send messages unless you resume it by setting IsPaused to false.

cDefaultState :: Lens' CampaignResponse (Maybe CampaignState) Source #

The status of the campaign's default treatment. Only present for A/B test campaigns.

cApplicationId :: Lens' CampaignResponse (Maybe Text) Source #

The ID of the application to which the campaign applies.

cName :: Lens' CampaignResponse (Maybe Text) Source #

The custom name of the campaign.

cVersion :: Lens' CampaignResponse (Maybe Int) Source #

The campaign version number.

cHoldoutPercent :: Lens' CampaignResponse (Maybe Int) Source #

The allocated percentage of end users who will not receive messages from this campaign.

cTreatmentDescription :: Lens' CampaignResponse (Maybe Text) Source #

A custom description for the treatment.

cId :: Lens' CampaignResponse (Maybe Text) Source #

The unique campaign ID.

cCreationDate :: Lens' CampaignResponse (Maybe Text) Source #

The date the campaign was created in ISO 8601 format.

cDescription :: Lens' CampaignResponse (Maybe Text) Source #

A description of the campaign.

cSegmentId :: Lens' CampaignResponse (Maybe Text) Source #

The ID of the segment to which the campaign sends messages.

cAdditionalTreatments :: Lens' CampaignResponse [TreatmentResource] Source #

Treatments that are defined in addition to the default treatment.

cSegmentVersion :: Lens' CampaignResponse (Maybe Int) Source #

The version of the segment to which the campaign sends messages.

CampaignSmsMessage

data CampaignSmsMessage Source #

SMS message configuration.

See: campaignSmsMessage smart constructor.

Instances
Eq CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignSmsMessage -> c CampaignSmsMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignSmsMessage #

toConstr :: CampaignSmsMessage -> Constr #

dataTypeOf :: CampaignSmsMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignSmsMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignSmsMessage) #

gmapT :: (forall b. Data b => b -> b) -> CampaignSmsMessage -> CampaignSmsMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignSmsMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignSmsMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignSmsMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignSmsMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignSmsMessage -> m CampaignSmsMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignSmsMessage -> m CampaignSmsMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignSmsMessage -> m CampaignSmsMessage #

Read CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignSmsMessage :: Type -> Type #

Hashable CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignSmsMessage -> () #

type Rep CampaignSmsMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignSmsMessage = D1 (MetaData "CampaignSmsMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignSmsMessage'" PrefixI True) (S1 (MetaSel (Just "_csmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_csmMessageType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageType)) :*: S1 (MetaSel (Just "_csmSenderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

campaignSmsMessage :: CampaignSmsMessage Source #

Creates a value of CampaignSmsMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

csmMessageType :: Lens' CampaignSmsMessage (Maybe MessageType) Source #

Is this is a transactional SMS message, otherwise a promotional message.

csmSenderId :: Lens' CampaignSmsMessage (Maybe Text) Source #

Sender ID of sent message.

CampaignState

data CampaignState Source #

State of the Campaign

See: campaignState smart constructor.

Instances
Eq CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignState -> c CampaignState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignState #

toConstr :: CampaignState -> Constr #

dataTypeOf :: CampaignState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignState) #

gmapT :: (forall b. Data b => b -> b) -> CampaignState -> CampaignState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignState -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignState -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignState -> m CampaignState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignState -> m CampaignState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignState -> m CampaignState #

Read CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignState :: Type -> Type #

Hashable CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignState -> () #

type Rep CampaignState Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignState = D1 (MetaData "CampaignState" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "CampaignState'" PrefixI True) (S1 (MetaSel (Just "_csCampaignStatus") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe CampaignStatus))))

campaignState :: CampaignState Source #

Creates a value of CampaignState with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • csCampaignStatus - The status of the campaign, or the status of a treatment that belongs to an A/B test campaign. Valid values: SCHEDULED, EXECUTING, PENDING_NEXT_RUN, COMPLETED, PAUSED

csCampaignStatus :: Lens' CampaignState (Maybe CampaignStatus) Source #

The status of the campaign, or the status of a treatment that belongs to an A/B test campaign. Valid values: SCHEDULED, EXECUTING, PENDING_NEXT_RUN, COMPLETED, PAUSED

CampaignsResponse

data CampaignsResponse Source #

List of available campaigns.

See: campaignsResponse smart constructor.

Instances
Eq CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CampaignsResponse -> c CampaignsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CampaignsResponse #

toConstr :: CampaignsResponse -> Constr #

dataTypeOf :: CampaignsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CampaignsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CampaignsResponse) #

gmapT :: (forall b. Data b => b -> b) -> CampaignsResponse -> CampaignsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CampaignsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CampaignsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> CampaignsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CampaignsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CampaignsResponse -> m CampaignsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignsResponse -> m CampaignsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CampaignsResponse -> m CampaignsResponse #

Read CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CampaignsResponse :: Type -> Type #

Hashable CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: CampaignsResponse -> () #

type Rep CampaignsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CampaignsResponse = D1 (MetaData "CampaignsResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "CampaignsResponse'" PrefixI True) (S1 (MetaSel (Just "_cNextToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cItem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CampaignResponse]))))

campaignsResponse :: CampaignsResponse Source #

Creates a value of CampaignsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • cNextToken - The string that you use in a subsequent request to get the next page of results in a paginated response.
  • cItem - A list of campaigns.

cNextToken :: Lens' CampaignsResponse (Maybe Text) Source #

The string that you use in a subsequent request to get the next page of results in a paginated response.

CreateApplicationRequest

data CreateApplicationRequest Source #

Application Request.

See: createApplicationRequest smart constructor.

Instances
Eq CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CreateApplicationRequest -> c CreateApplicationRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CreateApplicationRequest #

toConstr :: CreateApplicationRequest -> Constr #

dataTypeOf :: CreateApplicationRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CreateApplicationRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CreateApplicationRequest) #

gmapT :: (forall b. Data b => b -> b) -> CreateApplicationRequest -> CreateApplicationRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CreateApplicationRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CreateApplicationRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> CreateApplicationRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CreateApplicationRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CreateApplicationRequest -> m CreateApplicationRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateApplicationRequest -> m CreateApplicationRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateApplicationRequest -> m CreateApplicationRequest #

Read CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep CreateApplicationRequest :: Type -> Type #

Hashable CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CreateApplicationRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep CreateApplicationRequest = D1 (MetaData "CreateApplicationRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "CreateApplicationRequest'" PrefixI True) (S1 (MetaSel (Just "_carName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

createApplicationRequest :: CreateApplicationRequest Source #

Creates a value of CreateApplicationRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • carName - The display name of the application. Used in the Amazon Pinpoint console.

carName :: Lens' CreateApplicationRequest (Maybe Text) Source #

The display name of the application. Used in the Amazon Pinpoint console.

DefaultMessage

data DefaultMessage Source #

Default Message across push notification, email, and sms.

See: defaultMessage smart constructor.

Instances
Eq DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DefaultMessage -> c DefaultMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DefaultMessage #

toConstr :: DefaultMessage -> Constr #

dataTypeOf :: DefaultMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DefaultMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DefaultMessage) #

gmapT :: (forall b. Data b => b -> b) -> DefaultMessage -> DefaultMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DefaultMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DefaultMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> DefaultMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DefaultMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DefaultMessage -> m DefaultMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DefaultMessage -> m DefaultMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DefaultMessage -> m DefaultMessage #

Read DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep DefaultMessage :: Type -> Type #

Hashable DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: DefaultMessage -> () #

type Rep DefaultMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep DefaultMessage = D1 (MetaData "DefaultMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "DefaultMessage'" PrefixI True) (S1 (MetaSel (Just "_dmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_dmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

defaultMessage :: DefaultMessage Source #

Creates a value of DefaultMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • dmBody - The message body of the notification, the email body or the text message.

dmSubstitutions :: Lens' DefaultMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

dmBody :: Lens' DefaultMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

DefaultPushNotificationMessage

data DefaultPushNotificationMessage Source #

Default Push Notification Message.

See: defaultPushNotificationMessage smart constructor.

Instances
Eq DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DefaultPushNotificationMessage -> c DefaultPushNotificationMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DefaultPushNotificationMessage #

toConstr :: DefaultPushNotificationMessage -> Constr #

dataTypeOf :: DefaultPushNotificationMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DefaultPushNotificationMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DefaultPushNotificationMessage) #

gmapT :: (forall b. Data b => b -> b) -> DefaultPushNotificationMessage -> DefaultPushNotificationMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DefaultPushNotificationMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DefaultPushNotificationMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> DefaultPushNotificationMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DefaultPushNotificationMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DefaultPushNotificationMessage -> m DefaultPushNotificationMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DefaultPushNotificationMessage -> m DefaultPushNotificationMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DefaultPushNotificationMessage -> m DefaultPushNotificationMessage #

Read DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep DefaultPushNotificationMessage :: Type -> Type #

Hashable DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep DefaultPushNotificationMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep DefaultPushNotificationMessage = D1 (MetaData "DefaultPushNotificationMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "DefaultPushNotificationMessage'" PrefixI True) ((S1 (MetaSel (Just "_dpnmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: (S1 (MetaSel (Just "_dpnmSilentPush") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dpnmData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))))) :*: ((S1 (MetaSel (Just "_dpnmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dpnmURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_dpnmAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Action)) :*: S1 (MetaSel (Just "_dpnmTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

defaultPushNotificationMessage :: DefaultPushNotificationMessage Source #

Creates a value of DefaultPushNotificationMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dpnmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • dpnmSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • dpnmData - The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object
  • dpnmBody - The message body of the notification, the email body or the text message.
  • dpnmURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • dpnmAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL
  • dpnmTitle - The message title that displays above the message on the user's device.

dpnmSubstitutions :: Lens' DefaultPushNotificationMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

dpnmSilentPush :: Lens' DefaultPushNotificationMessage (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

dpnmData :: Lens' DefaultPushNotificationMessage (HashMap Text Text) Source #

The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object

dpnmBody :: Lens' DefaultPushNotificationMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

dpnmURL :: Lens' DefaultPushNotificationMessage (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

dpnmAction :: Lens' DefaultPushNotificationMessage (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL

dpnmTitle :: Lens' DefaultPushNotificationMessage (Maybe Text) Source #

The message title that displays above the message on the user's device.

DirectMessageConfiguration

data DirectMessageConfiguration Source #

The message configuration.

See: directMessageConfiguration smart constructor.

Instances
Eq DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DirectMessageConfiguration -> c DirectMessageConfiguration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DirectMessageConfiguration #

toConstr :: DirectMessageConfiguration -> Constr #

dataTypeOf :: DirectMessageConfiguration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DirectMessageConfiguration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DirectMessageConfiguration) #

gmapT :: (forall b. Data b => b -> b) -> DirectMessageConfiguration -> DirectMessageConfiguration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DirectMessageConfiguration -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DirectMessageConfiguration -> r #

gmapQ :: (forall d. Data d => d -> u) -> DirectMessageConfiguration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DirectMessageConfiguration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DirectMessageConfiguration -> m DirectMessageConfiguration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DirectMessageConfiguration -> m DirectMessageConfiguration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DirectMessageConfiguration -> m DirectMessageConfiguration #

Read DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep DirectMessageConfiguration :: Type -> Type #

Hashable DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep DirectMessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep DirectMessageConfiguration = D1 (MetaData "DirectMessageConfiguration" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "DirectMessageConfiguration'" PrefixI True) ((S1 (MetaSel (Just "_dmcAPNSMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe APNSMessage)) :*: (S1 (MetaSel (Just "_dmcGCMMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GCMMessage)) :*: S1 (MetaSel (Just "_dmcDefaultMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DefaultMessage)))) :*: ((S1 (MetaSel (Just "_dmcADMMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ADMMessage)) :*: S1 (MetaSel (Just "_dmcSMSMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SMSMessage))) :*: (S1 (MetaSel (Just "_dmcBaiduMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BaiduMessage)) :*: S1 (MetaSel (Just "_dmcDefaultPushNotificationMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DefaultPushNotificationMessage))))))

directMessageConfiguration :: DirectMessageConfiguration Source #

Creates a value of DirectMessageConfiguration with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dmcAPNSMessage - The message to APNS channels. Overrides the default push notification message.
  • dmcGCMMessage - The message to GCM channels. Overrides the default push notification message.
  • dmcDefaultMessage - The default message for all channels.
  • dmcADMMessage - The message to ADM channels. Overrides the default push notification message.
  • dmcSMSMessage - The message to SMS channels. Overrides the default message.
  • dmcBaiduMessage - The message to Baidu GCM channels. Overrides the default push notification message.
  • dmcDefaultPushNotificationMessage - The default push notification message for all push channels.

dmcAPNSMessage :: Lens' DirectMessageConfiguration (Maybe APNSMessage) Source #

The message to APNS channels. Overrides the default push notification message.

dmcGCMMessage :: Lens' DirectMessageConfiguration (Maybe GCMMessage) Source #

The message to GCM channels. Overrides the default push notification message.

dmcADMMessage :: Lens' DirectMessageConfiguration (Maybe ADMMessage) Source #

The message to ADM channels. Overrides the default push notification message.

dmcSMSMessage :: Lens' DirectMessageConfiguration (Maybe SMSMessage) Source #

The message to SMS channels. Overrides the default message.

dmcBaiduMessage :: Lens' DirectMessageConfiguration (Maybe BaiduMessage) Source #

The message to Baidu GCM channels. Overrides the default push notification message.

dmcDefaultPushNotificationMessage :: Lens' DirectMessageConfiguration (Maybe DefaultPushNotificationMessage) Source #

The default push notification message for all push channels.

EmailChannelRequest

data EmailChannelRequest Source #

Email Channel Request

See: emailChannelRequest smart constructor.

Instances
Eq EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EmailChannelRequest -> c EmailChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EmailChannelRequest #

toConstr :: EmailChannelRequest -> Constr #

dataTypeOf :: EmailChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EmailChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EmailChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> EmailChannelRequest -> EmailChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EmailChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EmailChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> EmailChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EmailChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EmailChannelRequest -> m EmailChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EmailChannelRequest -> m EmailChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EmailChannelRequest -> m EmailChannelRequest #

Read EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EmailChannelRequest :: Type -> Type #

Hashable EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EmailChannelRequest -> () #

type Rep EmailChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EmailChannelRequest = D1 (MetaData "EmailChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EmailChannelRequest'" PrefixI True) ((S1 (MetaSel (Just "_ecrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ecrFromAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ecrIdentity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ecrRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

emailChannelRequest :: EmailChannelRequest Source #

Creates a value of EmailChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ecrEnabled - If the channel is enabled for sending messages.
  • ecrFromAddress - The email address used to send emails from.
  • ecrIdentity - The ARN of an identity verified with SES.
  • ecrRoleARN - The ARN of an IAM Role used to submit events to Mobile Analytics' event ingestion service

ecrEnabled :: Lens' EmailChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

ecrFromAddress :: Lens' EmailChannelRequest (Maybe Text) Source #

The email address used to send emails from.

ecrIdentity :: Lens' EmailChannelRequest (Maybe Text) Source #

The ARN of an identity verified with SES.

ecrRoleARN :: Lens' EmailChannelRequest (Maybe Text) Source #

The ARN of an IAM Role used to submit events to Mobile Analytics' event ingestion service

EmailChannelResponse

data EmailChannelResponse Source #

Email Channel Response.

See: emailChannelResponse smart constructor.

Instances
Eq EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EmailChannelResponse -> c EmailChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EmailChannelResponse #

toConstr :: EmailChannelResponse -> Constr #

dataTypeOf :: EmailChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EmailChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EmailChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> EmailChannelResponse -> EmailChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EmailChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EmailChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> EmailChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EmailChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EmailChannelResponse -> m EmailChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EmailChannelResponse -> m EmailChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EmailChannelResponse -> m EmailChannelResponse #

Read EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EmailChannelResponse :: Type -> Type #

Hashable EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EmailChannelResponse -> () #

type Rep EmailChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EmailChannelResponse = D1 (MetaData "EmailChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EmailChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_ecPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ecLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ecEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_ecFromAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ecIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ecApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_ecVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_ecId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ecCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_ecLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ecIdentity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ecHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ecRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

emailChannelResponse :: EmailChannelResponse Source #

Creates a value of EmailChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ecEnabled :: Lens' EmailChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

ecFromAddress :: Lens' EmailChannelResponse (Maybe Text) Source #

The email address used to send emails from.

ecApplicationId :: Lens' EmailChannelResponse (Maybe Text) Source #

The unique ID of the application to which the email channel belongs.

ecId :: Lens' EmailChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

ecCreationDate :: Lens' EmailChannelResponse (Maybe Text) Source #

The date that the settings were last updated in ISO 8601 format.

ecLastModifiedBy :: Lens' EmailChannelResponse (Maybe Text) Source #

Who last updated this entry

ecIdentity :: Lens' EmailChannelResponse (Maybe Text) Source #

The ARN of an identity verified with SES.

ecHasCredential :: Lens' EmailChannelResponse (Maybe Bool) Source #

If the channel is registered with a credential for authentication.

ecRoleARN :: Lens' EmailChannelResponse (Maybe Text) Source #

The ARN of an IAM Role used to submit events to Mobile Analytics' event ingestion service

EndpointBatchItem

data EndpointBatchItem Source #

Endpoint update request

See: endpointBatchItem smart constructor.

Instances
Eq EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointBatchItem -> c EndpointBatchItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointBatchItem #

toConstr :: EndpointBatchItem -> Constr #

dataTypeOf :: EndpointBatchItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointBatchItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointBatchItem) #

gmapT :: (forall b. Data b => b -> b) -> EndpointBatchItem -> EndpointBatchItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointBatchItem -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointBatchItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointBatchItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointBatchItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointBatchItem -> m EndpointBatchItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointBatchItem -> m EndpointBatchItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointBatchItem -> m EndpointBatchItem #

Read EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointBatchItem :: Type -> Type #

Hashable EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointBatchItem -> () #

type Rep EndpointBatchItem Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointBatchItem = D1 (MetaData "EndpointBatchItem" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointBatchItem'" PrefixI True) (((S1 (MetaSel (Just "_ebiRequestId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ebiMetrics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Double))) :*: S1 (MetaSel (Just "_ebiLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointLocation)))) :*: (S1 (MetaSel (Just "_ebiDemographic") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointDemographic)) :*: (S1 (MetaSel (Just "_ebiAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ebiEffectiveDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_ebiUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointUser)) :*: (S1 (MetaSel (Just "_ebiAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_ebiEndpointStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_ebiOptOut") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ebiId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ebiChannelType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChannelType)))))))

endpointBatchItem :: EndpointBatchItem Source #

Creates a value of EndpointBatchItem with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ebiRequestId - The unique ID for the most recent request to update the endpoint.
  • ebiMetrics - Custom metrics that your app reports to Amazon Pinpoint.
  • ebiLocation - The endpoint location attributes.
  • ebiDemographic - The endpoint demographic attributes.
  • ebiAddress - The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).
  • ebiEffectiveDate - The last time the endpoint was updated. Provided in ISO 8601 format.
  • ebiUser - Custom user-specific attributes that your app reports to Amazon Pinpoint.
  • ebiAttributes - Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.
  • ebiEndpointStatus - The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.
  • ebiOptOut - Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.
  • ebiId - The unique Id for the Endpoint in the batch.
  • ebiChannelType - The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

ebiRequestId :: Lens' EndpointBatchItem (Maybe Text) Source #

The unique ID for the most recent request to update the endpoint.

ebiMetrics :: Lens' EndpointBatchItem (HashMap Text Double) Source #

Custom metrics that your app reports to Amazon Pinpoint.

ebiLocation :: Lens' EndpointBatchItem (Maybe EndpointLocation) Source #

The endpoint location attributes.

ebiDemographic :: Lens' EndpointBatchItem (Maybe EndpointDemographic) Source #

The endpoint demographic attributes.

ebiAddress :: Lens' EndpointBatchItem (Maybe Text) Source #

The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).

ebiEffectiveDate :: Lens' EndpointBatchItem (Maybe Text) Source #

The last time the endpoint was updated. Provided in ISO 8601 format.

ebiUser :: Lens' EndpointBatchItem (Maybe EndpointUser) Source #

Custom user-specific attributes that your app reports to Amazon Pinpoint.

ebiAttributes :: Lens' EndpointBatchItem (HashMap Text [Text]) Source #

Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.

ebiEndpointStatus :: Lens' EndpointBatchItem (Maybe Text) Source #

The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.

ebiOptOut :: Lens' EndpointBatchItem (Maybe Text) Source #

Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.

ebiId :: Lens' EndpointBatchItem (Maybe Text) Source #

The unique Id for the Endpoint in the batch.

ebiChannelType :: Lens' EndpointBatchItem (Maybe ChannelType) Source #

The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

EndpointBatchRequest

data EndpointBatchRequest Source #

Endpoint batch update request.

See: endpointBatchRequest smart constructor.

Instances
Eq EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointBatchRequest -> c EndpointBatchRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointBatchRequest #

toConstr :: EndpointBatchRequest -> Constr #

dataTypeOf :: EndpointBatchRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointBatchRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointBatchRequest) #

gmapT :: (forall b. Data b => b -> b) -> EndpointBatchRequest -> EndpointBatchRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointBatchRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointBatchRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointBatchRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointBatchRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointBatchRequest -> m EndpointBatchRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointBatchRequest -> m EndpointBatchRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointBatchRequest -> m EndpointBatchRequest #

Read EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointBatchRequest :: Type -> Type #

Hashable EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointBatchRequest -> () #

type Rep EndpointBatchRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointBatchRequest = D1 (MetaData "EndpointBatchRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "EndpointBatchRequest'" PrefixI True) (S1 (MetaSel (Just "_ebrItem") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [EndpointBatchItem]))))

endpointBatchRequest :: EndpointBatchRequest Source #

Creates a value of EndpointBatchRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ebrItem - List of items to update. Maximum 100 items

ebrItem :: Lens' EndpointBatchRequest [EndpointBatchItem] Source #

List of items to update. Maximum 100 items

EndpointDemographic

data EndpointDemographic Source #

Endpoint demographic data

See: endpointDemographic smart constructor.

Instances
Eq EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointDemographic -> c EndpointDemographic #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointDemographic #

toConstr :: EndpointDemographic -> Constr #

dataTypeOf :: EndpointDemographic -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointDemographic) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointDemographic) #

gmapT :: (forall b. Data b => b -> b) -> EndpointDemographic -> EndpointDemographic #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointDemographic -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointDemographic -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointDemographic -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointDemographic -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointDemographic -> m EndpointDemographic #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointDemographic -> m EndpointDemographic #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointDemographic -> m EndpointDemographic #

Read EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointDemographic :: Type -> Type #

Hashable EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointDemographic -> () #

type Rep EndpointDemographic Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

endpointDemographic :: EndpointDemographic Source #

Creates a value of EndpointDemographic with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • edPlatform - The endpoint platform, such as ios or android.
  • edPlatformVersion - The endpoint platform version.
  • edLocale - The endpoint locale in the following format: The ISO 639-1 alpha-2 code, followed by an underscore, followed by an ISO 3166-1 alpha-2 value.
  • edAppVersion - The version of the application associated with the endpoint.
  • edModel - The endpoint model, such as iPhone.
  • edMake - The endpoint make, such as such as Apple or Samsung.
  • edModelVersion - The endpoint model version.
  • edTimezone - The timezone of the endpoint. Specified as a tz database value, such as Americas/Los_Angeles.

edPlatform :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint platform, such as ios or android.

edPlatformVersion :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint platform version.

edLocale :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint locale in the following format: The ISO 639-1 alpha-2 code, followed by an underscore, followed by an ISO 3166-1 alpha-2 value.

edAppVersion :: Lens' EndpointDemographic (Maybe Text) Source #

The version of the application associated with the endpoint.

edModel :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint model, such as iPhone.

edMake :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint make, such as such as Apple or Samsung.

edModelVersion :: Lens' EndpointDemographic (Maybe Text) Source #

The endpoint model version.

edTimezone :: Lens' EndpointDemographic (Maybe Text) Source #

The timezone of the endpoint. Specified as a tz database value, such as Americas/Los_Angeles.

EndpointLocation

data EndpointLocation Source #

Endpoint location data

See: endpointLocation smart constructor.

Instances
Eq EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointLocation -> c EndpointLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointLocation #

toConstr :: EndpointLocation -> Constr #

dataTypeOf :: EndpointLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointLocation) #

gmapT :: (forall b. Data b => b -> b) -> EndpointLocation -> EndpointLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointLocation -> m EndpointLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointLocation -> m EndpointLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointLocation -> m EndpointLocation #

Read EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointLocation :: Type -> Type #

Hashable EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointLocation -> () #

type Rep EndpointLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointLocation = D1 (MetaData "EndpointLocation" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointLocation'" PrefixI True) ((S1 (MetaSel (Just "_elPostalCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_elLatitude") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double)) :*: S1 (MetaSel (Just "_elCountry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_elCity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_elRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_elLongitude") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double))))))

endpointLocation :: EndpointLocation Source #

Creates a value of EndpointLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • elPostalCode - The postal code or zip code of the endpoint.
  • elLatitude - The latitude of the endpoint location. Rounded to one decimal (Roughly corresponding to a mile).
  • elCountry - Country according to ISO 3166-1 Alpha-2 codes. For example, US.
  • elCity - The city where the endpoint is located.
  • elRegion - The region of the endpoint location. For example, corresponds to a state in US.
  • elLongitude - The longitude of the endpoint location. Rounded to one decimal (Roughly corresponding to a mile).

elPostalCode :: Lens' EndpointLocation (Maybe Text) Source #

The postal code or zip code of the endpoint.

elLatitude :: Lens' EndpointLocation (Maybe Double) Source #

The latitude of the endpoint location. Rounded to one decimal (Roughly corresponding to a mile).

elCountry :: Lens' EndpointLocation (Maybe Text) Source #

Country according to ISO 3166-1 Alpha-2 codes. For example, US.

elCity :: Lens' EndpointLocation (Maybe Text) Source #

The city where the endpoint is located.

elRegion :: Lens' EndpointLocation (Maybe Text) Source #

The region of the endpoint location. For example, corresponds to a state in US.

elLongitude :: Lens' EndpointLocation (Maybe Double) Source #

The longitude of the endpoint location. Rounded to one decimal (Roughly corresponding to a mile).

EndpointMessageResult

data EndpointMessageResult Source #

The result from sending a message to an endpoint.

See: endpointMessageResult smart constructor.

Instances
Eq EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointMessageResult -> c EndpointMessageResult #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointMessageResult #

toConstr :: EndpointMessageResult -> Constr #

dataTypeOf :: EndpointMessageResult -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointMessageResult) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointMessageResult) #

gmapT :: (forall b. Data b => b -> b) -> EndpointMessageResult -> EndpointMessageResult #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointMessageResult -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointMessageResult -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointMessageResult -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointMessageResult -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointMessageResult -> m EndpointMessageResult #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointMessageResult -> m EndpointMessageResult #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointMessageResult -> m EndpointMessageResult #

Read EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointMessageResult :: Type -> Type #

Hashable EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointMessageResult -> () #

type Rep EndpointMessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointMessageResult = D1 (MetaData "EndpointMessageResult" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointMessageResult'" PrefixI True) ((S1 (MetaSel (Just "_emrDeliveryStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeliveryStatus)) :*: S1 (MetaSel (Just "_emrAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_emrStatusMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_emrUpdatedToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_emrStatusCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))))))

endpointMessageResult :: EndpointMessageResult Source #

Creates a value of EndpointMessageResult with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

emrAddress :: Lens' EndpointMessageResult (Maybe Text) Source #

Address that endpoint message was delivered to.

emrStatusMessage :: Lens' EndpointMessageResult (Maybe Text) Source #

Status message for message delivery.

emrUpdatedToken :: Lens' EndpointMessageResult (Maybe Text) Source #

If token was updated as part of delivery. (This is GCM Specific)

emrStatusCode :: Lens' EndpointMessageResult (Maybe Int) Source #

Downstream service status code.

EndpointRequest

data EndpointRequest Source #

Endpoint update request

See: endpointRequest smart constructor.

Instances
Eq EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointRequest -> c EndpointRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointRequest #

toConstr :: EndpointRequest -> Constr #

dataTypeOf :: EndpointRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointRequest) #

gmapT :: (forall b. Data b => b -> b) -> EndpointRequest -> EndpointRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointRequest -> m EndpointRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointRequest -> m EndpointRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointRequest -> m EndpointRequest #

Read EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointRequest :: Type -> Type #

Hashable EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointRequest -> () #

type Rep EndpointRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

endpointRequest :: EndpointRequest Source #

Creates a value of EndpointRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • erRequestId - The unique ID for the most recent request to update the endpoint.
  • erMetrics - Custom metrics that your app reports to Amazon Pinpoint.
  • erLocation - The endpoint location attributes.
  • erDemographic - The endpoint demographic attributes.
  • erAddress - The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).
  • erEffectiveDate - The last time the endpoint was updated. Provided in ISO 8601 format.
  • erUser - Custom user-specific attributes that your app reports to Amazon Pinpoint.
  • erAttributes - Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.
  • erEndpointStatus - The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.
  • erOptOut - Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.
  • erChannelType - The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

erRequestId :: Lens' EndpointRequest (Maybe Text) Source #

The unique ID for the most recent request to update the endpoint.

erMetrics :: Lens' EndpointRequest (HashMap Text Double) Source #

Custom metrics that your app reports to Amazon Pinpoint.

erLocation :: Lens' EndpointRequest (Maybe EndpointLocation) Source #

The endpoint location attributes.

erDemographic :: Lens' EndpointRequest (Maybe EndpointDemographic) Source #

The endpoint demographic attributes.

erAddress :: Lens' EndpointRequest (Maybe Text) Source #

The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).

erEffectiveDate :: Lens' EndpointRequest (Maybe Text) Source #

The last time the endpoint was updated. Provided in ISO 8601 format.

erUser :: Lens' EndpointRequest (Maybe EndpointUser) Source #

Custom user-specific attributes that your app reports to Amazon Pinpoint.

erAttributes :: Lens' EndpointRequest (HashMap Text [Text]) Source #

Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.

erEndpointStatus :: Lens' EndpointRequest (Maybe Text) Source #

The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.

erOptOut :: Lens' EndpointRequest (Maybe Text) Source #

Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.

erChannelType :: Lens' EndpointRequest (Maybe ChannelType) Source #

The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

EndpointResponse

data EndpointResponse Source #

Endpoint response

See: endpointResponse smart constructor.

Instances
Eq EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointResponse -> c EndpointResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointResponse #

toConstr :: EndpointResponse -> Constr #

dataTypeOf :: EndpointResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointResponse) #

gmapT :: (forall b. Data b => b -> b) -> EndpointResponse -> EndpointResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointResponse -> m EndpointResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointResponse -> m EndpointResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointResponse -> m EndpointResponse #

Read EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointResponse :: Type -> Type #

Hashable EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointResponse -> () #

type Rep EndpointResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointResponse = D1 (MetaData "EndpointResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointResponse'" PrefixI True) (((S1 (MetaSel (Just "_eRequestId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_eMetrics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Double))) :*: S1 (MetaSel (Just "_eLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointLocation)))) :*: ((S1 (MetaSel (Just "_eDemographic") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointDemographic)) :*: S1 (MetaSel (Just "_eCohortId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eEffectiveDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: (((S1 (MetaSel (Just "_eUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EndpointUser)) :*: S1 (MetaSel (Just "_eApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_eEndpointStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_eOptOut") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eChannelType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChannelType)))))))

endpointResponse :: EndpointResponse Source #

Creates a value of EndpointResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • eRequestId - The unique ID for the most recent request to update the endpoint.
  • eMetrics - Custom metrics that your app reports to Amazon Pinpoint.
  • eLocation - The endpoint location attributes.
  • eDemographic - The endpoint demographic attributes.
  • eCohortId - A number from 0 - 99 that represents the cohort the endpoint is assigned to. Endpoints are grouped into cohorts randomly, and each cohort contains approximately 1 percent of the endpoints for an app. Amazon Pinpoint assigns cohorts to the holdout or treatment allocations for a campaign.
  • eAddress - The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).
  • eEffectiveDate - The last time the endpoint was updated. Provided in ISO 8601 format.
  • eUser - Custom user-specific attributes that your app reports to Amazon Pinpoint.
  • eApplicationId - The ID of the application associated with the endpoint.
  • eAttributes - Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.
  • eEndpointStatus - The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.
  • eOptOut - Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.
  • eId - The unique ID that you assigned to the endpoint. The ID should be a globally unique identifier (GUID) to ensure that it is unique compared to all other endpoints for the application.
  • eCreationDate - The last time the endpoint was created. Provided in ISO 8601 format.
  • eChannelType - The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

eRequestId :: Lens' EndpointResponse (Maybe Text) Source #

The unique ID for the most recent request to update the endpoint.

eMetrics :: Lens' EndpointResponse (HashMap Text Double) Source #

Custom metrics that your app reports to Amazon Pinpoint.

eLocation :: Lens' EndpointResponse (Maybe EndpointLocation) Source #

The endpoint location attributes.

eDemographic :: Lens' EndpointResponse (Maybe EndpointDemographic) Source #

The endpoint demographic attributes.

eCohortId :: Lens' EndpointResponse (Maybe Text) Source #

A number from 0 - 99 that represents the cohort the endpoint is assigned to. Endpoints are grouped into cohorts randomly, and each cohort contains approximately 1 percent of the endpoints for an app. Amazon Pinpoint assigns cohorts to the holdout or treatment allocations for a campaign.

eAddress :: Lens' EndpointResponse (Maybe Text) Source #

The address or token of the endpoint as provided by your push provider (e.g. DeviceToken or RegistrationId).

eEffectiveDate :: Lens' EndpointResponse (Maybe Text) Source #

The last time the endpoint was updated. Provided in ISO 8601 format.

eUser :: Lens' EndpointResponse (Maybe EndpointUser) Source #

Custom user-specific attributes that your app reports to Amazon Pinpoint.

eApplicationId :: Lens' EndpointResponse (Maybe Text) Source #

The ID of the application associated with the endpoint.

eAttributes :: Lens' EndpointResponse (HashMap Text [Text]) Source #

Custom attributes that describe the endpoint by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.

eEndpointStatus :: Lens' EndpointResponse (Maybe Text) Source #

The endpoint status. Can be either ACTIVE or INACTIVE. Will be set to INACTIVE if a delivery fails. Will be set to ACTIVE if the address is updated.

eOptOut :: Lens' EndpointResponse (Maybe Text) Source #

Indicates whether a user has opted out of receiving messages with one of the following values: ALL - User has opted out of all messages. NONE - Users has not opted out and receives all messages.

eId :: Lens' EndpointResponse (Maybe Text) Source #

The unique ID that you assigned to the endpoint. The ID should be a globally unique identifier (GUID) to ensure that it is unique compared to all other endpoints for the application.

eCreationDate :: Lens' EndpointResponse (Maybe Text) Source #

The last time the endpoint was created. Provided in ISO 8601 format.

eChannelType :: Lens' EndpointResponse (Maybe ChannelType) Source #

The channel type. Valid values: GCM | APNS | APNS_SANDBOX | APNS_VOIP | APNS_VOIP_SANDBOX | ADM | SMS | EMAIL | BAIDU

EndpointSendConfiguration

data EndpointSendConfiguration Source #

Endpoint send configuration.

See: endpointSendConfiguration smart constructor.

Instances
Eq EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointSendConfiguration -> c EndpointSendConfiguration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointSendConfiguration #

toConstr :: EndpointSendConfiguration -> Constr #

dataTypeOf :: EndpointSendConfiguration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointSendConfiguration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointSendConfiguration) #

gmapT :: (forall b. Data b => b -> b) -> EndpointSendConfiguration -> EndpointSendConfiguration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointSendConfiguration -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointSendConfiguration -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointSendConfiguration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointSendConfiguration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointSendConfiguration -> m EndpointSendConfiguration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointSendConfiguration -> m EndpointSendConfiguration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointSendConfiguration -> m EndpointSendConfiguration #

Read EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointSendConfiguration :: Type -> Type #

Hashable EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointSendConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointSendConfiguration = D1 (MetaData "EndpointSendConfiguration" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointSendConfiguration'" PrefixI True) ((S1 (MetaSel (Just "_escSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_escTitleOverride") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_escContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: (S1 (MetaSel (Just "_escRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_escBodyOverride") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

endpointSendConfiguration :: EndpointSendConfiguration Source #

Creates a value of EndpointSendConfiguration with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • escSubstitutions - A map of substitution values for the message to be merged with the DefaultMessage's substitutions. Substitutions on this map take precedence over the all other substitutions.
  • escTitleOverride - Title override. If specified will override default title if applicable.
  • escContext - A map of custom attributes to attributes to be attached to the message for this address. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.
  • escRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • escBodyOverride - Body override. If specified will override default body.

escSubstitutions :: Lens' EndpointSendConfiguration (HashMap Text [Text]) Source #

A map of substitution values for the message to be merged with the DefaultMessage's substitutions. Substitutions on this map take precedence over the all other substitutions.

escTitleOverride :: Lens' EndpointSendConfiguration (Maybe Text) Source #

Title override. If specified will override default title if applicable.

escContext :: Lens' EndpointSendConfiguration (HashMap Text Text) Source #

A map of custom attributes to attributes to be attached to the message for this address. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.

escRawContent :: Lens' EndpointSendConfiguration (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

escBodyOverride :: Lens' EndpointSendConfiguration (Maybe Text) Source #

Body override. If specified will override default body.

EndpointUser

data EndpointUser Source #

Endpoint user specific custom userAttributes

See: endpointUser smart constructor.

Instances
Eq EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EndpointUser -> c EndpointUser #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EndpointUser #

toConstr :: EndpointUser -> Constr #

dataTypeOf :: EndpointUser -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EndpointUser) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EndpointUser) #

gmapT :: (forall b. Data b => b -> b) -> EndpointUser -> EndpointUser #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EndpointUser -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EndpointUser -> r #

gmapQ :: (forall d. Data d => d -> u) -> EndpointUser -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EndpointUser -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EndpointUser -> m EndpointUser #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointUser -> m EndpointUser #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EndpointUser -> m EndpointUser #

Read EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EndpointUser :: Type -> Type #

Hashable EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EndpointUser -> () #

type Rep EndpointUser Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EndpointUser = D1 (MetaData "EndpointUser" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EndpointUser'" PrefixI True) (S1 (MetaSel (Just "_euUserAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_euUserId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

endpointUser :: EndpointUser Source #

Creates a value of EndpointUser with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • euUserAttributes - Custom attributes that describe an end user by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.
  • euUserId - The unique ID of the user.

euUserAttributes :: Lens' EndpointUser (HashMap Text [Text]) Source #

Custom attributes that describe an end user by associating a name with an array of values. For example, an attribute named "interests" might have the values ["science", "politics", "travel"]. You can use these attributes as selection criteria when you create a segment of users to engage with a messaging campaign. The following characters are not recommended in attribute names: # : ? /. The Amazon Pinpoint console does not display attributes that include these characters in the name. This limitation does not apply to attribute values.

euUserId :: Lens' EndpointUser (Maybe Text) Source #

The unique ID of the user.

EventStream

data EventStream Source #

Model for an event publishing subscription export.

See: eventStream smart constructor.

Instances
Eq EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EventStream -> c EventStream #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EventStream #

toConstr :: EventStream -> Constr #

dataTypeOf :: EventStream -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EventStream) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EventStream) #

gmapT :: (forall b. Data b => b -> b) -> EventStream -> EventStream #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EventStream -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EventStream -> r #

gmapQ :: (forall d. Data d => d -> u) -> EventStream -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EventStream -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EventStream -> m EventStream #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EventStream -> m EventStream #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EventStream -> m EventStream #

Read EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep EventStream :: Type -> Type #

Hashable EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: EventStream -> () #

type Rep EventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep EventStream = D1 (MetaData "EventStream" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "EventStream'" PrefixI True) ((S1 (MetaSel (Just "_esLastUpdatedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_esLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_esDestinationStreamARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_esApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_esExternalId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_esRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

eventStream :: EventStream Source #

Creates a value of EventStream with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • esLastUpdatedBy - The IAM user who last modified the event stream.
  • esLastModifiedDate - The date the event stream was last updated in ISO 8601 format.
  • esDestinationStreamARN - The Amazon Resource Name (ARN) of the Amazon Kinesis stream or Firehose delivery stream to which you want to publish events. Firehose ARN: arn:aws:firehose:REGION:ACCOUNT_ID:deliverystreamSTREAM_NAME Kinesis ARN: arn:aws:kinesis:REGION:ACCOUNT_ID:streamSTREAM_NAME
  • esApplicationId - The ID of the application from which events should be published.
  • esExternalId - DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.
  • esRoleARN - The IAM role that authorizes Amazon Pinpoint to publish events to the stream in your account.

esLastUpdatedBy :: Lens' EventStream (Maybe Text) Source #

The IAM user who last modified the event stream.

esLastModifiedDate :: Lens' EventStream (Maybe Text) Source #

The date the event stream was last updated in ISO 8601 format.

esDestinationStreamARN :: Lens' EventStream (Maybe Text) Source #

The Amazon Resource Name (ARN) of the Amazon Kinesis stream or Firehose delivery stream to which you want to publish events. Firehose ARN: arn:aws:firehose:REGION:ACCOUNT_ID:deliverystreamSTREAM_NAME Kinesis ARN: arn:aws:kinesis:REGION:ACCOUNT_ID:streamSTREAM_NAME

esApplicationId :: Lens' EventStream (Maybe Text) Source #

The ID of the application from which events should be published.

esExternalId :: Lens' EventStream (Maybe Text) Source #

DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.

esRoleARN :: Lens' EventStream (Maybe Text) Source #

The IAM role that authorizes Amazon Pinpoint to publish events to the stream in your account.

ExportJobRequest

data ExportJobRequest Source #

See: exportJobRequest smart constructor.

Instances
Eq ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportJobRequest -> c ExportJobRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExportJobRequest #

toConstr :: ExportJobRequest -> Constr #

dataTypeOf :: ExportJobRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExportJobRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExportJobRequest) #

gmapT :: (forall b. Data b => b -> b) -> ExportJobRequest -> ExportJobRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportJobRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportJobRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportJobRequest -> m ExportJobRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobRequest -> m ExportJobRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobRequest -> m ExportJobRequest #

Read ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ExportJobRequest :: Type -> Type #

Hashable ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ExportJobRequest -> () #

type Rep ExportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ExportJobRequest = D1 (MetaData "ExportJobRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ExportJobRequest'" PrefixI True) (S1 (MetaSel (Just "_eS3URLPrefix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_eSegmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

exportJobRequest :: ExportJobRequest Source #

Creates a value of ExportJobRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • eS3URLPrefix - A URL that points to the location within an Amazon S3 bucket that will receive the export. The location is typically a folder with multiple files. The URL should follow this format: s3:/bucket-namefolder-name/ Amazon Pinpoint will export endpoints to this location.
  • eSegmentId - The ID of the segment to export endpoints from. If not present all endpoints will be exported.
  • eRoleARN - The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that endpoints will be exported to.

eS3URLPrefix :: Lens' ExportJobRequest (Maybe Text) Source #

A URL that points to the location within an Amazon S3 bucket that will receive the export. The location is typically a folder with multiple files. The URL should follow this format: s3:/bucket-namefolder-name/ Amazon Pinpoint will export endpoints to this location.

eSegmentId :: Lens' ExportJobRequest (Maybe Text) Source #

The ID of the segment to export endpoints from. If not present all endpoints will be exported.

eRoleARN :: Lens' ExportJobRequest (Maybe Text) Source #

The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that endpoints will be exported to.

ExportJobResource

data ExportJobResource Source #

See: exportJobResource smart constructor.

Instances
Eq ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportJobResource -> c ExportJobResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExportJobResource #

toConstr :: ExportJobResource -> Constr #

dataTypeOf :: ExportJobResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExportJobResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExportJobResource) #

gmapT :: (forall b. Data b => b -> b) -> ExportJobResource -> ExportJobResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportJobResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportJobResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportJobResource -> m ExportJobResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobResource -> m ExportJobResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobResource -> m ExportJobResource #

Read ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ExportJobResource :: Type -> Type #

Hashable ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ExportJobResource -> () #

type Rep ExportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ExportJobResource = D1 (MetaData "ExportJobResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ExportJobResource'" PrefixI True) (S1 (MetaSel (Just "_ejrS3URLPrefix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ejrSegmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ejrRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

exportJobResource :: ExportJobResource Source #

Creates a value of ExportJobResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ejrS3URLPrefix - A URL that points to the location within an Amazon S3 bucket that will receive the export. The location is typically a folder with multiple files. The URL should follow this format: s3:/bucket-namefolder-name/ Amazon Pinpoint will export endpoints to this location.
  • ejrSegmentId - The ID of the segment to export endpoints from. If not present, all endpoints are exported.
  • ejrRoleARN - The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that endpoints will be exported to.

ejrS3URLPrefix :: Lens' ExportJobResource (Maybe Text) Source #

A URL that points to the location within an Amazon S3 bucket that will receive the export. The location is typically a folder with multiple files. The URL should follow this format: s3:/bucket-namefolder-name/ Amazon Pinpoint will export endpoints to this location.

ejrSegmentId :: Lens' ExportJobResource (Maybe Text) Source #

The ID of the segment to export endpoints from. If not present, all endpoints are exported.

ejrRoleARN :: Lens' ExportJobResource (Maybe Text) Source #

The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that endpoints will be exported to.

ExportJobResponse

data ExportJobResponse Source #

See: exportJobResponse smart constructor.

Instances
Eq ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportJobResponse -> c ExportJobResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExportJobResponse #

toConstr :: ExportJobResponse -> Constr #

dataTypeOf :: ExportJobResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExportJobResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExportJobResponse) #

gmapT :: (forall b. Data b => b -> b) -> ExportJobResponse -> ExportJobResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportJobResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportJobResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportJobResponse -> m ExportJobResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobResponse -> m ExportJobResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobResponse -> m ExportJobResponse #

Read ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ExportJobResponse :: Type -> Type #

Hashable ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ExportJobResponse -> () #

type Rep ExportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ExportJobResponse = D1 (MetaData "ExportJobResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ExportJobResponse'" PrefixI True) (((S1 (MetaSel (Just "_ejCompletedPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_ejFailedPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_ejDefinition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ExportJobResource)))) :*: (S1 (MetaSel (Just "_ejTotalProcessed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_ejFailures") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_ejTotalPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))))) :*: ((S1 (MetaSel (Just "_ejApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ejId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ejCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_ejType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ejCompletionDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ejJobStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe JobStatus)) :*: S1 (MetaSel (Just "_ejTotalFailures") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))))

exportJobResponse :: ExportJobResponse Source #

Creates a value of ExportJobResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ejCompletedPieces - The number of pieces that have successfully completed as of the time of the request.
  • ejFailedPieces - The number of pieces that failed to be processed as of the time of the request.
  • ejDefinition - The export job settings.
  • ejTotalProcessed - The number of endpoints that were processed by the job.
  • ejFailures - Provides up to 100 of the first failed entries for the job, if any exist.
  • ejTotalPieces - The total number of pieces that must be processed to finish the job. Each piece is an approximately equal portion of the endpoints.
  • ejApplicationId - The unique ID of the application to which the job applies.
  • ejId - The unique ID of the job.
  • ejCreationDate - The date the job was created in ISO 8601 format.
  • ejType - The job type. Will be EXPORT.
  • ejCompletionDate - The date the job completed in ISO 8601 format.
  • ejJobStatus - The status of the job. Valid values: CREATED, INITIALIZING, PROCESSING, COMPLETING, COMPLETED, FAILING, FAILED The job status is FAILED if one or more pieces failed.
  • ejTotalFailures - The number of endpoints that were not processed; for example, because of syntax errors.

ejCompletedPieces :: Lens' ExportJobResponse (Maybe Int) Source #

The number of pieces that have successfully completed as of the time of the request.

ejFailedPieces :: Lens' ExportJobResponse (Maybe Int) Source #

The number of pieces that failed to be processed as of the time of the request.

ejTotalProcessed :: Lens' ExportJobResponse (Maybe Int) Source #

The number of endpoints that were processed by the job.

ejFailures :: Lens' ExportJobResponse [Text] Source #

Provides up to 100 of the first failed entries for the job, if any exist.

ejTotalPieces :: Lens' ExportJobResponse (Maybe Int) Source #

The total number of pieces that must be processed to finish the job. Each piece is an approximately equal portion of the endpoints.

ejApplicationId :: Lens' ExportJobResponse (Maybe Text) Source #

The unique ID of the application to which the job applies.

ejId :: Lens' ExportJobResponse (Maybe Text) Source #

The unique ID of the job.

ejCreationDate :: Lens' ExportJobResponse (Maybe Text) Source #

The date the job was created in ISO 8601 format.

ejType :: Lens' ExportJobResponse (Maybe Text) Source #

The job type. Will be EXPORT.

ejCompletionDate :: Lens' ExportJobResponse (Maybe Text) Source #

The date the job completed in ISO 8601 format.

ejJobStatus :: Lens' ExportJobResponse (Maybe JobStatus) Source #

The status of the job. Valid values: CREATED, INITIALIZING, PROCESSING, COMPLETING, COMPLETED, FAILING, FAILED The job status is FAILED if one or more pieces failed.

ejTotalFailures :: Lens' ExportJobResponse (Maybe Int) Source #

The number of endpoints that were not processed; for example, because of syntax errors.

ExportJobsResponse

data ExportJobsResponse Source #

Export job list.

See: exportJobsResponse smart constructor.

Instances
Eq ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportJobsResponse -> c ExportJobsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExportJobsResponse #

toConstr :: ExportJobsResponse -> Constr #

dataTypeOf :: ExportJobsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExportJobsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExportJobsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ExportJobsResponse -> ExportJobsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportJobsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportJobsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportJobsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportJobsResponse -> m ExportJobsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobsResponse -> m ExportJobsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportJobsResponse -> m ExportJobsResponse #

Read ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ExportJobsResponse :: Type -> Type #

Hashable ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ExportJobsResponse -> () #

type Rep ExportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ExportJobsResponse = D1 (MetaData "ExportJobsResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ExportJobsResponse'" PrefixI True) (S1 (MetaSel (Just "_ejNextToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ejItem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ExportJobResponse]))))

exportJobsResponse :: ExportJobsResponse Source #

Creates a value of ExportJobsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ejNextToken - The string that you use in a subsequent request to get the next page of results in a paginated response.
  • ejItem - A list of export jobs for the application.

ejNextToken :: Lens' ExportJobsResponse (Maybe Text) Source #

The string that you use in a subsequent request to get the next page of results in a paginated response.

ejItem :: Lens' ExportJobsResponse [ExportJobResponse] Source #

A list of export jobs for the application.

GCMChannelRequest

data GCMChannelRequest Source #

Google Cloud Messaging credentials

See: gcmChannelRequest smart constructor.

Instances
Eq GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GCMChannelRequest -> c GCMChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GCMChannelRequest #

toConstr :: GCMChannelRequest -> Constr #

dataTypeOf :: GCMChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GCMChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GCMChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> GCMChannelRequest -> GCMChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GCMChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GCMChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GCMChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GCMChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GCMChannelRequest -> m GCMChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMChannelRequest -> m GCMChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMChannelRequest -> m GCMChannelRequest #

Read GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep GCMChannelRequest :: Type -> Type #

Hashable GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: GCMChannelRequest -> () #

type Rep GCMChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep GCMChannelRequest = D1 (MetaData "GCMChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "GCMChannelRequest'" PrefixI True) (S1 (MetaSel (Just "_gcrAPIKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gcrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

gcmChannelRequest :: GCMChannelRequest Source #

Creates a value of GCMChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gcrAPIKey - Platform credential API key from Google.
  • gcrEnabled - If the channel is enabled for sending messages.

gcrAPIKey :: Lens' GCMChannelRequest (Maybe Text) Source #

Platform credential API key from Google.

gcrEnabled :: Lens' GCMChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

GCMChannelResponse

data GCMChannelResponse Source #

Google Cloud Messaging channel definition

See: gcmChannelResponse smart constructor.

Instances
Eq GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GCMChannelResponse -> c GCMChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GCMChannelResponse #

toConstr :: GCMChannelResponse -> Constr #

dataTypeOf :: GCMChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GCMChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GCMChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> GCMChannelResponse -> GCMChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GCMChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GCMChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> GCMChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GCMChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GCMChannelResponse -> m GCMChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMChannelResponse -> m GCMChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMChannelResponse -> m GCMChannelResponse #

Read GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep GCMChannelResponse :: Type -> Type #

Hashable GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: GCMChannelResponse -> () #

type Rep GCMChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

gcmChannelResponse :: GCMChannelResponse Source #

Creates a value of GCMChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gcPlatform - The platform type. Will be GCM
  • gcLastModifiedDate - Last date this was updated
  • gcEnabled - If the channel is enabled for sending messages.
  • gcCredential - The GCM API key from Google.
  • gcIsArchived - Is this channel archived
  • gcApplicationId - The ID of the application to which the channel applies.
  • gcVersion - Version of channel
  • gcId - Channel ID. Not used. Present only for backwards compatibility.
  • gcCreationDate - When was this segment created
  • gcLastModifiedBy - Who last updated this entry
  • gcHasCredential - Indicates whether the channel is configured with FCM or GCM credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with FCM or GCM. Provide your credentials by setting the ApiKey attribute.

gcPlatform :: Lens' GCMChannelResponse (Maybe Text) Source #

The platform type. Will be GCM

gcEnabled :: Lens' GCMChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

gcCredential :: Lens' GCMChannelResponse (Maybe Text) Source #

The GCM API key from Google.

gcIsArchived :: Lens' GCMChannelResponse (Maybe Bool) Source #

Is this channel archived

gcApplicationId :: Lens' GCMChannelResponse (Maybe Text) Source #

The ID of the application to which the channel applies.

gcId :: Lens' GCMChannelResponse (Maybe Text) Source #

Channel ID. Not used. Present only for backwards compatibility.

gcCreationDate :: Lens' GCMChannelResponse (Maybe Text) Source #

When was this segment created

gcLastModifiedBy :: Lens' GCMChannelResponse (Maybe Text) Source #

Who last updated this entry

gcHasCredential :: Lens' GCMChannelResponse (Maybe Bool) Source #

Indicates whether the channel is configured with FCM or GCM credentials. Amazon Pinpoint uses your credentials to authenticate push notifications with FCM or GCM. Provide your credentials by setting the ApiKey attribute.

GCMMessage

data GCMMessage Source #

GCM Message.

See: gcmMessage smart constructor.

Instances
Eq GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GCMMessage -> c GCMMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GCMMessage #

toConstr :: GCMMessage -> Constr #

dataTypeOf :: GCMMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GCMMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GCMMessage) #

gmapT :: (forall b. Data b => b -> b) -> GCMMessage -> GCMMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GCMMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GCMMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> GCMMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GCMMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GCMMessage -> m GCMMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMMessage -> m GCMMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GCMMessage -> m GCMMessage #

Read GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep GCMMessage :: Type -> Type #

Hashable GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: GCMMessage -> () #

type Rep GCMMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep GCMMessage = D1 (MetaData "GCMMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "GCMMessage'" PrefixI True) ((((S1 (MetaSel (Just "_gmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_gmSilentPush") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_gmImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmPriority") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_gmRawContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text)))) :*: (S1 (MetaSel (Just "_gmRestrictedPackageName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmSmallImageIconURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: (((S1 (MetaSel (Just "_gmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmTimeToLive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))) :*: (S1 (MetaSel (Just "_gmURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmSound") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_gmAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Action)) :*: S1 (MetaSel (Just "_gmCollapseKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gmImageURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gmTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gmIconReference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

gcmMessage :: GCMMessage Source #

Creates a value of GCMMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • gmSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • gmImageIconURL - The URL that points to an image used as the large icon to the notification content view.
  • gmPriority - The message priority. Amazon Pinpoint uses this value to set the FCM or GCM priority parameter when it sends the message. Accepts the following values: Normal - Messages might be delayed. Delivery is optimized for battery usage on the receiving device. Use normal priority unless immediate delivery is required. High - Messages are sent immediately and might wake a sleeping device. The equivalent values for APNs messages are "5" and "10". Amazon Pinpoint accepts these values here and converts them. For more information, see About FCM Messages in the Firebase documentation.
  • gmRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • gmData - The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object
  • gmRestrictedPackageName - This parameter specifies the package name of the application where the registration tokens must match in order to receive the message.
  • gmSmallImageIconURL - The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view
  • gmBody - The message body of the notification, the email body or the text message.
  • gmTimeToLive - The length of time (in seconds) that FCM or GCM stores and attempts to deliver the message. If unspecified, the value defaults to the maximum, which is 2,419,200 seconds (28 days). Amazon Pinpoint uses this value to set the FCM or GCM time_to_live parameter.
  • gmURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • gmSound - Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/
  • gmAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL
  • gmCollapseKey - This parameter identifies a group of messages (e.g., with collapse_key: "Updates Available") that can be collapsed, so that only the last message gets sent when delivery can be resumed. This is intended to avoid sending too many of the same messages when the device comes back online or becomes active.
  • gmImageURL - The URL that points to an image used in the push notification.
  • gmTitle - The message title that displays above the message on the user's device.
  • gmIconReference - The icon image name of the asset saved in your application.

gmSubstitutions :: Lens' GCMMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

gmSilentPush :: Lens' GCMMessage (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

gmImageIconURL :: Lens' GCMMessage (Maybe Text) Source #

The URL that points to an image used as the large icon to the notification content view.

gmPriority :: Lens' GCMMessage (Maybe Text) Source #

The message priority. Amazon Pinpoint uses this value to set the FCM or GCM priority parameter when it sends the message. Accepts the following values: Normal - Messages might be delayed. Delivery is optimized for battery usage on the receiving device. Use normal priority unless immediate delivery is required. High - Messages are sent immediately and might wake a sleeping device. The equivalent values for APNs messages are "5" and "10". Amazon Pinpoint accepts these values here and converts them. For more information, see About FCM Messages in the Firebase documentation.

gmRawContent :: Lens' GCMMessage (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

gmData :: Lens' GCMMessage (HashMap Text Text) Source #

The data payload used for a silent push. This payload is added to the notifications' data.pinpoint.jsonBody' object

gmRestrictedPackageName :: Lens' GCMMessage (Maybe Text) Source #

This parameter specifies the package name of the application where the registration tokens must match in order to receive the message.

gmSmallImageIconURL :: Lens' GCMMessage (Maybe Text) Source #

The URL that points to an image used as the small icon for the notification which will be used to represent the notification in the status bar and content view

gmBody :: Lens' GCMMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

gmTimeToLive :: Lens' GCMMessage (Maybe Int) Source #

The length of time (in seconds) that FCM or GCM stores and attempts to deliver the message. If unspecified, the value defaults to the maximum, which is 2,419,200 seconds (28 days). Amazon Pinpoint uses this value to set the FCM or GCM time_to_live parameter.

gmURL :: Lens' GCMMessage (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

gmSound :: Lens' GCMMessage (Maybe Text) Source #

Indicates a sound to play when the device receives the notification. Supports default, or the filename of a sound resource bundled in the app. Android sound files must reside in resraw/

gmAction :: Lens' GCMMessage (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify. Possible values include: OPEN_APP | DEEP_LINK | URL

gmCollapseKey :: Lens' GCMMessage (Maybe Text) Source #

This parameter identifies a group of messages (e.g., with collapse_key: "Updates Available") that can be collapsed, so that only the last message gets sent when delivery can be resumed. This is intended to avoid sending too many of the same messages when the device comes back online or becomes active.

gmImageURL :: Lens' GCMMessage (Maybe Text) Source #

The URL that points to an image used in the push notification.

gmTitle :: Lens' GCMMessage (Maybe Text) Source #

The message title that displays above the message on the user's device.

gmIconReference :: Lens' GCMMessage (Maybe Text) Source #

The icon image name of the asset saved in your application.

ImportJobRequest

data ImportJobRequest Source #

See: importJobRequest smart constructor.

Instances
Eq ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportJobRequest -> c ImportJobRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportJobRequest #

toConstr :: ImportJobRequest -> Constr #

dataTypeOf :: ImportJobRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportJobRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportJobRequest) #

gmapT :: (forall b. Data b => b -> b) -> ImportJobRequest -> ImportJobRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportJobRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportJobRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportJobRequest -> m ImportJobRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobRequest -> m ImportJobRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobRequest -> m ImportJobRequest #

Read ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ImportJobRequest :: Type -> Type #

Hashable ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ImportJobRequest -> () #

type Rep ImportJobRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

importJobRequest :: ImportJobRequest Source #

Creates a value of ImportJobRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • iSegmentName - A custom name for the segment created by the import job. Use if DefineSegment is true.
  • iFormat - The format of the files that contain the endpoint definitions. Valid values: CSV, JSON
  • iDefineSegment - Sets whether the endpoints create a segment when they are imported.
  • iRegisterEndpoints - Sets whether the endpoints are registered with Amazon Pinpoint when they are imported.
  • iExternalId - DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.
  • iS3URL - A URL that points to the location within an Amazon S3 bucket that contains the endpoints to import. The location can be a folder or a single file. The URL should follow this format: s3:/bucket-namefolder-name/file-name Amazon Pinpoint will import endpoints from this location and any subfolders it contains.
  • iSegmentId - The ID of the segment to update if the import job is meant to update an existing segment.
  • iRoleARN - The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that contains the endpoints to import.

iSegmentName :: Lens' ImportJobRequest (Maybe Text) Source #

A custom name for the segment created by the import job. Use if DefineSegment is true.

iFormat :: Lens' ImportJobRequest (Maybe DefinitionFormat) Source #

The format of the files that contain the endpoint definitions. Valid values: CSV, JSON

iDefineSegment :: Lens' ImportJobRequest (Maybe Bool) Source #

Sets whether the endpoints create a segment when they are imported.

iRegisterEndpoints :: Lens' ImportJobRequest (Maybe Bool) Source #

Sets whether the endpoints are registered with Amazon Pinpoint when they are imported.

iExternalId :: Lens' ImportJobRequest (Maybe Text) Source #

DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.

iS3URL :: Lens' ImportJobRequest (Maybe Text) Source #

A URL that points to the location within an Amazon S3 bucket that contains the endpoints to import. The location can be a folder or a single file. The URL should follow this format: s3:/bucket-namefolder-name/file-name Amazon Pinpoint will import endpoints from this location and any subfolders it contains.

iSegmentId :: Lens' ImportJobRequest (Maybe Text) Source #

The ID of the segment to update if the import job is meant to update an existing segment.

iRoleARN :: Lens' ImportJobRequest (Maybe Text) Source #

The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that contains the endpoints to import.

ImportJobResource

data ImportJobResource Source #

See: importJobResource smart constructor.

Instances
Eq ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportJobResource -> c ImportJobResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportJobResource #

toConstr :: ImportJobResource -> Constr #

dataTypeOf :: ImportJobResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportJobResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportJobResource) #

gmapT :: (forall b. Data b => b -> b) -> ImportJobResource -> ImportJobResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportJobResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportJobResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportJobResource -> m ImportJobResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobResource -> m ImportJobResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobResource -> m ImportJobResource #

Read ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ImportJobResource :: Type -> Type #

Hashable ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ImportJobResource -> () #

type Rep ImportJobResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ImportJobResource = D1 (MetaData "ImportJobResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ImportJobResource'" PrefixI True) (((S1 (MetaSel (Just "_ijrSegmentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijrFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DefinitionFormat))) :*: (S1 (MetaSel (Just "_ijrDefineSegment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_ijrRegisterEndpoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: ((S1 (MetaSel (Just "_ijrExternalId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijrS3URL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ijrSegmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijrRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

importJobResource :: ImportJobResource Source #

Creates a value of ImportJobResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ijrSegmentName - A custom name for the segment created by the import job. Use if DefineSegment is true.
  • ijrFormat - The format of the files that contain the endpoint definitions. Valid values: CSV, JSON
  • ijrDefineSegment - Sets whether the endpoints create a segment when they are imported.
  • ijrRegisterEndpoints - Sets whether the endpoints are registered with Amazon Pinpoint when they are imported.
  • ijrExternalId - DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.
  • ijrS3URL - A URL that points to the location within an Amazon S3 bucket that contains the endpoints to import. The location can be a folder or a single file. The URL should follow this format: s3:/bucket-namefolder-name/file-name Amazon Pinpoint will import endpoints from this location and any subfolders it contains.
  • ijrSegmentId - The ID of the segment to update if the import job is meant to update an existing segment.
  • ijrRoleARN - The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that contains the endpoints to import.

ijrSegmentName :: Lens' ImportJobResource (Maybe Text) Source #

A custom name for the segment created by the import job. Use if DefineSegment is true.

ijrFormat :: Lens' ImportJobResource (Maybe DefinitionFormat) Source #

The format of the files that contain the endpoint definitions. Valid values: CSV, JSON

ijrDefineSegment :: Lens' ImportJobResource (Maybe Bool) Source #

Sets whether the endpoints create a segment when they are imported.

ijrRegisterEndpoints :: Lens' ImportJobResource (Maybe Bool) Source #

Sets whether the endpoints are registered with Amazon Pinpoint when they are imported.

ijrExternalId :: Lens' ImportJobResource (Maybe Text) Source #

DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.

ijrS3URL :: Lens' ImportJobResource (Maybe Text) Source #

A URL that points to the location within an Amazon S3 bucket that contains the endpoints to import. The location can be a folder or a single file. The URL should follow this format: s3:/bucket-namefolder-name/file-name Amazon Pinpoint will import endpoints from this location and any subfolders it contains.

ijrSegmentId :: Lens' ImportJobResource (Maybe Text) Source #

The ID of the segment to update if the import job is meant to update an existing segment.

ijrRoleARN :: Lens' ImportJobResource (Maybe Text) Source #

The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the Amazon S3 location that contains the endpoints to import.

ImportJobResponse

data ImportJobResponse Source #

See: importJobResponse smart constructor.

Instances
Eq ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportJobResponse -> c ImportJobResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportJobResponse #

toConstr :: ImportJobResponse -> Constr #

dataTypeOf :: ImportJobResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportJobResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportJobResponse) #

gmapT :: (forall b. Data b => b -> b) -> ImportJobResponse -> ImportJobResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportJobResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportJobResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportJobResponse -> m ImportJobResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobResponse -> m ImportJobResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobResponse -> m ImportJobResponse #

Read ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ImportJobResponse :: Type -> Type #

Hashable ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ImportJobResponse -> () #

type Rep ImportJobResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ImportJobResponse = D1 (MetaData "ImportJobResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ImportJobResponse'" PrefixI True) (((S1 (MetaSel (Just "_ijCompletedPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_ijFailedPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_ijDefinition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ImportJobResource)))) :*: (S1 (MetaSel (Just "_ijTotalProcessed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_ijFailures") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_ijTotalPieces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int))))) :*: ((S1 (MetaSel (Just "_ijApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ijId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_ijType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijCompletionDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_ijJobStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe JobStatus)) :*: S1 (MetaSel (Just "_ijTotalFailures") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))))

importJobResponse :: ImportJobResponse Source #

Creates a value of ImportJobResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ijCompletedPieces - The number of pieces that have successfully imported as of the time of the request.
  • ijFailedPieces - The number of pieces that have failed to import as of the time of the request.
  • ijDefinition - The import job settings.
  • ijTotalProcessed - The number of endpoints that were processed by the import job.
  • ijFailures - Provides up to 100 of the first failed entries for the job, if any exist.
  • ijTotalPieces - The total number of pieces that must be imported to finish the job. Each piece is an approximately equal portion of the endpoints to import.
  • ijApplicationId - The unique ID of the application to which the import job applies.
  • ijId - The unique ID of the import job.
  • ijCreationDate - The date the import job was created in ISO 8601 format.
  • ijType - The job type. Will be Import.
  • ijCompletionDate - The date the import job completed in ISO 8601 format.
  • ijJobStatus - The status of the import job. Valid values: CREATED, INITIALIZING, PROCESSING, COMPLETING, COMPLETED, FAILING, FAILED The job status is FAILED if one or more pieces failed to import.
  • ijTotalFailures - The number of endpoints that failed to import; for example, because of syntax errors.

ijCompletedPieces :: Lens' ImportJobResponse (Maybe Int) Source #

The number of pieces that have successfully imported as of the time of the request.

ijFailedPieces :: Lens' ImportJobResponse (Maybe Int) Source #

The number of pieces that have failed to import as of the time of the request.

ijTotalProcessed :: Lens' ImportJobResponse (Maybe Int) Source #

The number of endpoints that were processed by the import job.

ijFailures :: Lens' ImportJobResponse [Text] Source #

Provides up to 100 of the first failed entries for the job, if any exist.

ijTotalPieces :: Lens' ImportJobResponse (Maybe Int) Source #

The total number of pieces that must be imported to finish the job. Each piece is an approximately equal portion of the endpoints to import.

ijApplicationId :: Lens' ImportJobResponse (Maybe Text) Source #

The unique ID of the application to which the import job applies.

ijId :: Lens' ImportJobResponse (Maybe Text) Source #

The unique ID of the import job.

ijCreationDate :: Lens' ImportJobResponse (Maybe Text) Source #

The date the import job was created in ISO 8601 format.

ijType :: Lens' ImportJobResponse (Maybe Text) Source #

The job type. Will be Import.

ijCompletionDate :: Lens' ImportJobResponse (Maybe Text) Source #

The date the import job completed in ISO 8601 format.

ijJobStatus :: Lens' ImportJobResponse (Maybe JobStatus) Source #

The status of the import job. Valid values: CREATED, INITIALIZING, PROCESSING, COMPLETING, COMPLETED, FAILING, FAILED The job status is FAILED if one or more pieces failed to import.

ijTotalFailures :: Lens' ImportJobResponse (Maybe Int) Source #

The number of endpoints that failed to import; for example, because of syntax errors.

ImportJobsResponse

data ImportJobsResponse Source #

Import job list.

See: importJobsResponse smart constructor.

Instances
Eq ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportJobsResponse -> c ImportJobsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportJobsResponse #

toConstr :: ImportJobsResponse -> Constr #

dataTypeOf :: ImportJobsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportJobsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportJobsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ImportJobsResponse -> ImportJobsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportJobsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportJobsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportJobsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportJobsResponse -> m ImportJobsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobsResponse -> m ImportJobsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportJobsResponse -> m ImportJobsResponse #

Read ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep ImportJobsResponse :: Type -> Type #

Hashable ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: ImportJobsResponse -> () #

type Rep ImportJobsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep ImportJobsResponse = D1 (MetaData "ImportJobsResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "ImportJobsResponse'" PrefixI True) (S1 (MetaSel (Just "_ijNextToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ijItem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ImportJobResponse]))))

importJobsResponse :: ImportJobsResponse Source #

Creates a value of ImportJobsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ijNextToken - The string that you use in a subsequent request to get the next page of results in a paginated response.
  • ijItem - A list of import jobs for the application.

ijNextToken :: Lens' ImportJobsResponse (Maybe Text) Source #

The string that you use in a subsequent request to get the next page of results in a paginated response.

ijItem :: Lens' ImportJobsResponse [ImportJobResponse] Source #

A list of import jobs for the application.

Message

data Message Source #

See: message smart constructor.

Instances
Eq Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

(==) :: Message -> Message -> Bool #

(/=) :: Message -> Message -> Bool #

Data Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Message -> c Message #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Message #

toConstr :: Message -> Constr #

dataTypeOf :: Message -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Message) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Message) #

gmapT :: (forall b. Data b => b -> b) -> Message -> Message #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Message -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Message -> r #

gmapQ :: (forall d. Data d => d -> u) -> Message -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Message -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Message -> m Message #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Message -> m Message #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Message -> m Message #

Read Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep Message :: Type -> Type #

Methods

from :: Message -> Rep Message x #

to :: Rep Message x -> Message #

Hashable Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

hashWithSalt :: Int -> Message -> Int #

hash :: Message -> Int #

ToJSON Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: Message -> () #

type Rep Message Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

message :: Message Source #

Creates a value of Message with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • mSilentPush - Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.
  • mImageIconURL - The URL that points to the icon image for the push notification icon, for example, the app icon.
  • mRawContent - The Raw JSON formatted string to be used as the payload. This value overrides the message.
  • mBody - The message body. Can include up to 140 characters.
  • mImageSmallIconURL - The URL that points to the small icon image for the push notification icon, for example, the app icon.
  • mJSONBody - The JSON payload used for a silent push.
  • mURL - The URL to open in the user's mobile browser. Used if the value for Action is URL.
  • mAction - The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify.
  • mImageURL - The URL that points to an image used in the push notification.
  • mMediaURL - The URL that points to the media resource, for example a .mp4 or .gif file.
  • mTitle - The message title that displays above the message on the user's device.

mSilentPush :: Lens' Message (Maybe Bool) Source #

Indicates if the message should display on the users device. Silent pushes can be used for Remote Configuration and Phone Home use cases.

mImageIconURL :: Lens' Message (Maybe Text) Source #

The URL that points to the icon image for the push notification icon, for example, the app icon.

mRawContent :: Lens' Message (Maybe Text) Source #

The Raw JSON formatted string to be used as the payload. This value overrides the message.

mBody :: Lens' Message (Maybe Text) Source #

The message body. Can include up to 140 characters.

mImageSmallIconURL :: Lens' Message (Maybe Text) Source #

The URL that points to the small icon image for the push notification icon, for example, the app icon.

mJSONBody :: Lens' Message (Maybe Text) Source #

The JSON payload used for a silent push.

mURL :: Lens' Message (Maybe Text) Source #

The URL to open in the user's mobile browser. Used if the value for Action is URL.

mAction :: Lens' Message (Maybe Action) Source #

The action that occurs if the user taps a push notification delivered by the campaign: OPEN_APP - Your app launches, or it becomes the foreground app if it has been sent to the background. This is the default action. DEEP_LINK - Uses deep linking features in iOS and Android to open your app and display a designated user interface within the app. URL - The default mobile browser on the user's device launches and opens a web page at the URL you specify.

mImageURL :: Lens' Message (Maybe Text) Source #

The URL that points to an image used in the push notification.

mMediaURL :: Lens' Message (Maybe Text) Source #

The URL that points to the media resource, for example a .mp4 or .gif file.

mTitle :: Lens' Message (Maybe Text) Source #

The message title that displays above the message on the user's device.

MessageBody

data MessageBody Source #

Simple message object.

See: messageBody smart constructor.

Instances
Eq MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageBody -> c MessageBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageBody #

toConstr :: MessageBody -> Constr #

dataTypeOf :: MessageBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageBody) #

gmapT :: (forall b. Data b => b -> b) -> MessageBody -> MessageBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageBody -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageBody -> m MessageBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageBody -> m MessageBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageBody -> m MessageBody #

Read MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep MessageBody :: Type -> Type #

Hashable MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: MessageBody -> () #

type Rep MessageBody Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep MessageBody = D1 (MetaData "MessageBody" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "MessageBody'" PrefixI True) (S1 (MetaSel (Just "_mbRequestId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mbMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

messageBody :: MessageBody Source #

Creates a value of MessageBody with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mbRequestId :: Lens' MessageBody (Maybe Text) Source #

The unique message body ID.

mbMessage :: Lens' MessageBody (Maybe Text) Source #

The error message returned from the API.

MessageConfiguration

data MessageConfiguration Source #

Message configuration for a campaign.

See: messageConfiguration smart constructor.

Instances
Eq MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageConfiguration -> c MessageConfiguration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageConfiguration #

toConstr :: MessageConfiguration -> Constr #

dataTypeOf :: MessageConfiguration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageConfiguration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageConfiguration) #

gmapT :: (forall b. Data b => b -> b) -> MessageConfiguration -> MessageConfiguration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageConfiguration -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageConfiguration -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageConfiguration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageConfiguration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageConfiguration -> m MessageConfiguration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageConfiguration -> m MessageConfiguration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageConfiguration -> m MessageConfiguration #

Read MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep MessageConfiguration :: Type -> Type #

Hashable MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: MessageConfiguration -> () #

type Rep MessageConfiguration Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

messageConfiguration :: MessageConfiguration Source #

Creates a value of MessageConfiguration with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • mcAPNSMessage - The message that the campaign delivers to APNS channels. Overrides the default message.
  • mcGCMMessage - The message that the campaign delivers to GCM channels. Overrides the default message.
  • mcDefaultMessage - The default message for all channels.
  • mcADMMessage - The message that the campaign delivers to ADM channels. Overrides the default message.
  • mcSMSMessage - The SMS message configuration.
  • mcEmailMessage - The email message configuration.
  • mcBaiduMessage - The message that the campaign delivers to Baidu channels. Overrides the default message.

mcAPNSMessage :: Lens' MessageConfiguration (Maybe Message) Source #

The message that the campaign delivers to APNS channels. Overrides the default message.

mcGCMMessage :: Lens' MessageConfiguration (Maybe Message) Source #

The message that the campaign delivers to GCM channels. Overrides the default message.

mcDefaultMessage :: Lens' MessageConfiguration (Maybe Message) Source #

The default message for all channels.

mcADMMessage :: Lens' MessageConfiguration (Maybe Message) Source #

The message that the campaign delivers to ADM channels. Overrides the default message.

mcBaiduMessage :: Lens' MessageConfiguration (Maybe Message) Source #

The message that the campaign delivers to Baidu channels. Overrides the default message.

MessageRequest

data MessageRequest Source #

Send message request.

See: messageRequest smart constructor.

Instances
Eq MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageRequest -> c MessageRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageRequest #

toConstr :: MessageRequest -> Constr #

dataTypeOf :: MessageRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageRequest) #

gmapT :: (forall b. Data b => b -> b) -> MessageRequest -> MessageRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageRequest -> m MessageRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageRequest -> m MessageRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageRequest -> m MessageRequest #

Read MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep MessageRequest :: Type -> Type #

Hashable MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: MessageRequest -> () #

type Rep MessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep MessageRequest = D1 (MetaData "MessageRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "MessageRequest'" PrefixI True) ((S1 (MetaSel (Just "_mrContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: S1 (MetaSel (Just "_mrAddresses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text AddressConfiguration)))) :*: (S1 (MetaSel (Just "_mrEndpoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text EndpointSendConfiguration))) :*: S1 (MetaSel (Just "_mrMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DirectMessageConfiguration)))))

messageRequest :: MessageRequest Source #

Creates a value of MessageRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • mrContext - A map of custom attributes to attributes to be attached to the message. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.
  • mrAddresses - A map of destination addresses, with the address as the key(Email address, phone number or push token) and the Address Configuration as the value.
  • mrEndpoints - A map of destination addresses, with the address as the key(Email address, phone number or push token) and the Address Configuration as the value.
  • mrMessageConfiguration - Message configuration.

mrContext :: Lens' MessageRequest (HashMap Text Text) Source #

A map of custom attributes to attributes to be attached to the message. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.

mrAddresses :: Lens' MessageRequest (HashMap Text AddressConfiguration) Source #

A map of destination addresses, with the address as the key(Email address, phone number or push token) and the Address Configuration as the value.

mrEndpoints :: Lens' MessageRequest (HashMap Text EndpointSendConfiguration) Source #

A map of destination addresses, with the address as the key(Email address, phone number or push token) and the Address Configuration as the value.

MessageResponse

data MessageResponse Source #

Send message response.

See: messageResponse smart constructor.

Instances
Eq MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageResponse -> c MessageResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageResponse #

toConstr :: MessageResponse -> Constr #

dataTypeOf :: MessageResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageResponse) #

gmapT :: (forall b. Data b => b -> b) -> MessageResponse -> MessageResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageResponse -> m MessageResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageResponse -> m MessageResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageResponse -> m MessageResponse #

Read MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep MessageResponse :: Type -> Type #

Hashable MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: MessageResponse -> () #

type Rep MessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep MessageResponse = D1 (MetaData "MessageResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "MessageResponse'" PrefixI True) ((S1 (MetaSel (Just "_mRequestId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text MessageResult)))) :*: (S1 (MetaSel (Just "_mApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mEndpointResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text EndpointMessageResult))))))

messageResponse :: MessageResponse Source #

Creates a value of MessageResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • mRequestId - Original request Id for which this message was delivered.
  • mResult - A map containing a multi part response for each address, with the address as the key(Email address, phone number or push token) and the result as the value.
  • mApplicationId - Application id of the message.
  • mEndpointResult - A map containing a multi part response for each address, with the endpointId as the key and the result as the value.

mRequestId :: Lens' MessageResponse (Maybe Text) Source #

Original request Id for which this message was delivered.

mResult :: Lens' MessageResponse (HashMap Text MessageResult) Source #

A map containing a multi part response for each address, with the address as the key(Email address, phone number or push token) and the result as the value.

mApplicationId :: Lens' MessageResponse (Maybe Text) Source #

Application id of the message.

mEndpointResult :: Lens' MessageResponse (HashMap Text EndpointMessageResult) Source #

A map containing a multi part response for each address, with the endpointId as the key and the result as the value.

MessageResult

data MessageResult Source #

The result from sending a message to an address.

See: messageResult smart constructor.

Instances
Eq MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MessageResult -> c MessageResult #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MessageResult #

toConstr :: MessageResult -> Constr #

dataTypeOf :: MessageResult -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MessageResult) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MessageResult) #

gmapT :: (forall b. Data b => b -> b) -> MessageResult -> MessageResult #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MessageResult -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MessageResult -> r #

gmapQ :: (forall d. Data d => d -> u) -> MessageResult -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MessageResult -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MessageResult -> m MessageResult #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageResult -> m MessageResult #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MessageResult -> m MessageResult #

Read MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep MessageResult :: Type -> Type #

Hashable MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: MessageResult -> () #

type Rep MessageResult Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep MessageResult = D1 (MetaData "MessageResult" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "MessageResult'" PrefixI True) ((S1 (MetaSel (Just "_mrDeliveryStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeliveryStatus)) :*: S1 (MetaSel (Just "_mrStatusMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_mrUpdatedToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mrStatusCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))

messageResult :: MessageResult Source #

Creates a value of MessageResult with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mrStatusMessage :: Lens' MessageResult (Maybe Text) Source #

Status message for message delivery.

mrUpdatedToken :: Lens' MessageResult (Maybe Text) Source #

If token was updated as part of delivery. (This is GCM Specific)

mrStatusCode :: Lens' MessageResult (Maybe Int) Source #

Downstream service status code.

QuietTime

data QuietTime Source #

Quiet Time

See: quietTime smart constructor.

Instances
Eq QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuietTime -> c QuietTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuietTime #

toConstr :: QuietTime -> Constr #

dataTypeOf :: QuietTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuietTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuietTime) #

gmapT :: (forall b. Data b => b -> b) -> QuietTime -> QuietTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuietTime -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuietTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> QuietTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QuietTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuietTime -> m QuietTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuietTime -> m QuietTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuietTime -> m QuietTime #

Read QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep QuietTime :: Type -> Type #

Hashable QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: QuietTime -> () #

type Rep QuietTime Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep QuietTime = D1 (MetaData "QuietTime" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "QuietTime'" PrefixI True) (S1 (MetaSel (Just "_qtStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_qtEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

quietTime :: QuietTime Source #

Creates a value of QuietTime with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • qtStart - The default start time for quiet time in ISO 8601 format.
  • qtEnd - The default end time for quiet time in ISO 8601 format.

qtStart :: Lens' QuietTime (Maybe Text) Source #

The default start time for quiet time in ISO 8601 format.

qtEnd :: Lens' QuietTime (Maybe Text) Source #

The default end time for quiet time in ISO 8601 format.

RecencyDimension

data RecencyDimension Source #

Define how a segment based on recency of use.

See: recencyDimension smart constructor.

Instances
Eq RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecencyDimension -> c RecencyDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecencyDimension #

toConstr :: RecencyDimension -> Constr #

dataTypeOf :: RecencyDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecencyDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecencyDimension) #

gmapT :: (forall b. Data b => b -> b) -> RecencyDimension -> RecencyDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecencyDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecencyDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecencyDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecencyDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecencyDimension -> m RecencyDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecencyDimension -> m RecencyDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecencyDimension -> m RecencyDimension #

Read RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep RecencyDimension :: Type -> Type #

Hashable RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: RecencyDimension -> () #

type Rep RecencyDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep RecencyDimension = D1 (MetaData "RecencyDimension" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "RecencyDimension'" PrefixI True) (S1 (MetaSel (Just "_rdRecencyType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RecencyType)) :*: S1 (MetaSel (Just "_rdDuration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Duration))))

recencyDimension :: RecencyDimension Source #

Creates a value of RecencyDimension with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • rdRecencyType - The recency dimension type: ACTIVE - Users who have used your app within the specified duration are included in the segment. INACTIVE - Users who have not used your app within the specified duration are included in the segment.
  • rdDuration - The length of time during which users have been active or inactive with your app. Valid values: HR_24, DAY_7, DAY_14, DAY_30

rdRecencyType :: Lens' RecencyDimension (Maybe RecencyType) Source #

The recency dimension type: ACTIVE - Users who have used your app within the specified duration are included in the segment. INACTIVE - Users who have not used your app within the specified duration are included in the segment.

rdDuration :: Lens' RecencyDimension (Maybe Duration) Source #

The length of time during which users have been active or inactive with your app. Valid values: HR_24, DAY_7, DAY_14, DAY_30

SMSChannelRequest

data SMSChannelRequest Source #

SMS Channel Request

See: sMSChannelRequest smart constructor.

Instances
Eq SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SMSChannelRequest -> c SMSChannelRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SMSChannelRequest #

toConstr :: SMSChannelRequest -> Constr #

dataTypeOf :: SMSChannelRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SMSChannelRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SMSChannelRequest) #

gmapT :: (forall b. Data b => b -> b) -> SMSChannelRequest -> SMSChannelRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SMSChannelRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SMSChannelRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> SMSChannelRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SMSChannelRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SMSChannelRequest -> m SMSChannelRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSChannelRequest -> m SMSChannelRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSChannelRequest -> m SMSChannelRequest #

Read SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SMSChannelRequest :: Type -> Type #

Hashable SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SMSChannelRequest -> () #

type Rep SMSChannelRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SMSChannelRequest = D1 (MetaData "SMSChannelRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SMSChannelRequest'" PrefixI True) (S1 (MetaSel (Just "_smscrShortCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smscrEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_smscrSenderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

sMSChannelRequest :: SMSChannelRequest Source #

Creates a value of SMSChannelRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

smscrShortCode :: Lens' SMSChannelRequest (Maybe Text) Source #

ShortCode registered with phone provider.

smscrEnabled :: Lens' SMSChannelRequest (Maybe Bool) Source #

If the channel is enabled for sending messages.

smscrSenderId :: Lens' SMSChannelRequest (Maybe Text) Source #

Sender identifier of your messages.

SMSChannelResponse

data SMSChannelResponse Source #

SMS Channel Response.

See: sMSChannelResponse smart constructor.

Instances
Eq SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SMSChannelResponse -> c SMSChannelResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SMSChannelResponse #

toConstr :: SMSChannelResponse -> Constr #

dataTypeOf :: SMSChannelResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SMSChannelResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SMSChannelResponse) #

gmapT :: (forall b. Data b => b -> b) -> SMSChannelResponse -> SMSChannelResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SMSChannelResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SMSChannelResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> SMSChannelResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SMSChannelResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SMSChannelResponse -> m SMSChannelResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSChannelResponse -> m SMSChannelResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSChannelResponse -> m SMSChannelResponse #

Read SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SMSChannelResponse :: Type -> Type #

Hashable SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SMSChannelResponse -> () #

type Rep SMSChannelResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SMSChannelResponse = D1 (MetaData "SMSChannelResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SMSChannelResponse'" PrefixI True) (((S1 (MetaSel (Just "_smscPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smscShortCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_smscLastModifiedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_smscEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_smscSenderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_smscIsArchived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_smscApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smscVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_smscId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_smscCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smscLastModifiedBy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_smscHasCredential") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

sMSChannelResponse :: SMSChannelResponse Source #

Creates a value of SMSChannelResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

smscShortCode :: Lens' SMSChannelResponse (Maybe Text) Source #

The short code registered with the phone provider.

smscEnabled :: Lens' SMSChannelResponse (Maybe Bool) Source #

If the channel is enabled for sending messages.

smscSenderId :: Lens' SMSChannelResponse (Maybe Text) Source #

Sender identifier of your messages.

smscApplicationId :: Lens' SMSChannelResponse (Maybe Text) Source #

The unique ID of the application to which the SMS channel belongs.

smscId :: Lens' SMSChannelResponse (Maybe Text) Source #

Channel ID. Not used, only for backwards compatibility.

smscCreationDate :: Lens' SMSChannelResponse (Maybe Text) Source #

The date that the settings were last updated in ISO 8601 format.

smscLastModifiedBy :: Lens' SMSChannelResponse (Maybe Text) Source #

Who last updated this entry

smscHasCredential :: Lens' SMSChannelResponse (Maybe Bool) Source #

If the channel is registered with a credential for authentication.

SMSMessage

data SMSMessage Source #

SMS Message.

See: sMSMessage smart constructor.

Instances
Eq SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SMSMessage -> c SMSMessage #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SMSMessage #

toConstr :: SMSMessage -> Constr #

dataTypeOf :: SMSMessage -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SMSMessage) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SMSMessage) #

gmapT :: (forall b. Data b => b -> b) -> SMSMessage -> SMSMessage #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SMSMessage -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SMSMessage -> r #

gmapQ :: (forall d. Data d => d -> u) -> SMSMessage -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SMSMessage -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SMSMessage -> m SMSMessage #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSMessage -> m SMSMessage #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SMSMessage -> m SMSMessage #

Read SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SMSMessage :: Type -> Type #

Hashable SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SMSMessage -> () #

type Rep SMSMessage Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SMSMessage = D1 (MetaData "SMSMessage" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SMSMessage'" PrefixI True) ((S1 (MetaSel (Just "_smsmSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text [Text]))) :*: S1 (MetaSel (Just "_smsmOriginationNumber") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_smsmBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smsmMessageType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageType)) :*: S1 (MetaSel (Just "_smsmSenderId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

sMSMessage :: SMSMessage Source #

Creates a value of SMSMessage with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • smsmSubstitutions - Default message substitutions. Can be overridden by individual address substitutions.
  • smsmOriginationNumber - The phone number that the SMS message originates from. Specify one of the dedicated long codes or short codes that you requested from AWS Support and that is assigned to your account. If this attribute is not specified, Amazon Pinpoint randomly assigns a long code.
  • smsmBody - The message body of the notification, the email body or the text message.
  • smsmMessageType - Is this a transaction priority message or lower priority.
  • smsmSenderId - The sender ID that is shown as the message sender on the recipient's device. Support for sender IDs varies by country or region.

smsmSubstitutions :: Lens' SMSMessage (HashMap Text [Text]) Source #

Default message substitutions. Can be overridden by individual address substitutions.

smsmOriginationNumber :: Lens' SMSMessage (Maybe Text) Source #

The phone number that the SMS message originates from. Specify one of the dedicated long codes or short codes that you requested from AWS Support and that is assigned to your account. If this attribute is not specified, Amazon Pinpoint randomly assigns a long code.

smsmBody :: Lens' SMSMessage (Maybe Text) Source #

The message body of the notification, the email body or the text message.

smsmMessageType :: Lens' SMSMessage (Maybe MessageType) Source #

Is this a transaction priority message or lower priority.

smsmSenderId :: Lens' SMSMessage (Maybe Text) Source #

The sender ID that is shown as the message sender on the recipient's device. Support for sender IDs varies by country or region.

Schedule

data Schedule Source #

Shcedule that defines when a campaign is run.

See: schedule smart constructor.

Instances
Eq Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Schedule -> c Schedule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Schedule #

toConstr :: Schedule -> Constr #

dataTypeOf :: Schedule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Schedule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Schedule) #

gmapT :: (forall b. Data b => b -> b) -> Schedule -> Schedule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Schedule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Schedule -> r #

gmapQ :: (forall d. Data d => d -> u) -> Schedule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Schedule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

Read Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep Schedule :: Type -> Type #

Methods

from :: Schedule -> Rep Schedule x #

to :: Rep Schedule x -> Schedule #

Hashable Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

hashWithSalt :: Int -> Schedule -> Int #

hash :: Schedule -> Int #

ToJSON Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: Schedule -> () #

type Rep Schedule Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

schedule :: Schedule Source #

Creates a value of Schedule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sFrequency - How often the campaign delivers messages. Valid values: ONCE, HOURLY, DAILY, WEEKLY, MONTHLY
  • sStartTime - The scheduled time that the campaign begins in ISO 8601 format.
  • sQuietTime - The time during which the campaign sends no messages.
  • sIsLocalTime - Indicates whether the campaign schedule takes effect according to each user's local time.
  • sEndTime - The scheduled time that the campaign ends in ISO 8601 format.
  • sTimezone - The starting UTC offset for the schedule if the value for isLocalTime is true Valid values: UTC UTC+01 UTC+02 UTC+03 UTC+03:30 UTC+04 UTC+04:30 UTC+05 UTC+05:30 UTC+05:45 UTC+06 UTC+06:30 UTC+07 UTC+08 UTC+09 UTC+09:30 UTC+10 UTC+10:30 UTC+11 UTC+12 UTC+13 UTC-02 UTC-03 UTC-04 UTC-05 UTC-06 UTC-07 UTC-08 UTC-09 UTC-10 UTC-11

sFrequency :: Lens' Schedule (Maybe Frequency) Source #

How often the campaign delivers messages. Valid values: ONCE, HOURLY, DAILY, WEEKLY, MONTHLY

sStartTime :: Lens' Schedule (Maybe Text) Source #

The scheduled time that the campaign begins in ISO 8601 format.

sQuietTime :: Lens' Schedule (Maybe QuietTime) Source #

The time during which the campaign sends no messages.

sIsLocalTime :: Lens' Schedule (Maybe Bool) Source #

Indicates whether the campaign schedule takes effect according to each user's local time.

sEndTime :: Lens' Schedule (Maybe Text) Source #

The scheduled time that the campaign ends in ISO 8601 format.

sTimezone :: Lens' Schedule (Maybe Text) Source #

The starting UTC offset for the schedule if the value for isLocalTime is true Valid values: UTC UTC+01 UTC+02 UTC+03 UTC+03:30 UTC+04 UTC+04:30 UTC+05 UTC+05:30 UTC+05:45 UTC+06 UTC+06:30 UTC+07 UTC+08 UTC+09 UTC+09:30 UTC+10 UTC+10:30 UTC+11 UTC+12 UTC+13 UTC-02 UTC-03 UTC-04 UTC-05 UTC-06 UTC-07 UTC-08 UTC-09 UTC-10 UTC-11

SegmentBehaviors

data SegmentBehaviors Source #

Segment behavior dimensions

See: segmentBehaviors smart constructor.

Instances
Eq SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentBehaviors -> c SegmentBehaviors #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentBehaviors #

toConstr :: SegmentBehaviors -> Constr #

dataTypeOf :: SegmentBehaviors -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentBehaviors) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentBehaviors) #

gmapT :: (forall b. Data b => b -> b) -> SegmentBehaviors -> SegmentBehaviors #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentBehaviors -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentBehaviors -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentBehaviors -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentBehaviors -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentBehaviors -> m SegmentBehaviors #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentBehaviors -> m SegmentBehaviors #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentBehaviors -> m SegmentBehaviors #

Read SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentBehaviors :: Type -> Type #

Hashable SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentBehaviors -> () #

type Rep SegmentBehaviors Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SegmentBehaviors = D1 (MetaData "SegmentBehaviors" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "SegmentBehaviors'" PrefixI True) (S1 (MetaSel (Just "_sbRecency") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe RecencyDimension))))

segmentBehaviors :: SegmentBehaviors Source #

Creates a value of SegmentBehaviors with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

SegmentDemographics

data SegmentDemographics Source #

Segment demographic dimensions

See: segmentDemographics smart constructor.

Instances
Eq SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentDemographics -> c SegmentDemographics #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentDemographics #

toConstr :: SegmentDemographics -> Constr #

dataTypeOf :: SegmentDemographics -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentDemographics) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentDemographics) #

gmapT :: (forall b. Data b => b -> b) -> SegmentDemographics -> SegmentDemographics #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentDemographics -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentDemographics -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentDemographics -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentDemographics -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentDemographics -> m SegmentDemographics #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentDemographics -> m SegmentDemographics #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentDemographics -> m SegmentDemographics #

Read SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentDemographics :: Type -> Type #

Hashable SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentDemographics -> () #

type Rep SegmentDemographics Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

segmentDemographics :: SegmentDemographics Source #

Creates a value of SegmentDemographics with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sdPlatform - The device platform criteria for the segment.
  • sdAppVersion - The app version criteria for the segment.
  • sdChannel - The channel criteria for the segment.
  • sdModel - The device model criteria for the segment.
  • sdMake - The device make criteria for the segment.
  • sdDeviceType - The device type criteria for the segment.

sdPlatform :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The device platform criteria for the segment.

sdAppVersion :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The app version criteria for the segment.

sdChannel :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The channel criteria for the segment.

sdModel :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The device model criteria for the segment.

sdMake :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The device make criteria for the segment.

sdDeviceType :: Lens' SegmentDemographics (Maybe SetDimension) Source #

The device type criteria for the segment.

SegmentDimensions

data SegmentDimensions Source #

Segment dimensions

See: segmentDimensions smart constructor.

Instances
Eq SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentDimensions -> c SegmentDimensions #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentDimensions #

toConstr :: SegmentDimensions -> Constr #

dataTypeOf :: SegmentDimensions -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentDimensions) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentDimensions) #

gmapT :: (forall b. Data b => b -> b) -> SegmentDimensions -> SegmentDimensions #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentDimensions -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentDimensions -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentDimensions -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentDimensions -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentDimensions -> m SegmentDimensions #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentDimensions -> m SegmentDimensions #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentDimensions -> m SegmentDimensions #

Read SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentDimensions :: Type -> Type #

Hashable SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentDimensions -> () #

type Rep SegmentDimensions Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

segmentDimensions :: SegmentDimensions Source #

Creates a value of SegmentDimensions with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sdLocation :: Lens' SegmentDimensions (Maybe SegmentLocation) Source #

The segment location attributes.

sdDemographic :: Lens' SegmentDimensions (Maybe SegmentDemographics) Source #

The segment demographics attributes.

sdBehavior :: Lens' SegmentDimensions (Maybe SegmentBehaviors) Source #

The segment behaviors attributes.

SegmentImportResource

data SegmentImportResource Source #

Segment import definition.

See: segmentImportResource smart constructor.

Instances
Eq SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentImportResource -> c SegmentImportResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentImportResource #

toConstr :: SegmentImportResource -> Constr #

dataTypeOf :: SegmentImportResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentImportResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentImportResource) #

gmapT :: (forall b. Data b => b -> b) -> SegmentImportResource -> SegmentImportResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentImportResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentImportResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentImportResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentImportResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentImportResource -> m SegmentImportResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentImportResource -> m SegmentImportResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentImportResource -> m SegmentImportResource #

Read SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentImportResource :: Type -> Type #

Hashable SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentImportResource -> () #

type Rep SegmentImportResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SegmentImportResource = D1 (MetaData "SegmentImportResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SegmentImportResource'" PrefixI True) ((S1 (MetaSel (Just "_sirSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_sirFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DefinitionFormat)) :*: S1 (MetaSel (Just "_sirChannelCounts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Int))))) :*: (S1 (MetaSel (Just "_sirExternalId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sirS3URL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sirRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

segmentImportResource :: SegmentImportResource Source #

Creates a value of SegmentImportResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sirSize - The number of endpoints that were successfully imported to create this segment.
  • sirFormat - The format of the endpoint files that were imported to create this segment. Valid values: CSV, JSON
  • sirChannelCounts - Channel type counts
  • sirExternalId - DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.
  • sirS3URL - A URL that points to the Amazon S3 location from which the endpoints for this segment were imported.
  • sirRoleARN - The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the endpoints in Amazon S3.

sirSize :: Lens' SegmentImportResource (Maybe Int) Source #

The number of endpoints that were successfully imported to create this segment.

sirFormat :: Lens' SegmentImportResource (Maybe DefinitionFormat) Source #

The format of the endpoint files that were imported to create this segment. Valid values: CSV, JSON

sirExternalId :: Lens' SegmentImportResource (Maybe Text) Source #

DEPRECATED. Your AWS account ID, which you assigned to the ExternalID key in an IAM trust policy. Used by Amazon Pinpoint to assume an IAM role. This requirement is removed, and external IDs are not recommended for IAM roles assumed by Amazon Pinpoint.

sirS3URL :: Lens' SegmentImportResource (Maybe Text) Source #

A URL that points to the Amazon S3 location from which the endpoints for this segment were imported.

sirRoleARN :: Lens' SegmentImportResource (Maybe Text) Source #

The Amazon Resource Name (ARN) of an IAM role that grants Amazon Pinpoint access to the endpoints in Amazon S3.

SegmentLocation

data SegmentLocation Source #

Segment location dimensions

See: segmentLocation smart constructor.

Instances
Eq SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentLocation -> c SegmentLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentLocation #

toConstr :: SegmentLocation -> Constr #

dataTypeOf :: SegmentLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentLocation) #

gmapT :: (forall b. Data b => b -> b) -> SegmentLocation -> SegmentLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentLocation -> m SegmentLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentLocation -> m SegmentLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentLocation -> m SegmentLocation #

Read SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentLocation :: Type -> Type #

Hashable SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentLocation -> () #

type Rep SegmentLocation Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SegmentLocation = D1 (MetaData "SegmentLocation" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" True) (C1 (MetaCons "SegmentLocation'" PrefixI True) (S1 (MetaSel (Just "_slCountry") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SetDimension))))

segmentLocation :: SegmentLocation Source #

Creates a value of SegmentLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • slCountry - The country filter according to ISO 3166-1 Alpha-2 codes.

slCountry :: Lens' SegmentLocation (Maybe SetDimension) Source #

The country filter according to ISO 3166-1 Alpha-2 codes.

SegmentResponse

data SegmentResponse Source #

Segment definition.

See: segmentResponse smart constructor.

Instances
Eq SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentResponse -> c SegmentResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentResponse #

toConstr :: SegmentResponse -> Constr #

dataTypeOf :: SegmentResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentResponse) #

gmapT :: (forall b. Data b => b -> b) -> SegmentResponse -> SegmentResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentResponse -> m SegmentResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentResponse -> m SegmentResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentResponse -> m SegmentResponse #

Read SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentResponse :: Type -> Type #

Hashable SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentResponse -> () #

type Rep SegmentResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

segmentResponse :: SegmentResponse Source #

Creates a value of SegmentResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sLastModifiedDate - The date the segment was last updated in ISO 8601 format.
  • sSegmentType - The segment type: DIMENSIONAL - A dynamic segment built from selection criteria based on endpoint data reported by your app. You create this type of segment by using the segment builder in the Amazon Pinpoint console or by making a POST request to the segments resource. IMPORT - A static segment built from an imported set of endpoint definitions. You create this type of segment by importing a segment in the Amazon Pinpoint console or by making a POST request to the jobs/import resource.
  • sApplicationId - The ID of the application to which the segment applies.
  • sName - The name of segment
  • sVersion - The segment version number.
  • sId - The unique segment ID.
  • sCreationDate - The date the segment was created in ISO 8601 format.
  • sImportDefinition - The import job settings.
  • sDimensions - The segment dimensions attributes.

sLastModifiedDate :: Lens' SegmentResponse (Maybe Text) Source #

The date the segment was last updated in ISO 8601 format.

sSegmentType :: Lens' SegmentResponse (Maybe SegmentType) Source #

The segment type: DIMENSIONAL - A dynamic segment built from selection criteria based on endpoint data reported by your app. You create this type of segment by using the segment builder in the Amazon Pinpoint console or by making a POST request to the segments resource. IMPORT - A static segment built from an imported set of endpoint definitions. You create this type of segment by importing a segment in the Amazon Pinpoint console or by making a POST request to the jobs/import resource.

sApplicationId :: Lens' SegmentResponse (Maybe Text) Source #

The ID of the application to which the segment applies.

sName :: Lens' SegmentResponse (Maybe Text) Source #

The name of segment

sVersion :: Lens' SegmentResponse (Maybe Int) Source #

The segment version number.

sId :: Lens' SegmentResponse (Maybe Text) Source #

The unique segment ID.

sCreationDate :: Lens' SegmentResponse (Maybe Text) Source #

The date the segment was created in ISO 8601 format.

sDimensions :: Lens' SegmentResponse (Maybe SegmentDimensions) Source #

The segment dimensions attributes.

SegmentsResponse

data SegmentsResponse Source #

Segments in your account.

See: segmentsResponse smart constructor.

Instances
Eq SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SegmentsResponse -> c SegmentsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SegmentsResponse #

toConstr :: SegmentsResponse -> Constr #

dataTypeOf :: SegmentsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SegmentsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SegmentsResponse) #

gmapT :: (forall b. Data b => b -> b) -> SegmentsResponse -> SegmentsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SegmentsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SegmentsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> SegmentsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SegmentsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SegmentsResponse -> m SegmentsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentsResponse -> m SegmentsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SegmentsResponse -> m SegmentsResponse #

Read SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SegmentsResponse :: Type -> Type #

Hashable SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SegmentsResponse -> () #

type Rep SegmentsResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SegmentsResponse = D1 (MetaData "SegmentsResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SegmentsResponse'" PrefixI True) (S1 (MetaSel (Just "_sNextToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sItem") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [SegmentResponse]))))

segmentsResponse :: SegmentsResponse Source #

Creates a value of SegmentsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sNextToken - An identifier used to retrieve the next page of results. The token is null if no additional pages exist.
  • sItem - The list of segments.

sNextToken :: Lens' SegmentsResponse (Maybe Text) Source #

An identifier used to retrieve the next page of results. The token is null if no additional pages exist.

SendUsersMessageRequest

data SendUsersMessageRequest Source #

Send message request.

See: sendUsersMessageRequest smart constructor.

Instances
Eq SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SendUsersMessageRequest -> c SendUsersMessageRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SendUsersMessageRequest #

toConstr :: SendUsersMessageRequest -> Constr #

dataTypeOf :: SendUsersMessageRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SendUsersMessageRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SendUsersMessageRequest) #

gmapT :: (forall b. Data b => b -> b) -> SendUsersMessageRequest -> SendUsersMessageRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SendUsersMessageRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SendUsersMessageRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> SendUsersMessageRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SendUsersMessageRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SendUsersMessageRequest -> m SendUsersMessageRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SendUsersMessageRequest -> m SendUsersMessageRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SendUsersMessageRequest -> m SendUsersMessageRequest #

Read SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SendUsersMessageRequest :: Type -> Type #

Hashable SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SendUsersMessageRequest -> () #

type Rep SendUsersMessageRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SendUsersMessageRequest = D1 (MetaData "SendUsersMessageRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SendUsersMessageRequest'" PrefixI True) (S1 (MetaSel (Just "_sumrContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text))) :*: (S1 (MetaSel (Just "_sumrUsers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text EndpointSendConfiguration))) :*: S1 (MetaSel (Just "_sumrMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DirectMessageConfiguration)))))

sendUsersMessageRequest :: SendUsersMessageRequest Source #

Creates a value of SendUsersMessageRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sumrContext - A map of custom attributes to attributes to be attached to the message. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.
  • sumrUsers - A map of destination endpoints, with the EndpointId as the key Endpoint Message Configuration as the value.
  • sumrMessageConfiguration - Message configuration.

sumrContext :: Lens' SendUsersMessageRequest (HashMap Text Text) Source #

A map of custom attributes to attributes to be attached to the message. This payload is added to the push notification's 'data.pinpoint' object or added to the email/sms delivery receipt event attributes.

sumrUsers :: Lens' SendUsersMessageRequest (HashMap Text EndpointSendConfiguration) Source #

A map of destination endpoints, with the EndpointId as the key Endpoint Message Configuration as the value.

SendUsersMessageResponse

data SendUsersMessageResponse Source #

User send message response.

See: sendUsersMessageResponse smart constructor.

Instances
Eq SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SendUsersMessageResponse -> c SendUsersMessageResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SendUsersMessageResponse #

toConstr :: SendUsersMessageResponse -> Constr #

dataTypeOf :: SendUsersMessageResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SendUsersMessageResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SendUsersMessageResponse) #

gmapT :: (forall b. Data b => b -> b) -> SendUsersMessageResponse -> SendUsersMessageResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SendUsersMessageResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SendUsersMessageResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> SendUsersMessageResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SendUsersMessageResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SendUsersMessageResponse -> m SendUsersMessageResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SendUsersMessageResponse -> m SendUsersMessageResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SendUsersMessageResponse -> m SendUsersMessageResponse #

Read SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SendUsersMessageResponse :: Type -> Type #

Hashable SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SendUsersMessageResponse Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SendUsersMessageResponse = D1 (MetaData "SendUsersMessageResponse" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SendUsersMessageResponse'" PrefixI True) (S1 (MetaSel (Just "_sumRequestId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sumResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text (Map Text EndpointMessageResult)))) :*: S1 (MetaSel (Just "_sumApplicationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

sendUsersMessageResponse :: SendUsersMessageResponse Source #

Creates a value of SendUsersMessageResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sumRequestId - Original request Id for which this message was delivered.
  • sumResult - A map containing of UserId to Map of EndpointId to Endpoint Message Result.
  • sumApplicationId - Application id of the message.

sumRequestId :: Lens' SendUsersMessageResponse (Maybe Text) Source #

Original request Id for which this message was delivered.

sumResult :: Lens' SendUsersMessageResponse (HashMap Text (HashMap Text EndpointMessageResult)) Source #

A map containing of UserId to Map of EndpointId to Endpoint Message Result.

sumApplicationId :: Lens' SendUsersMessageResponse (Maybe Text) Source #

Application id of the message.

SetDimension

data SetDimension Source #

Dimension specification of a segment.

See: setDimension smart constructor.

Instances
Eq SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetDimension -> c SetDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetDimension #

toConstr :: SetDimension -> Constr #

dataTypeOf :: SetDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetDimension) #

gmapT :: (forall b. Data b => b -> b) -> SetDimension -> SetDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetDimension -> m SetDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetDimension -> m SetDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetDimension -> m SetDimension #

Read SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep SetDimension :: Type -> Type #

Hashable SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: SetDimension -> () #

type Rep SetDimension Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep SetDimension = D1 (MetaData "SetDimension" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "SetDimension'" PrefixI True) (S1 (MetaSel (Just "_sdValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_sdDimensionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionType))))

setDimension :: SetDimension Source #

Creates a value of SetDimension with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sdValues - The criteria values for the segment dimension. Endpoints with matching attribute values are included or excluded from the segment, depending on the setting for Type.
  • sdDimensionType - The type of dimension: INCLUSIVE - Endpoints that match the criteria are included in the segment. EXCLUSIVE - Endpoints that match the criteria are excluded from the segment.

sdValues :: Lens' SetDimension [Text] Source #

The criteria values for the segment dimension. Endpoints with matching attribute values are included or excluded from the segment, depending on the setting for Type.

sdDimensionType :: Lens' SetDimension (Maybe DimensionType) Source #

The type of dimension: INCLUSIVE - Endpoints that match the criteria are included in the segment. EXCLUSIVE - Endpoints that match the criteria are excluded from the segment.

TreatmentResource

data TreatmentResource Source #

Treatment resource

See: treatmentResource smart constructor.

Instances
Eq TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TreatmentResource -> c TreatmentResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TreatmentResource #

toConstr :: TreatmentResource -> Constr #

dataTypeOf :: TreatmentResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TreatmentResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TreatmentResource) #

gmapT :: (forall b. Data b => b -> b) -> TreatmentResource -> TreatmentResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TreatmentResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TreatmentResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> TreatmentResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TreatmentResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TreatmentResource -> m TreatmentResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TreatmentResource -> m TreatmentResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TreatmentResource -> m TreatmentResource #

Read TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep TreatmentResource :: Type -> Type #

Hashable TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

FromJSON TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: TreatmentResource -> () #

type Rep TreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep TreatmentResource = D1 (MetaData "TreatmentResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "TreatmentResource'" PrefixI True) ((S1 (MetaSel (Just "_trState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignState)) :*: (S1 (MetaSel (Just "_trSchedule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Schedule)) :*: S1 (MetaSel (Just "_trTreatmentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_trSizePercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: S1 (MetaSel (Just "_trTreatmentDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_trId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_trMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageConfiguration))))))

treatmentResource :: TreatmentResource Source #

Creates a value of TreatmentResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

trTreatmentName :: Lens' TreatmentResource (Maybe Text) Source #

The custom name of a variation of the campaign used for A/B testing.

trSizePercent :: Lens' TreatmentResource (Maybe Int) Source #

The allocated percentage of users for this treatment.

trTreatmentDescription :: Lens' TreatmentResource (Maybe Text) Source #

A custom description for the treatment.

trId :: Lens' TreatmentResource (Maybe Text) Source #

The unique treatment ID.

WriteApplicationSettingsRequest

data WriteApplicationSettingsRequest Source #

Creating application setting request

See: writeApplicationSettingsRequest smart constructor.

Instances
Eq WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriteApplicationSettingsRequest -> c WriteApplicationSettingsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriteApplicationSettingsRequest #

toConstr :: WriteApplicationSettingsRequest -> Constr #

dataTypeOf :: WriteApplicationSettingsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriteApplicationSettingsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WriteApplicationSettingsRequest) #

gmapT :: (forall b. Data b => b -> b) -> WriteApplicationSettingsRequest -> WriteApplicationSettingsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriteApplicationSettingsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriteApplicationSettingsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> WriteApplicationSettingsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriteApplicationSettingsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriteApplicationSettingsRequest -> m WriteApplicationSettingsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteApplicationSettingsRequest -> m WriteApplicationSettingsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteApplicationSettingsRequest -> m WriteApplicationSettingsRequest #

Read WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep WriteApplicationSettingsRequest :: Type -> Type #

Hashable WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteApplicationSettingsRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteApplicationSettingsRequest = D1 (MetaData "WriteApplicationSettingsRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "WriteApplicationSettingsRequest'" PrefixI True) (S1 (MetaSel (Just "_wasrLimits") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignLimits)) :*: (S1 (MetaSel (Just "_wasrQuietTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe QuietTime)) :*: S1 (MetaSel (Just "_wasrCampaignHook") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignHook)))))

writeApplicationSettingsRequest :: WriteApplicationSettingsRequest Source #

Creates a value of WriteApplicationSettingsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • wasrLimits - The default campaign limits for the app. These limits apply to each campaign for the app, unless the campaign overrides the default with limits of its own.
  • wasrQuietTime - The default quiet time for the app. Each campaign for this app sends no messages during this time unless the campaign overrides the default with a quiet time of its own.
  • wasrCampaignHook - Default campaign hook information.

wasrLimits :: Lens' WriteApplicationSettingsRequest (Maybe CampaignLimits) Source #

The default campaign limits for the app. These limits apply to each campaign for the app, unless the campaign overrides the default with limits of its own.

wasrQuietTime :: Lens' WriteApplicationSettingsRequest (Maybe QuietTime) Source #

The default quiet time for the app. Each campaign for this app sends no messages during this time unless the campaign overrides the default with a quiet time of its own.

WriteCampaignRequest

data WriteCampaignRequest Source #

Used to create a campaign.

See: writeCampaignRequest smart constructor.

Instances
Eq WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriteCampaignRequest -> c WriteCampaignRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriteCampaignRequest #

toConstr :: WriteCampaignRequest -> Constr #

dataTypeOf :: WriteCampaignRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriteCampaignRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WriteCampaignRequest) #

gmapT :: (forall b. Data b => b -> b) -> WriteCampaignRequest -> WriteCampaignRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriteCampaignRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriteCampaignRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> WriteCampaignRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriteCampaignRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriteCampaignRequest -> m WriteCampaignRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteCampaignRequest -> m WriteCampaignRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteCampaignRequest -> m WriteCampaignRequest #

Read WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep WriteCampaignRequest :: Type -> Type #

Hashable WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: WriteCampaignRequest -> () #

type Rep WriteCampaignRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteCampaignRequest = D1 (MetaData "WriteCampaignRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "WriteCampaignRequest'" PrefixI True) (((S1 (MetaSel (Just "_wcrSchedule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Schedule)) :*: (S1 (MetaSel (Just "_wcrHook") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignHook)) :*: S1 (MetaSel (Just "_wcrTreatmentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_wcrLimits") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CampaignLimits)) :*: (S1 (MetaSel (Just "_wcrIsPaused") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_wcrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_wcrHoldoutPercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_wcrTreatmentDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wcrMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageConfiguration)))) :*: ((S1 (MetaSel (Just "_wcrDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wcrSegmentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_wcrAdditionalTreatments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [WriteTreatmentResource])) :*: S1 (MetaSel (Just "_wcrSegmentVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))))

writeCampaignRequest :: WriteCampaignRequest Source #

Creates a value of WriteCampaignRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wcrTreatmentName :: Lens' WriteCampaignRequest (Maybe Text) Source #

The custom name of a variation of the campaign used for A/B testing.

wcrLimits :: Lens' WriteCampaignRequest (Maybe CampaignLimits) Source #

The campaign limits settings.

wcrIsPaused :: Lens' WriteCampaignRequest (Maybe Bool) Source #

Indicates whether the campaign is paused. A paused campaign does not send messages unless you resume it by setting IsPaused to false.

wcrName :: Lens' WriteCampaignRequest (Maybe Text) Source #

The custom name of the campaign.

wcrHoldoutPercent :: Lens' WriteCampaignRequest (Maybe Int) Source #

The allocated percentage of end users who will not receive messages from this campaign.

wcrTreatmentDescription :: Lens' WriteCampaignRequest (Maybe Text) Source #

A custom description for the treatment.

wcrDescription :: Lens' WriteCampaignRequest (Maybe Text) Source #

A description of the campaign.

wcrSegmentId :: Lens' WriteCampaignRequest (Maybe Text) Source #

The ID of the segment to which the campaign sends messages.

wcrAdditionalTreatments :: Lens' WriteCampaignRequest [WriteTreatmentResource] Source #

Treatments that are defined in addition to the default treatment.

wcrSegmentVersion :: Lens' WriteCampaignRequest (Maybe Int) Source #

The version of the segment to which the campaign sends messages.

WriteEventStream

data WriteEventStream Source #

Request to save an EventStream.

See: writeEventStream smart constructor.

Instances
Eq WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriteEventStream -> c WriteEventStream #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriteEventStream #

toConstr :: WriteEventStream -> Constr #

dataTypeOf :: WriteEventStream -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriteEventStream) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WriteEventStream) #

gmapT :: (forall b. Data b => b -> b) -> WriteEventStream -> WriteEventStream #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriteEventStream -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriteEventStream -> r #

gmapQ :: (forall d. Data d => d -> u) -> WriteEventStream -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriteEventStream -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriteEventStream -> m WriteEventStream #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteEventStream -> m WriteEventStream #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteEventStream -> m WriteEventStream #

Read WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep WriteEventStream :: Type -> Type #

Hashable WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: WriteEventStream -> () #

type Rep WriteEventStream Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteEventStream = D1 (MetaData "WriteEventStream" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "WriteEventStream'" PrefixI True) (S1 (MetaSel (Just "_wesDestinationStreamARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wesRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

writeEventStream :: WriteEventStream Source #

Creates a value of WriteEventStream with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • wesDestinationStreamARN - The Amazon Resource Name (ARN) of the Amazon Kinesis stream or Firehose delivery stream to which you want to publish events. Firehose ARN: arn:aws:firehose:REGION:ACCOUNT_ID:deliverystreamSTREAM_NAME Kinesis ARN: arn:aws:kinesis:REGION:ACCOUNT_ID:streamSTREAM_NAME
  • wesRoleARN - The IAM role that authorizes Amazon Pinpoint to publish events to the stream in your account.

wesDestinationStreamARN :: Lens' WriteEventStream (Maybe Text) Source #

The Amazon Resource Name (ARN) of the Amazon Kinesis stream or Firehose delivery stream to which you want to publish events. Firehose ARN: arn:aws:firehose:REGION:ACCOUNT_ID:deliverystreamSTREAM_NAME Kinesis ARN: arn:aws:kinesis:REGION:ACCOUNT_ID:streamSTREAM_NAME

wesRoleARN :: Lens' WriteEventStream (Maybe Text) Source #

The IAM role that authorizes Amazon Pinpoint to publish events to the stream in your account.

WriteSegmentRequest

data WriteSegmentRequest Source #

Segment definition.

See: writeSegmentRequest smart constructor.

Instances
Eq WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriteSegmentRequest -> c WriteSegmentRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriteSegmentRequest #

toConstr :: WriteSegmentRequest -> Constr #

dataTypeOf :: WriteSegmentRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriteSegmentRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WriteSegmentRequest) #

gmapT :: (forall b. Data b => b -> b) -> WriteSegmentRequest -> WriteSegmentRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriteSegmentRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriteSegmentRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> WriteSegmentRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriteSegmentRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriteSegmentRequest -> m WriteSegmentRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteSegmentRequest -> m WriteSegmentRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteSegmentRequest -> m WriteSegmentRequest #

Read WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep WriteSegmentRequest :: Type -> Type #

Hashable WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: WriteSegmentRequest -> () #

type Rep WriteSegmentRequest Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteSegmentRequest = D1 (MetaData "WriteSegmentRequest" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "WriteSegmentRequest'" PrefixI True) (S1 (MetaSel (Just "_wsrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wsrDimensions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SegmentDimensions))))

writeSegmentRequest :: WriteSegmentRequest Source #

Creates a value of WriteSegmentRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wsrDimensions :: Lens' WriteSegmentRequest (Maybe SegmentDimensions) Source #

The segment dimensions attributes.

WriteTreatmentResource

data WriteTreatmentResource Source #

Used to create a campaign treatment.

See: writeTreatmentResource smart constructor.

Instances
Eq WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Data WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WriteTreatmentResource -> c WriteTreatmentResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WriteTreatmentResource #

toConstr :: WriteTreatmentResource -> Constr #

dataTypeOf :: WriteTreatmentResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WriteTreatmentResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WriteTreatmentResource) #

gmapT :: (forall b. Data b => b -> b) -> WriteTreatmentResource -> WriteTreatmentResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WriteTreatmentResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WriteTreatmentResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> WriteTreatmentResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WriteTreatmentResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WriteTreatmentResource -> m WriteTreatmentResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteTreatmentResource -> m WriteTreatmentResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WriteTreatmentResource -> m WriteTreatmentResource #

Read WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Show WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Generic WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Associated Types

type Rep WriteTreatmentResource :: Type -> Type #

Hashable WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

ToJSON WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

NFData WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

Methods

rnf :: WriteTreatmentResource -> () #

type Rep WriteTreatmentResource Source # 
Instance details

Defined in Network.AWS.Pinpoint.Types.Product

type Rep WriteTreatmentResource = D1 (MetaData "WriteTreatmentResource" "Network.AWS.Pinpoint.Types.Product" "amazonka-pinpoint-1.6.1-4ftRHSGuITY77Rh0OQCFbU" False) (C1 (MetaCons "WriteTreatmentResource'" PrefixI True) ((S1 (MetaSel (Just "_wtrSchedule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Schedule)) :*: S1 (MetaSel (Just "_wtrTreatmentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_wtrSizePercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)) :*: (S1 (MetaSel (Just "_wtrTreatmentDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_wtrMessageConfiguration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageConfiguration))))))

writeTreatmentResource :: WriteTreatmentResource Source #

Creates a value of WriteTreatmentResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wtrTreatmentName :: Lens' WriteTreatmentResource (Maybe Text) Source #

The custom name of a variation of the campaign used for A/B testing.

wtrSizePercent :: Lens' WriteTreatmentResource (Maybe Int) Source #

The allocated percentage of users for this treatment.

wtrTreatmentDescription :: Lens' WriteTreatmentResource (Maybe Text) Source #

A custom description for the treatment.