amazonka-cloudtrail-1.4.4: Amazon CloudTrail SDK.

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

Network.AWS.CloudTrail

Contents

Description

AWS CloudTrail

This is the CloudTrail API Reference. It provides descriptions of actions, data types, common parameters, and common errors for CloudTrail.

CloudTrail is a web service that records AWS API calls for your AWS account and delivers log files to an Amazon S3 bucket. The recorded information includes the identity of the user, the start time of the AWS API call, the source IP address, the request parameters, and the response elements returned by the service.

As an alternative to the API, you can use one of the AWS SDKs, which consist of libraries and sample code for various programming languages and platforms (Java, Ruby, .NET, iOS, Android, etc.). The SDKs provide a convenient way to create programmatic access to AWSCloudTrail. For example, the SDKs take care of cryptographically signing requests, managing errors, and retrying requests automatically. For information about the AWS SDKs, including how to download and install them, see the Tools for Amazon Web Services page.

See the CloudTrail User Guide for information about the data that is included with each AWS API call listed in the log files.

Synopsis

Service Configuration

cloudTrail :: Service Source #

API version '2013-11-01' of the Amazon CloudTrail SDK configuration.

Errors

Error matchers are designed for use with the functions provided by Control.Exception.Lens. This allows catching (and rethrowing) service specific errors returned by CloudTrail.

InvalidTimeRangeException

_InvalidTimeRangeException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Occurs if the timestamp values are invalid. Either the start time occurs after the end time or the time range is outside the range of possible values.

InsufficientS3BucketPolicyException

_InsufficientS3BucketPolicyException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the policy on the S3 bucket is not sufficient.

MaximumNumberOfTrailsExceededException

_MaximumNumberOfTrailsExceededException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the maximum number of trails is reached.

UnsupportedOperationException

_UnsupportedOperationException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the requested operation is not supported.

KMSKeyDisabledException

InsufficientEncryptionPolicyException

_InsufficientEncryptionPolicyException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the policy on the S3 bucket or KMS key is not sufficient.

InsufficientSNSTopicPolicyException

_InsufficientSNSTopicPolicyException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the policy on the SNS topic is not sufficient.

InvalidCloudWatchLogsRoleARNException

_InvalidCloudWatchLogsRoleARNException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided role is not valid.

TagsLimitExceededException

_TagsLimitExceededException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The number of tags per trail has exceeded the permitted amount. Currently, the limit is 10.

CloudTrailARNInvalidException

_CloudTrailARNInvalidException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when an operation is called with an invalid trail ARN. The format of a trail ARN is:

'arn:aws:cloudtrail:us-east-1:123456789012:trail\/MyTrail'

InvalidLookupAttributesException

_InvalidLookupAttributesException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Occurs when an invalid lookup attribute is specified.

InvalidTrailNameException

_InvalidTrailNameException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided trail name is not valid. Trail names must meet the following requirements:

  • Contain only ASCII letters (a-z, A-Z), numbers (0-9), periods (.), underscores (_), or dashes (-)
  • Start with a letter or number, and end with a letter or number
  • Be between 3 and 128 characters
  • Have no adjacent periods, underscores or dashes. Names like 'my-_namespace' and my are invalid.
  • Not be in IP address format (for example, 192.168.5.4)

InvalidSNSTopicNameException

_InvalidSNSTopicNameException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided SNS topic name is not valid.

ResourceTypeNotSupportedException

_ResourceTypeNotSupportedException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the specified resource type is not supported by CloudTrail.

CloudWatchLogsDeliveryUnavailableException

_CloudWatchLogsDeliveryUnavailableException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Cannot set a CloudWatch Logs delivery for this region.

KMSKeyNotFoundException

_KMSKeyNotFoundException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the KMS key does not exist, or when the S3 bucket and the KMS key are not in the same region.

TrailNotFoundException

_TrailNotFoundException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the trail with the given name is not found.

TrailNotProvidedException

InvalidS3BucketNameException

_InvalidS3BucketNameException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided S3 bucket name is not valid.

InvalidCloudWatchLogsLogGroupARNException

_InvalidCloudWatchLogsLogGroupARNException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided CloudWatch log group is not valid.

KMSException

_KMSException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when there is an issue with the specified KMS key and the trail can’t be updated.

S3BucketDoesNotExistException

_S3BucketDoesNotExistException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the specified S3 bucket does not exist.

InvalidNextTokenException

_InvalidNextTokenException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Invalid token or token that was previously used in a request with different parameters. This exception is thrown if the token is invalid.

InvalidTagParameterException

_InvalidTagParameterException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the key or value specified for the tag does not match the regular expression '^([\\p{L}\\p{Z}\\p{N}_.:/=+\\-']*)>'.

OperationNotPermittedException

_OperationNotPermittedException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the requested operation is not permitted.

InvalidTokenException

InvalidMaxResultsException

_InvalidMaxResultsException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown if the limit specified is invalid.

TrailAlreadyExistsException

_TrailAlreadyExistsException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the specified trail already exists.

InvalidS3PrefixException

_InvalidS3PrefixException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the provided S3 prefix is not valid.

ResourceNotFoundException

_ResourceNotFoundException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the specified resource is not found.

InvalidParameterCombinationException

_InvalidParameterCombinationException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the combination of parameters provided is not valid.

InvalidKMSKeyIdException

_InvalidKMSKeyIdException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when the KMS key ARN is invalid.

InvalidHomeRegionException

_InvalidHomeRegionException :: AsError a => Getting (First ServiceError) a ServiceError Source #

This exception is thrown when an operation is called on a trail from a region other than the region in which the trail was created.

Waiters

Waiters poll by repeatedly sending a request until some remote success condition configured by the Wait specification is fulfilled. The Wait specification determines how many attempts should be made, in addition to delay and retry strategies.

Operations

Some AWS operations return results that are incomplete and require subsequent requests in order to obtain the entire result set. The process of sending subsequent requests to continue where a previous request left off is called pagination. For example, the ListObjects operation of Amazon S3 returns up to 1000 objects at a time, and you must send subsequent requests with the appropriate Marker in order to retrieve the next page of results.

Operations that have an AWSPager instance can transparently perform subsequent requests, correctly setting Markers and other request facets to iterate through the entire result set of a truncated API operation. Operations which support this have an additional note in the documentation.

Many operations have the ability to filter results on the server side. See the individual operation parameters for details.

DescribeTrails

ListPublicKeys

RemoveTags

LookupEvents

StopLogging

DeleteTrail

UpdateTrail

CreateTrail

GetTrailStatus

AddTags

ListTags

StartLogging

Types

LookupAttributeKey

data LookupAttributeKey Source #

Instances

Bounded LookupAttributeKey Source # 
Enum LookupAttributeKey Source # 
Eq LookupAttributeKey Source # 
Data LookupAttributeKey Source # 

Methods

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

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

toConstr :: LookupAttributeKey -> Constr #

dataTypeOf :: LookupAttributeKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord LookupAttributeKey Source # 
Read LookupAttributeKey Source # 
Show LookupAttributeKey Source # 
Generic LookupAttributeKey Source # 
Hashable LookupAttributeKey Source # 
NFData LookupAttributeKey Source # 

Methods

rnf :: LookupAttributeKey -> () #

ToHeader LookupAttributeKey Source # 
ToQuery LookupAttributeKey Source # 
ToByteString LookupAttributeKey Source # 
ToJSON LookupAttributeKey Source # 
FromText LookupAttributeKey Source # 

Methods

parser :: Parser LookupAttributeKey #

ToText LookupAttributeKey Source # 
type Rep LookupAttributeKey Source # 
type Rep LookupAttributeKey = D1 (MetaData "LookupAttributeKey" "Network.AWS.CloudTrail.Types.Sum" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) ((:+:) ((:+:) (C1 (MetaCons "EventId" PrefixI False) U1) (C1 (MetaCons "EventName" PrefixI False) U1)) ((:+:) (C1 (MetaCons "ResourceName" PrefixI False) U1) ((:+:) (C1 (MetaCons "ResourceType" PrefixI False) U1) (C1 (MetaCons "Username" PrefixI False) U1))))

Event

data Event Source #

Contains information about an event that was returned by a lookup request. The result includes a representation of a CloudTrail event.

See: event smart constructor.

Instances

Eq Event Source # 

Methods

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

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

Data Event Source # 

Methods

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

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

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Event Source # 
Show Event Source # 

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Generic Event Source # 

Associated Types

type Rep Event :: * -> * #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

Hashable Event Source # 

Methods

hashWithSalt :: Int -> Event -> Int #

hash :: Event -> Int #

NFData Event Source # 

Methods

rnf :: Event -> () #

FromJSON Event Source # 

Methods

parseJSON :: Value -> Parser Event #

type Rep Event Source # 

event :: Event Source #

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

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

eUsername :: Lens' Event (Maybe Text) Source #

A user name or role name of the requester that called the API in the event returned.

eResources :: Lens' Event [Resource] Source #

A list of resources referenced by the event returned.

eEventTime :: Lens' Event (Maybe UTCTime) Source #

The date and time of the event returned.

eCloudTrailEvent :: Lens' Event (Maybe Text) Source #

A JSON string that contains a representation of the event returned.

eEventName :: Lens' Event (Maybe Text) Source #

The name of the event returned.

eEventId :: Lens' Event (Maybe Text) Source #

The CloudTrail ID of the event returned.

LookupAttribute

data LookupAttribute Source #

Specifies an attribute and value that filter the events returned.

See: lookupAttribute smart constructor.

Instances

Eq LookupAttribute Source # 
Data LookupAttribute Source # 

Methods

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

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

toConstr :: LookupAttribute -> Constr #

dataTypeOf :: LookupAttribute -> DataType #

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

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

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

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

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

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

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

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

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

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

Read LookupAttribute Source # 
Show LookupAttribute Source # 
Generic LookupAttribute Source # 
Hashable LookupAttribute Source # 
NFData LookupAttribute Source # 

Methods

rnf :: LookupAttribute -> () #

ToJSON LookupAttribute Source # 
type Rep LookupAttribute Source # 
type Rep LookupAttribute = D1 (MetaData "LookupAttribute" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "LookupAttribute'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_laAttributeKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 LookupAttributeKey)) (S1 (MetaSel (Just Symbol "_laAttributeValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

lookupAttribute Source #

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

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

laAttributeKey :: Lens' LookupAttribute LookupAttributeKey Source #

Specifies an attribute on which to filter the events returned.

laAttributeValue :: Lens' LookupAttribute Text Source #

Specifies a value for the specified AttributeKey.

PublicKey

data PublicKey Source #

Contains information about a returned public key.

See: publicKey smart constructor.

Instances

Eq PublicKey Source # 
Data PublicKey Source # 

Methods

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

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

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Read PublicKey Source # 
Show PublicKey Source # 
Generic PublicKey Source # 

Associated Types

type Rep PublicKey :: * -> * #

Hashable PublicKey Source # 
NFData PublicKey Source # 

Methods

rnf :: PublicKey -> () #

FromJSON PublicKey Source # 

Methods

parseJSON :: Value -> Parser PublicKey #

type Rep PublicKey Source # 
type Rep PublicKey = D1 (MetaData "PublicKey" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "PublicKey'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_pkFingerprint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_pkValidityEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)))) ((:*:) (S1 (MetaSel (Just Symbol "_pkValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Base64))) (S1 (MetaSel (Just Symbol "_pkValidityStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))))))

publicKey :: PublicKey Source #

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

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

pkFingerprint :: Lens' PublicKey (Maybe Text) Source #

The fingerprint of the public key.

pkValidityEndTime :: Lens' PublicKey (Maybe UTCTime) Source #

The ending time of validity of the public key.

pkValue :: Lens' PublicKey (Maybe ByteString) Source #

The DER encoded public key value in PKCS#1 format.

Note: This Lens automatically encodes and decodes Base64 data, despite what the AWS documentation might say. The underlying isomorphism will encode to Base64 representation during serialisation, and decode from Base64 representation during deserialisation. This Lens accepts and returns only raw unencoded data.

pkValidityStartTime :: Lens' PublicKey (Maybe UTCTime) Source #

The starting time of validity of the public key.

Resource

data Resource Source #

Specifies the type and name of a resource referenced by an event.

See: resource smart constructor.

Instances

Eq Resource Source # 
Data Resource Source # 

Methods

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

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

toConstr :: Resource -> Constr #

dataTypeOf :: Resource -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Resource Source # 
Show Resource Source # 
Generic Resource Source # 

Associated Types

type Rep Resource :: * -> * #

Methods

from :: Resource -> Rep Resource x #

to :: Rep Resource x -> Resource #

Hashable Resource Source # 

Methods

hashWithSalt :: Int -> Resource -> Int #

hash :: Resource -> Int #

NFData Resource Source # 

Methods

rnf :: Resource -> () #

FromJSON Resource Source # 

Methods

parseJSON :: Value -> Parser Resource #

type Rep Resource Source # 
type Rep Resource = D1 (MetaData "Resource" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "Resource'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_rResourceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_rResourceName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

resource :: Resource Source #

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

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

rResourceType :: Lens' Resource (Maybe Text) Source #

The type of a resource referenced by the event returned. When the resource type cannot be determined, null is returned. Some examples of resource types are: Instance for EC2, Trail for CloudTrail, DBInstance for RDS, and AccessKey for IAM. For a list of resource types supported for event lookup, see Resource Types Supported for Event Lookup.

rResourceName :: Lens' Resource (Maybe Text) Source #

The name of the resource referenced by the event returned. These are user-created names whose values will depend on the environment. For example, the resource name might be "auto-scaling-test-group" for an Auto Scaling Group or "i-1234567" for an EC2 Instance.

ResourceTag

data ResourceTag Source #

A resource tag.

See: resourceTag smart constructor.

Instances

Eq ResourceTag Source # 
Data ResourceTag Source # 

Methods

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

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

toConstr :: ResourceTag -> Constr #

dataTypeOf :: ResourceTag -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ResourceTag Source # 
Show ResourceTag Source # 
Generic ResourceTag Source # 

Associated Types

type Rep ResourceTag :: * -> * #

Hashable ResourceTag Source # 
NFData ResourceTag Source # 

Methods

rnf :: ResourceTag -> () #

FromJSON ResourceTag Source # 

Methods

parseJSON :: Value -> Parser ResourceTag #

type Rep ResourceTag Source # 
type Rep ResourceTag = D1 (MetaData "ResourceTag" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "ResourceTag'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_rResourceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_rTagsList") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Tag])))))

resourceTag :: ResourceTag Source #

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

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

rResourceId :: Lens' ResourceTag (Maybe Text) Source #

Specifies the ARN of the resource.

rTagsList :: Lens' ResourceTag [Tag] Source #

Undocumented member.

Tag

data Tag Source #

A custom key-value pair associated with a resource such as a CloudTrail trail.

See: tag smart constructor.

Instances

Eq Tag Source # 

Methods

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

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

Data Tag Source # 

Methods

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

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

toConstr :: Tag -> Constr #

dataTypeOf :: Tag -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Tag Source # 
Show Tag Source # 

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Generic Tag Source # 

Associated Types

type Rep Tag :: * -> * #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Hashable Tag Source # 

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

NFData Tag Source # 

Methods

rnf :: Tag -> () #

FromJSON Tag Source # 

Methods

parseJSON :: Value -> Parser Tag #

ToJSON Tag Source # 

Methods

toJSON :: Tag -> Value #

toEncoding :: Tag -> Encoding #

type Rep Tag Source # 
type Rep Tag = D1 (MetaData "Tag" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "Tag'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_tagValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tagKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

tag Source #

Arguments

:: Text

tagKey

-> Tag 

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

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

tagValue :: Lens' Tag (Maybe Text) Source #

The value in a key-value pair of a tag. The value must be no longer than 256 Unicode characters.

tagKey :: Lens' Tag Text Source #

The key in a key-value pair. The key must be must be no longer than 128 Unicode characters. The key must be unique for the resource to which it applies.

Trail

data Trail Source #

The settings for a trail.

See: trail smart constructor.

Instances

Eq Trail Source # 

Methods

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

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

Data Trail Source # 

Methods

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

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

toConstr :: Trail -> Constr #

dataTypeOf :: Trail -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Trail Source # 
Show Trail Source # 

Methods

showsPrec :: Int -> Trail -> ShowS #

show :: Trail -> String #

showList :: [Trail] -> ShowS #

Generic Trail Source # 

Associated Types

type Rep Trail :: * -> * #

Methods

from :: Trail -> Rep Trail x #

to :: Rep Trail x -> Trail #

Hashable Trail Source # 

Methods

hashWithSalt :: Int -> Trail -> Int #

hash :: Trail -> Int #

NFData Trail Source # 

Methods

rnf :: Trail -> () #

FromJSON Trail Source # 

Methods

parseJSON :: Value -> Parser Trail #

type Rep Trail Source # 
type Rep Trail = D1 (MetaData "Trail" "Network.AWS.CloudTrail.Types.Product" "amazonka-cloudtrail-1.4.4-CFl1fhv2axW38NoqMQAxHX" False) (C1 (MetaCons "Trail'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tLogFileValidationEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_tTrailARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tS3KeyPrefix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_tSNSTopicARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_tSNSTopicName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tCloudWatchLogsLogGroupARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_tHomeRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tIncludeGlobalServiceEvents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_tCloudWatchLogsRoleARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_tS3BucketName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tIsMultiRegionTrail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))))

tLogFileValidationEnabled :: Lens' Trail (Maybe Bool) Source #

Specifies whether log file validation is enabled.

tTrailARN :: Lens' Trail (Maybe Text) Source #

Specifies the ARN of the trail. The format of a trail ARN is:

'arn:aws:cloudtrail:us-east-1:123456789012:trail\/MyTrail'

tS3KeyPrefix :: Lens' Trail (Maybe Text) Source #

Specifies the Amazon S3 key prefix that comes after the name of the bucket you have designated for log file delivery. For more information, see Finding Your CloudTrail Log Files.The maximum length is 200 characters.

tSNSTopicARN :: Lens' Trail (Maybe Text) Source #

Specifies the ARN of the Amazon SNS topic that CloudTrail uses to send notifications when log files are delivered. The format of a topic ARN is:

'arn:aws:sns:us-east-1:123456789012:MyTopic'

tSNSTopicName :: Lens' Trail (Maybe Text) Source #

This field is deprecated. Use SnsTopicARN.

tCloudWatchLogsLogGroupARN :: Lens' Trail (Maybe Text) Source #

Specifies an Amazon Resource Name (ARN), a unique identifier that represents the log group to which CloudTrail logs will be delivered.

tKMSKeyId :: Lens' Trail (Maybe Text) Source #

Specifies the KMS key ID that encrypts the logs delivered by CloudTrail. The value is a fully specified ARN to a KMS key in the format:

'arn:aws:kms:us-east-1:123456789012:key\/12345678-1234-1234-1234-123456789012'

tHomeRegion :: Lens' Trail (Maybe Text) Source #

The region in which the trail was created.

tName :: Lens' Trail (Maybe Text) Source #

Name of the trail set by calling CreateTrail. The maximum length is 128 characters.

tIncludeGlobalServiceEvents :: Lens' Trail (Maybe Bool) Source #

Set to True to include AWS API calls from AWS global services such as IAM. Otherwise, False.

tCloudWatchLogsRoleARN :: Lens' Trail (Maybe Text) Source #

Specifies the role for the CloudWatch Logs endpoint to assume to write to a user's log group.

tS3BucketName :: Lens' Trail (Maybe Text) Source #

Name of the Amazon S3 bucket into which CloudTrail delivers your trail files. See Amazon S3 Bucket Naming Requirements.

tIsMultiRegionTrail :: Lens' Trail (Maybe Bool) Source #

Specifies whether the trail belongs only to one region or exists in all regions.