| Copyright | (c) 2013-2023 Brendan Hay |
|---|---|
| License | Mozilla Public License, v. 2.0. |
| Maintainer | Brendan Hay |
| Stability | auto-generated |
| Portability | non-portable (GHC extensions) |
| Safe Haskell | Safe-Inferred |
| Language | Haskell2010 |
Amazonka.LookoutMetrics
Contents
- Service Configuration
- Errors
- Waiters
- Operations
- ActivateAnomalyDetector
- BackTestAnomalyDetector
- CreateAlert
- CreateAnomalyDetector
- CreateMetricSet
- DeactivateAnomalyDetector
- DeleteAlert
- DeleteAnomalyDetector
- DescribeAlert
- DescribeAnomalyDetectionExecutions
- DescribeAnomalyDetector
- DescribeMetricSet
- DetectMetricSetConfig
- GetAnomalyGroup
- GetDataQualityMetrics
- GetFeedback
- GetSampleData
- ListAlerts
- ListAnomalyDetectors
- ListAnomalyGroupRelatedMetrics
- ListAnomalyGroupSummaries
- ListAnomalyGroupTimeSeries
- ListMetricSets
- ListTagsForResource
- PutFeedback
- TagResource
- UntagResource
- UpdateAlert
- UpdateAnomalyDetector
- UpdateMetricSet
- Types
- AggregationFunction
- AlertStatus
- AlertType
- AnomalyDetectionTaskStatus
- AnomalyDetectorFailureType
- AnomalyDetectorStatus
- CSVFileCompression
- Confidence
- DataQualityMetricType
- FilterOperation
- Frequency
- JsonFileCompression
- RelationshipType
- SnsFormat
- Action
- Alert
- AlertFilters
- AlertSummary
- AnomalyDetectorConfig
- AnomalyDetectorConfigSummary
- AnomalyDetectorDataQualityMetric
- AnomalyDetectorSummary
- AnomalyGroup
- AnomalyGroupStatistics
- AnomalyGroupSummary
- AnomalyGroupTimeSeries
- AnomalyGroupTimeSeriesFeedback
- AppFlowConfig
- AthenaSourceConfig
- AttributeValue
- AutoDetectionMetricSource
- AutoDetectionS3SourceConfig
- BackTestConfiguration
- CloudWatchConfig
- ContributionMatrix
- CsvFormatDescriptor
- DataQualityMetric
- DetectedCsvFormatDescriptor
- DetectedField
- DetectedFileFormatDescriptor
- DetectedJsonFormatDescriptor
- DetectedMetricSetConfig
- DetectedMetricSource
- DetectedS3SourceConfig
- DimensionContribution
- DimensionFilter
- DimensionNameValue
- DimensionValueContribution
- ExecutionStatus
- FileFormatDescriptor
- Filter
- InterMetricImpactDetails
- ItemizedMetricStats
- JsonFormatDescriptor
- LambdaConfiguration
- Metric
- MetricLevelImpact
- MetricSetDataQualityMetric
- MetricSetDimensionFilter
- MetricSetSummary
- MetricSource
- RDSSourceConfig
- RedshiftSourceConfig
- S3SourceConfig
- SNSConfiguration
- SampleDataS3SourceConfig
- TimeSeries
- TimeSeriesFeedback
- TimestampColumn
- VpcConfiguration
Description
Derived from API version 2017-07-25 of the AWS service descriptions, licensed under Apache 2.0.
This is the Amazon Lookout for Metrics API Reference. For an introduction to the service with tutorials for getting started, visit Amazon Lookout for Metrics Developer Guide.
Synopsis
- defaultService :: Service
- _AccessDeniedException :: AsError a => Fold a ServiceError
- _ConflictException :: AsError a => Fold a ServiceError
- _InternalServerException :: AsError a => Fold a ServiceError
- _ResourceNotFoundException :: AsError a => Fold a ServiceError
- _ServiceQuotaExceededException :: AsError a => Fold a ServiceError
- _TooManyRequestsException :: AsError a => Fold a ServiceError
- _ValidationException :: AsError a => Fold a ServiceError
- data ActivateAnomalyDetector = ActivateAnomalyDetector' Text
- newActivateAnomalyDetector :: Text -> ActivateAnomalyDetector
- data ActivateAnomalyDetectorResponse = ActivateAnomalyDetectorResponse' Int
- newActivateAnomalyDetectorResponse :: Int -> ActivateAnomalyDetectorResponse
- data BackTestAnomalyDetector = BackTestAnomalyDetector' Text
- newBackTestAnomalyDetector :: Text -> BackTestAnomalyDetector
- data BackTestAnomalyDetectorResponse = BackTestAnomalyDetectorResponse' Int
- newBackTestAnomalyDetectorResponse :: Int -> BackTestAnomalyDetectorResponse
- data CreateAlert = CreateAlert' (Maybe Text) (Maybe AlertFilters) (Maybe Natural) (Maybe (HashMap Text Text)) Text Text Action
- newCreateAlert :: Text -> Text -> Action -> CreateAlert
- data CreateAlertResponse = CreateAlertResponse' (Maybe Text) Int
- newCreateAlertResponse :: Int -> CreateAlertResponse
- data CreateAnomalyDetector = CreateAnomalyDetector' (Maybe Text) (Maybe Text) (Maybe (HashMap Text Text)) Text AnomalyDetectorConfig
- newCreateAnomalyDetector :: Text -> AnomalyDetectorConfig -> CreateAnomalyDetector
- data CreateAnomalyDetectorResponse = CreateAnomalyDetectorResponse' (Maybe Text) Int
- newCreateAnomalyDetectorResponse :: Int -> CreateAnomalyDetectorResponse
- data CreateMetricSet = CreateMetricSet' (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe Text) (Maybe Frequency) (Maybe Natural) (Maybe (HashMap Text Text)) (Maybe TimestampColumn) (Maybe Text) Text Text (NonEmpty Metric) MetricSource
- newCreateMetricSet :: Text -> Text -> NonEmpty Metric -> MetricSource -> CreateMetricSet
- data CreateMetricSetResponse = CreateMetricSetResponse' (Maybe Text) Int
- newCreateMetricSetResponse :: Int -> CreateMetricSetResponse
- data DeactivateAnomalyDetector = DeactivateAnomalyDetector' Text
- newDeactivateAnomalyDetector :: Text -> DeactivateAnomalyDetector
- data DeactivateAnomalyDetectorResponse = DeactivateAnomalyDetectorResponse' Int
- newDeactivateAnomalyDetectorResponse :: Int -> DeactivateAnomalyDetectorResponse
- data DeleteAlert = DeleteAlert' Text
- newDeleteAlert :: Text -> DeleteAlert
- data DeleteAlertResponse = DeleteAlertResponse' Int
- newDeleteAlertResponse :: Int -> DeleteAlertResponse
- data DeleteAnomalyDetector = DeleteAnomalyDetector' Text
- newDeleteAnomalyDetector :: Text -> DeleteAnomalyDetector
- data DeleteAnomalyDetectorResponse = DeleteAnomalyDetectorResponse' Int
- newDeleteAnomalyDetectorResponse :: Int -> DeleteAnomalyDetectorResponse
- data DescribeAlert = DescribeAlert' Text
- newDescribeAlert :: Text -> DescribeAlert
- data DescribeAlertResponse = DescribeAlertResponse' (Maybe Alert) Int
- newDescribeAlertResponse :: Int -> DescribeAlertResponse
- data DescribeAnomalyDetectionExecutions = DescribeAnomalyDetectionExecutions' (Maybe Natural) (Maybe Text) (Maybe Text) Text
- newDescribeAnomalyDetectionExecutions :: Text -> DescribeAnomalyDetectionExecutions
- data DescribeAnomalyDetectionExecutionsResponse = DescribeAnomalyDetectionExecutionsResponse' (Maybe [ExecutionStatus]) (Maybe Text) Int
- newDescribeAnomalyDetectionExecutionsResponse :: Int -> DescribeAnomalyDetectionExecutionsResponse
- data DescribeAnomalyDetector = DescribeAnomalyDetector' Text
- newDescribeAnomalyDetector :: Text -> DescribeAnomalyDetector
- data DescribeAnomalyDetectorResponse = DescribeAnomalyDetectorResponse' (Maybe Text) (Maybe AnomalyDetectorConfigSummary) (Maybe Text) (Maybe Text) (Maybe POSIX) (Maybe Text) (Maybe AnomalyDetectorFailureType) (Maybe Text) (Maybe POSIX) (Maybe AnomalyDetectorStatus) Int
- newDescribeAnomalyDetectorResponse :: Int -> DescribeAnomalyDetectorResponse
- data DescribeMetricSet = DescribeMetricSet' Text
- newDescribeMetricSet :: Text -> DescribeMetricSet
- data DescribeMetricSetResponse = DescribeMetricSetResponse' (Maybe Text) (Maybe POSIX) (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe POSIX) (Maybe (NonEmpty Metric)) (Maybe Text) (Maybe Text) (Maybe Frequency) (Maybe Text) (Maybe MetricSource) (Maybe Natural) (Maybe TimestampColumn) (Maybe Text) Int
- newDescribeMetricSetResponse :: Int -> DescribeMetricSetResponse
- data DetectMetricSetConfig = DetectMetricSetConfig' Text AutoDetectionMetricSource
- newDetectMetricSetConfig :: Text -> AutoDetectionMetricSource -> DetectMetricSetConfig
- data DetectMetricSetConfigResponse = DetectMetricSetConfigResponse' (Maybe DetectedMetricSetConfig) Int
- newDetectMetricSetConfigResponse :: Int -> DetectMetricSetConfigResponse
- data GetAnomalyGroup = GetAnomalyGroup' Text Text
- newGetAnomalyGroup :: Text -> Text -> GetAnomalyGroup
- data GetAnomalyGroupResponse = GetAnomalyGroupResponse' (Maybe AnomalyGroup) Int
- newGetAnomalyGroupResponse :: Int -> GetAnomalyGroupResponse
- data GetDataQualityMetrics = GetDataQualityMetrics' (Maybe Text) Text
- newGetDataQualityMetrics :: Text -> GetDataQualityMetrics
- data GetDataQualityMetricsResponse = GetDataQualityMetricsResponse' (Maybe [AnomalyDetectorDataQualityMetric]) Int
- newGetDataQualityMetricsResponse :: Int -> GetDataQualityMetricsResponse
- data GetFeedback = GetFeedback' (Maybe Natural) (Maybe Text) Text AnomalyGroupTimeSeries
- newGetFeedback :: Text -> AnomalyGroupTimeSeries -> GetFeedback
- data GetFeedbackResponse = GetFeedbackResponse' (Maybe [TimeSeriesFeedback]) (Maybe Text) Int
- newGetFeedbackResponse :: Int -> GetFeedbackResponse
- data GetSampleData = GetSampleData' (Maybe SampleDataS3SourceConfig)
- newGetSampleData :: GetSampleData
- data GetSampleDataResponse = GetSampleDataResponse' (Maybe [Text]) (Maybe [[Text]]) Int
- newGetSampleDataResponse :: Int -> GetSampleDataResponse
- data ListAlerts = ListAlerts' (Maybe Text) (Maybe Natural) (Maybe Text)
- newListAlerts :: ListAlerts
- data ListAlertsResponse = ListAlertsResponse' (Maybe [AlertSummary]) (Maybe Text) Int
- newListAlertsResponse :: Int -> ListAlertsResponse
- data ListAnomalyDetectors = ListAnomalyDetectors' (Maybe Natural) (Maybe Text)
- newListAnomalyDetectors :: ListAnomalyDetectors
- data ListAnomalyDetectorsResponse = ListAnomalyDetectorsResponse' (Maybe [AnomalyDetectorSummary]) (Maybe Text) Int
- newListAnomalyDetectorsResponse :: Int -> ListAnomalyDetectorsResponse
- data ListAnomalyGroupRelatedMetrics = ListAnomalyGroupRelatedMetrics' (Maybe Natural) (Maybe Text) (Maybe RelationshipType) Text Text
- newListAnomalyGroupRelatedMetrics :: Text -> Text -> ListAnomalyGroupRelatedMetrics
- data ListAnomalyGroupRelatedMetricsResponse = ListAnomalyGroupRelatedMetricsResponse' (Maybe [InterMetricImpactDetails]) (Maybe Text) Int
- newListAnomalyGroupRelatedMetricsResponse :: Int -> ListAnomalyGroupRelatedMetricsResponse
- data ListAnomalyGroupSummaries = ListAnomalyGroupSummaries' (Maybe Natural) (Maybe Text) Text Natural
- newListAnomalyGroupSummaries :: Text -> Natural -> ListAnomalyGroupSummaries
- data ListAnomalyGroupSummariesResponse = ListAnomalyGroupSummariesResponse' (Maybe AnomalyGroupStatistics) (Maybe [AnomalyGroupSummary]) (Maybe Text) Int
- newListAnomalyGroupSummariesResponse :: Int -> ListAnomalyGroupSummariesResponse
- data ListAnomalyGroupTimeSeries = ListAnomalyGroupTimeSeries' (Maybe Natural) (Maybe Text) Text Text Text
- newListAnomalyGroupTimeSeries :: Text -> Text -> Text -> ListAnomalyGroupTimeSeries
- data ListAnomalyGroupTimeSeriesResponse = ListAnomalyGroupTimeSeriesResponse' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe [TimeSeries]) (Maybe [Text]) Int
- newListAnomalyGroupTimeSeriesResponse :: Int -> ListAnomalyGroupTimeSeriesResponse
- data ListMetricSets = ListMetricSets' (Maybe Text) (Maybe Natural) (Maybe Text)
- newListMetricSets :: ListMetricSets
- data ListMetricSetsResponse = ListMetricSetsResponse' (Maybe [MetricSetSummary]) (Maybe Text) Int
- newListMetricSetsResponse :: Int -> ListMetricSetsResponse
- data ListTagsForResource = ListTagsForResource' Text
- newListTagsForResource :: Text -> ListTagsForResource
- data ListTagsForResourceResponse = ListTagsForResourceResponse' (Maybe (HashMap Text Text)) Int
- newListTagsForResourceResponse :: Int -> ListTagsForResourceResponse
- data PutFeedback = PutFeedback' Text AnomalyGroupTimeSeriesFeedback
- newPutFeedback :: Text -> AnomalyGroupTimeSeriesFeedback -> PutFeedback
- data PutFeedbackResponse = PutFeedbackResponse' Int
- newPutFeedbackResponse :: Int -> PutFeedbackResponse
- data TagResource = TagResource' Text (HashMap Text Text)
- newTagResource :: Text -> TagResource
- data TagResourceResponse = TagResourceResponse' Int
- newTagResourceResponse :: Int -> TagResourceResponse
- data UntagResource = UntagResource' Text (NonEmpty Text)
- newUntagResource :: Text -> NonEmpty Text -> UntagResource
- data UntagResourceResponse = UntagResourceResponse' Int
- newUntagResourceResponse :: Int -> UntagResourceResponse
- data UpdateAlert = UpdateAlert' (Maybe Action) (Maybe Text) (Maybe AlertFilters) (Maybe Natural) Text
- newUpdateAlert :: Text -> UpdateAlert
- data UpdateAlertResponse = UpdateAlertResponse' (Maybe Text) Int
- newUpdateAlertResponse :: Int -> UpdateAlertResponse
- data UpdateAnomalyDetector = UpdateAnomalyDetector' (Maybe AnomalyDetectorConfig) (Maybe Text) (Maybe Text) Text
- newUpdateAnomalyDetector :: Text -> UpdateAnomalyDetector
- data UpdateAnomalyDetectorResponse = UpdateAnomalyDetectorResponse' (Maybe Text) Int
- newUpdateAnomalyDetectorResponse :: Int -> UpdateAnomalyDetectorResponse
- data UpdateMetricSet = UpdateMetricSet' (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe (NonEmpty Metric)) (Maybe Text) (Maybe Frequency) (Maybe MetricSource) (Maybe Natural) (Maybe TimestampColumn) Text
- newUpdateMetricSet :: Text -> UpdateMetricSet
- data UpdateMetricSetResponse = UpdateMetricSetResponse' (Maybe Text) Int
- newUpdateMetricSetResponse :: Int -> UpdateMetricSetResponse
- newtype AggregationFunction where
- AggregationFunction' { }
- pattern AggregationFunction_AVG :: AggregationFunction
- pattern AggregationFunction_SUM :: AggregationFunction
- newtype AlertStatus where
- AlertStatus' { }
- pattern AlertStatus_ACTIVE :: AlertStatus
- pattern AlertStatus_INACTIVE :: AlertStatus
- newtype AlertType where
- AlertType' { }
- pattern AlertType_LAMBDA :: AlertType
- pattern AlertType_SNS :: AlertType
- newtype AnomalyDetectionTaskStatus where
- AnomalyDetectionTaskStatus' { }
- pattern AnomalyDetectionTaskStatus_COMPLETED :: AnomalyDetectionTaskStatus
- pattern AnomalyDetectionTaskStatus_FAILED :: AnomalyDetectionTaskStatus
- pattern AnomalyDetectionTaskStatus_FAILED_TO_SCHEDULE :: AnomalyDetectionTaskStatus
- pattern AnomalyDetectionTaskStatus_IN_PROGRESS :: AnomalyDetectionTaskStatus
- pattern AnomalyDetectionTaskStatus_PENDING :: AnomalyDetectionTaskStatus
- newtype AnomalyDetectorFailureType where
- AnomalyDetectorFailureType' { }
- pattern AnomalyDetectorFailureType_ACTIVATION_FAILURE :: AnomalyDetectorFailureType
- pattern AnomalyDetectorFailureType_BACK_TEST_ACTIVATION_FAILURE :: AnomalyDetectorFailureType
- pattern AnomalyDetectorFailureType_DEACTIVATION_FAILURE :: AnomalyDetectorFailureType
- pattern AnomalyDetectorFailureType_DELETION_FAILURE :: AnomalyDetectorFailureType
- newtype AnomalyDetectorStatus where
- AnomalyDetectorStatus' { }
- pattern AnomalyDetectorStatus_ACTIVATING :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_ACTIVE :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_BACK_TEST_ACTIVATING :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_BACK_TEST_ACTIVE :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_BACK_TEST_COMPLETE :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_DEACTIVATED :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_DEACTIVATING :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_DELETING :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_FAILED :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_INACTIVE :: AnomalyDetectorStatus
- pattern AnomalyDetectorStatus_LEARNING :: AnomalyDetectorStatus
- newtype CSVFileCompression where
- CSVFileCompression' { }
- pattern CSVFileCompression_GZIP :: CSVFileCompression
- pattern CSVFileCompression_NONE :: CSVFileCompression
- newtype Confidence where
- Confidence' { }
- pattern Confidence_HIGH :: Confidence
- pattern Confidence_LOW :: Confidence
- pattern Confidence_NONE :: Confidence
- newtype DataQualityMetricType where
- DataQualityMetricType' { }
- pattern DataQualityMetricType_BACKTEST_INFERENCE_DATA_END_TIME_STAMP :: DataQualityMetricType
- pattern DataQualityMetricType_BACKTEST_INFERENCE_DATA_START_TIME_STAMP :: DataQualityMetricType
- pattern DataQualityMetricType_BACKTEST_TRAINING_DATA_END_TIME_STAMP :: DataQualityMetricType
- pattern DataQualityMetricType_BACKTEST_TRAINING_DATA_START_TIME_STAMP :: DataQualityMetricType
- pattern DataQualityMetricType_COLUMN_COMPLETENESS :: DataQualityMetricType
- pattern DataQualityMetricType_DIMENSION_UNIQUENESS :: DataQualityMetricType
- pattern DataQualityMetricType_INVALID_ROWS_COMPLIANCE :: DataQualityMetricType
- pattern DataQualityMetricType_ROWS_PARTIAL_COMPLIANCE :: DataQualityMetricType
- pattern DataQualityMetricType_ROWS_PROCESSED :: DataQualityMetricType
- pattern DataQualityMetricType_TIME_SERIES_COUNT :: DataQualityMetricType
- newtype FilterOperation where
- FilterOperation' { }
- pattern FilterOperation_EQUALS :: FilterOperation
- newtype Frequency where
- Frequency' { }
- pattern Frequency_P1D :: Frequency
- pattern Frequency_PT10M :: Frequency
- pattern Frequency_PT1H :: Frequency
- pattern Frequency_PT5M :: Frequency
- newtype JsonFileCompression where
- newtype RelationshipType where
- newtype SnsFormat where
- SnsFormat' { }
- pattern SnsFormat_JSON :: SnsFormat
- pattern SnsFormat_LONG_TEXT :: SnsFormat
- pattern SnsFormat_SHORT_TEXT :: SnsFormat
- data Action = Action' (Maybe LambdaConfiguration) (Maybe SNSConfiguration)
- newAction :: Action
- data Alert = Alert' (Maybe Action) (Maybe Text) (Maybe Text) (Maybe AlertFilters) (Maybe Text) (Maybe Natural) (Maybe AlertStatus) (Maybe AlertType) (Maybe Text) (Maybe POSIX) (Maybe POSIX)
- newAlert :: Alert
- data AlertFilters = AlertFilters' (Maybe (NonEmpty DimensionFilter)) (Maybe (NonEmpty Text))
- newAlertFilters :: AlertFilters
- data AlertSummary = AlertSummary' (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe AlertStatus) (Maybe AlertType) (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe (HashMap Text Text))
- newAlertSummary :: AlertSummary
- data AnomalyDetectorConfig = AnomalyDetectorConfig' (Maybe Frequency)
- newAnomalyDetectorConfig :: AnomalyDetectorConfig
- data AnomalyDetectorConfigSummary = AnomalyDetectorConfigSummary' (Maybe Frequency)
- newAnomalyDetectorConfigSummary :: AnomalyDetectorConfigSummary
- data AnomalyDetectorDataQualityMetric = AnomalyDetectorDataQualityMetric' (Maybe [MetricSetDataQualityMetric]) (Maybe POSIX)
- newAnomalyDetectorDataQualityMetric :: AnomalyDetectorDataQualityMetric
- data AnomalyDetectorSummary = AnomalyDetectorSummary' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe AnomalyDetectorStatus) (Maybe (HashMap Text Text))
- newAnomalyDetectorSummary :: AnomalyDetectorSummary
- data AnomalyGroup = AnomalyGroup' (Maybe Text) (Maybe Double) (Maybe Text) (Maybe [MetricLevelImpact]) (Maybe Text) (Maybe Text)
- newAnomalyGroup :: AnomalyGroup
- data AnomalyGroupStatistics = AnomalyGroupStatistics' (Maybe Text) (Maybe [ItemizedMetricStats]) (Maybe Int)
- newAnomalyGroupStatistics :: AnomalyGroupStatistics
- data AnomalyGroupSummary = AnomalyGroupSummary' (Maybe Text) (Maybe Double) (Maybe Text) (Maybe Text) (Maybe Text)
- newAnomalyGroupSummary :: AnomalyGroupSummary
- data AnomalyGroupTimeSeries = AnomalyGroupTimeSeries' (Maybe Text) Text
- newAnomalyGroupTimeSeries :: Text -> AnomalyGroupTimeSeries
- data AnomalyGroupTimeSeriesFeedback = AnomalyGroupTimeSeriesFeedback' Text Text Bool
- newAnomalyGroupTimeSeriesFeedback :: Text -> Text -> Bool -> AnomalyGroupTimeSeriesFeedback
- data AppFlowConfig = AppFlowConfig' (Maybe Text) (Maybe Text)
- newAppFlowConfig :: AppFlowConfig
- data AthenaSourceConfig = AthenaSourceConfig' (Maybe BackTestConfiguration) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text)
- newAthenaSourceConfig :: AthenaSourceConfig
- data AttributeValue = AttributeValue' (Maybe Text) (Maybe [Text]) (Maybe Text) (Maybe [Text]) (Maybe Text) (Maybe [Text])
- newAttributeValue :: AttributeValue
- data AutoDetectionMetricSource = AutoDetectionMetricSource' (Maybe AutoDetectionS3SourceConfig)
- newAutoDetectionMetricSource :: AutoDetectionMetricSource
- data AutoDetectionS3SourceConfig = AutoDetectionS3SourceConfig' (Maybe (NonEmpty Text)) (Maybe (NonEmpty Text))
- newAutoDetectionS3SourceConfig :: AutoDetectionS3SourceConfig
- data BackTestConfiguration = BackTestConfiguration' Bool
- newBackTestConfiguration :: Bool -> BackTestConfiguration
- data CloudWatchConfig = CloudWatchConfig' (Maybe BackTestConfiguration) (Maybe Text)
- newCloudWatchConfig :: CloudWatchConfig
- data ContributionMatrix = ContributionMatrix' (Maybe [DimensionContribution])
- newContributionMatrix :: ContributionMatrix
- data CsvFormatDescriptor = CsvFormatDescriptor' (Maybe Text) (Maybe Bool) (Maybe Text) (Maybe CSVFileCompression) (Maybe [Text]) (Maybe Text)
- newCsvFormatDescriptor :: CsvFormatDescriptor
- data DataQualityMetric = DataQualityMetric' (Maybe Text) (Maybe DataQualityMetricType) (Maybe Double) (Maybe Text)
- newDataQualityMetric :: DataQualityMetric
- data DetectedCsvFormatDescriptor = DetectedCsvFormatDescriptor' (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField)
- newDetectedCsvFormatDescriptor :: DetectedCsvFormatDescriptor
- data DetectedField = DetectedField' (Maybe Confidence) (Maybe Text) (Maybe AttributeValue)
- newDetectedField :: DetectedField
- data DetectedFileFormatDescriptor = DetectedFileFormatDescriptor' (Maybe DetectedCsvFormatDescriptor) (Maybe DetectedJsonFormatDescriptor)
- newDetectedFileFormatDescriptor :: DetectedFileFormatDescriptor
- data DetectedJsonFormatDescriptor = DetectedJsonFormatDescriptor' (Maybe DetectedField) (Maybe DetectedField)
- newDetectedJsonFormatDescriptor :: DetectedJsonFormatDescriptor
- data DetectedMetricSetConfig = DetectedMetricSetConfig' (Maybe DetectedField) (Maybe DetectedMetricSource) (Maybe DetectedField)
- newDetectedMetricSetConfig :: DetectedMetricSetConfig
- data DetectedMetricSource = DetectedMetricSource' (Maybe DetectedS3SourceConfig)
- newDetectedMetricSource :: DetectedMetricSource
- data DetectedS3SourceConfig = DetectedS3SourceConfig' (Maybe DetectedFileFormatDescriptor)
- newDetectedS3SourceConfig :: DetectedS3SourceConfig
- data DimensionContribution = DimensionContribution' (Maybe Text) (Maybe [DimensionValueContribution])
- newDimensionContribution :: DimensionContribution
- data DimensionFilter = DimensionFilter' (Maybe Text) (Maybe (NonEmpty Text))
- newDimensionFilter :: DimensionFilter
- data DimensionNameValue = DimensionNameValue' Text Text
- newDimensionNameValue :: Text -> Text -> DimensionNameValue
- data DimensionValueContribution = DimensionValueContribution' (Maybe Double) (Maybe Text)
- newDimensionValueContribution :: DimensionValueContribution
- data ExecutionStatus = ExecutionStatus' (Maybe Text) (Maybe AnomalyDetectionTaskStatus) (Maybe Text)
- newExecutionStatus :: ExecutionStatus
- data FileFormatDescriptor = FileFormatDescriptor' (Maybe CsvFormatDescriptor) (Maybe JsonFormatDescriptor)
- newFileFormatDescriptor :: FileFormatDescriptor
- data Filter = Filter' (Maybe Text) (Maybe FilterOperation)
- newFilter :: Filter
- data InterMetricImpactDetails = InterMetricImpactDetails' (Maybe Text) (Maybe Double) (Maybe Text) (Maybe RelationshipType)
- newInterMetricImpactDetails :: InterMetricImpactDetails
- data ItemizedMetricStats = ItemizedMetricStats' (Maybe Text) (Maybe Int)
- newItemizedMetricStats :: ItemizedMetricStats
- data JsonFormatDescriptor = JsonFormatDescriptor' (Maybe Text) (Maybe JsonFileCompression)
- newJsonFormatDescriptor :: JsonFormatDescriptor
- data LambdaConfiguration = LambdaConfiguration' Text Text
- newLambdaConfiguration :: Text -> Text -> LambdaConfiguration
- data Metric = Metric' (Maybe Text) Text AggregationFunction
- newMetric :: Text -> AggregationFunction -> Metric
- data MetricLevelImpact = MetricLevelImpact' (Maybe ContributionMatrix) (Maybe Text) (Maybe Int)
- newMetricLevelImpact :: MetricLevelImpact
- data MetricSetDataQualityMetric = MetricSetDataQualityMetric' (Maybe [DataQualityMetric]) (Maybe Text)
- newMetricSetDataQualityMetric :: MetricSetDataQualityMetric
- data MetricSetDimensionFilter = MetricSetDimensionFilter' (Maybe (NonEmpty Filter)) (Maybe Text)
- newMetricSetDimensionFilter :: MetricSetDimensionFilter
- data MetricSetSummary = MetricSetSummary' (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe (HashMap Text Text))
- newMetricSetSummary :: MetricSetSummary
- data MetricSource = MetricSource' (Maybe AppFlowConfig) (Maybe AthenaSourceConfig) (Maybe CloudWatchConfig) (Maybe RDSSourceConfig) (Maybe RedshiftSourceConfig) (Maybe S3SourceConfig)
- newMetricSource :: MetricSource
- data RDSSourceConfig = RDSSourceConfig' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe VpcConfiguration)
- newRDSSourceConfig :: RDSSourceConfig
- data RedshiftSourceConfig = RedshiftSourceConfig' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe VpcConfiguration)
- newRedshiftSourceConfig :: RedshiftSourceConfig
- data S3SourceConfig = S3SourceConfig' (Maybe FileFormatDescriptor) (Maybe (NonEmpty Text)) (Maybe Text) (Maybe (NonEmpty Text))
- newS3SourceConfig :: S3SourceConfig
- data SNSConfiguration = SNSConfiguration' (Maybe SnsFormat) Text Text
- newSNSConfiguration :: Text -> Text -> SNSConfiguration
- data SampleDataS3SourceConfig = SampleDataS3SourceConfig' (Maybe (NonEmpty Text)) (Maybe (NonEmpty Text)) Text FileFormatDescriptor
- newSampleDataS3SourceConfig :: Text -> FileFormatDescriptor -> SampleDataS3SourceConfig
- data TimeSeries = TimeSeries' Text [DimensionNameValue] [Double]
- newTimeSeries :: Text -> TimeSeries
- data TimeSeriesFeedback = TimeSeriesFeedback' (Maybe Bool) (Maybe Text)
- newTimeSeriesFeedback :: TimeSeriesFeedback
- data TimestampColumn = TimestampColumn' (Maybe Text) (Maybe Text)
- newTimestampColumn :: TimestampColumn
- data VpcConfiguration = VpcConfiguration' [Text] [Text]
- newVpcConfiguration :: VpcConfiguration
Service Configuration
defaultService :: Service Source #
API version 2017-07-25 of the Amazon Lookout for Metrics 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 LookoutMetrics.
AccessDeniedException
_AccessDeniedException :: AsError a => Fold a ServiceError Source #
You do not have sufficient permissions to perform this action.
ConflictException
_ConflictException :: AsError a => Fold a ServiceError Source #
There was a conflict processing the request. Try your request again.
InternalServerException
_InternalServerException :: AsError a => Fold a ServiceError Source #
The request processing has failed because of an unknown error, exception, or failure.
ResourceNotFoundException
_ResourceNotFoundException :: AsError a => Fold a ServiceError Source #
The specified resource cannot be found. Check the ARN of the resource and try again.
ServiceQuotaExceededException
_ServiceQuotaExceededException :: AsError a => Fold a ServiceError Source #
The request exceeded the service's quotas. Check the service quotas and try again.
TooManyRequestsException
_TooManyRequestsException :: AsError a => Fold a ServiceError Source #
The request was denied due to too many requests being submitted at the same time.
ValidationException
_ValidationException :: AsError a => Fold a ServiceError Source #
The input fails to satisfy the constraints specified by the AWS service. Check your input values and try again.
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.
ActivateAnomalyDetector
data ActivateAnomalyDetector Source #
See: newActivateAnomalyDetector smart constructor.
Constructors
| ActivateAnomalyDetector' Text |
Instances
newActivateAnomalyDetector Source #
Arguments
| :: Text | |
| -> ActivateAnomalyDetector |
Create a value of ActivateAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
ActivateAnomalyDetector, activateAnomalyDetector_anomalyDetectorArn - The ARN of the anomaly detector.
data ActivateAnomalyDetectorResponse Source #
See: newActivateAnomalyDetectorResponse smart constructor.
Constructors
| ActivateAnomalyDetectorResponse' Int |
Instances
newActivateAnomalyDetectorResponse Source #
Create a value of ActivateAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:ActivateAnomalyDetectorResponse', activateAnomalyDetectorResponse_httpStatus - The response's http status code.
BackTestAnomalyDetector
data BackTestAnomalyDetector Source #
See: newBackTestAnomalyDetector smart constructor.
Constructors
| BackTestAnomalyDetector' Text |
Instances
newBackTestAnomalyDetector Source #
Arguments
| :: Text | |
| -> BackTestAnomalyDetector |
Create a value of BackTestAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
BackTestAnomalyDetector, backTestAnomalyDetector_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
data BackTestAnomalyDetectorResponse Source #
See: newBackTestAnomalyDetectorResponse smart constructor.
Constructors
| BackTestAnomalyDetectorResponse' Int |
Instances
newBackTestAnomalyDetectorResponse Source #
Create a value of BackTestAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:BackTestAnomalyDetectorResponse', backTestAnomalyDetectorResponse_httpStatus - The response's http status code.
CreateAlert
data CreateAlert Source #
See: newCreateAlert smart constructor.
Constructors
| CreateAlert' (Maybe Text) (Maybe AlertFilters) (Maybe Natural) (Maybe (HashMap Text Text)) Text Text Action |
Instances
Arguments
| :: Text | |
| -> Text | |
| -> Action | |
| -> CreateAlert |
Create a value of CreateAlert with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateAlert, createAlert_alertDescription - A description of the alert.
CreateAlert, createAlert_alertFilters - The configuration of the alert filters, containing MetricList and
DimensionFilterList.
CreateAlert, createAlert_alertSensitivityThreshold - An integer from 0 to 100 specifying the alert sensitivity threshold.
CreateAlert, createAlert_tags - A list of
tags
to apply to the alert.
CreateAlert, createAlert_alertName - The name of the alert.
CreateAlert, createAlert_anomalyDetectorArn - The ARN of the detector to which the alert is attached.
CreateAlert, createAlert_action - Action that will be triggered when there is an alert.
data CreateAlertResponse Source #
See: newCreateAlertResponse smart constructor.
Constructors
| CreateAlertResponse' (Maybe Text) Int |
Instances
newCreateAlertResponse Source #
Arguments
| :: Int | |
| -> CreateAlertResponse |
Create a value of CreateAlertResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateAlertResponse, createAlertResponse_alertArn - The ARN of the alert.
$sel:httpStatus:CreateAlertResponse', createAlertResponse_httpStatus - The response's http status code.
CreateAnomalyDetector
data CreateAnomalyDetector Source #
See: newCreateAnomalyDetector smart constructor.
Constructors
| CreateAnomalyDetector' (Maybe Text) (Maybe Text) (Maybe (HashMap Text Text)) Text AnomalyDetectorConfig |
Instances
newCreateAnomalyDetector Source #
Arguments
| :: Text | |
| -> AnomalyDetectorConfig | |
| -> CreateAnomalyDetector |
Create a value of CreateAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateAnomalyDetector, createAnomalyDetector_anomalyDetectorDescription - A description of the detector.
$sel:kmsKeyArn:CreateAnomalyDetector', createAnomalyDetector_kmsKeyArn - The ARN of the KMS key to use to encrypt your data.
CreateAnomalyDetector, createAnomalyDetector_tags - A list of
tags
to apply to the anomaly detector.
CreateAnomalyDetector, createAnomalyDetector_anomalyDetectorName - The name of the detector.
$sel:anomalyDetectorConfig:CreateAnomalyDetector', createAnomalyDetector_anomalyDetectorConfig - Contains information about the configuration of the anomaly detector.
data CreateAnomalyDetectorResponse Source #
See: newCreateAnomalyDetectorResponse smart constructor.
Constructors
| CreateAnomalyDetectorResponse' (Maybe Text) Int |
Instances
newCreateAnomalyDetectorResponse Source #
Create a value of CreateAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateAnomalyDetectorResponse, createAnomalyDetectorResponse_anomalyDetectorArn - The ARN of the detector.
$sel:httpStatus:CreateAnomalyDetectorResponse', createAnomalyDetectorResponse_httpStatus - The response's http status code.
CreateMetricSet
data CreateMetricSet Source #
See: newCreateMetricSet smart constructor.
Constructors
| CreateMetricSet' (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe Text) (Maybe Frequency) (Maybe Natural) (Maybe (HashMap Text Text)) (Maybe TimestampColumn) (Maybe Text) Text Text (NonEmpty Metric) MetricSource |
Instances
Arguments
| :: Text | |
| -> Text | |
| -> NonEmpty Metric | |
| -> MetricSource | |
| -> CreateMetricSet |
Create a value of CreateMetricSet with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateMetricSet, createMetricSet_dimensionFilterList - A list of filters that specify which data is kept for anomaly detection.
CreateMetricSet, createMetricSet_dimensionList - A list of the fields you want to treat as dimensions.
CreateMetricSet, createMetricSet_metricSetDescription - A description of the dataset you are creating.
CreateMetricSet, createMetricSet_metricSetFrequency - The frequency with which the source data will be analyzed for anomalies.
CreateMetricSet, createMetricSet_offset - After an interval ends, the amount of seconds that the detector waits
before importing data. Offset is only supported for S3, Redshift, Athena
and datasources.
CreateMetricSet, createMetricSet_tags - A list of
tags
to apply to the dataset.
$sel:timestampColumn:CreateMetricSet', createMetricSet_timestampColumn - Contains information about the column used for tracking time in your
source data.
$sel:timezone:CreateMetricSet', createMetricSet_timezone - The time zone in which your source data was recorded.
CreateMetricSet, createMetricSet_anomalyDetectorArn - The ARN of the anomaly detector that will use the dataset.
CreateMetricSet, createMetricSet_metricSetName - The name of the dataset.
CreateMetricSet, createMetricSet_metricList - A list of metrics that the dataset will contain.
CreateMetricSet, createMetricSet_metricSource - Contains information about how the source data should be interpreted.
data CreateMetricSetResponse Source #
See: newCreateMetricSetResponse smart constructor.
Constructors
| CreateMetricSetResponse' (Maybe Text) Int |
Instances
newCreateMetricSetResponse Source #
Create a value of CreateMetricSetResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
CreateMetricSetResponse, createMetricSetResponse_metricSetArn - The ARN of the dataset.
$sel:httpStatus:CreateMetricSetResponse', createMetricSetResponse_httpStatus - The response's http status code.
DeactivateAnomalyDetector
data DeactivateAnomalyDetector Source #
See: newDeactivateAnomalyDetector smart constructor.
Constructors
| DeactivateAnomalyDetector' Text |
Instances
newDeactivateAnomalyDetector Source #
Arguments
| :: Text | |
| -> DeactivateAnomalyDetector |
Create a value of DeactivateAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DeactivateAnomalyDetector, deactivateAnomalyDetector_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
data DeactivateAnomalyDetectorResponse Source #
See: newDeactivateAnomalyDetectorResponse smart constructor.
Constructors
| DeactivateAnomalyDetectorResponse' Int |
Instances
newDeactivateAnomalyDetectorResponse Source #
Arguments
| :: Int | |
| -> DeactivateAnomalyDetectorResponse |
Create a value of DeactivateAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:DeactivateAnomalyDetectorResponse', deactivateAnomalyDetectorResponse_httpStatus - The response's http status code.
DeleteAlert
data DeleteAlert Source #
See: newDeleteAlert smart constructor.
Constructors
| DeleteAlert' Text |
Instances
Arguments
| :: Text | |
| -> DeleteAlert |
Create a value of DeleteAlert with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DeleteAlert, deleteAlert_alertArn - The ARN of the alert to delete.
data DeleteAlertResponse Source #
See: newDeleteAlertResponse smart constructor.
Constructors
| DeleteAlertResponse' Int |
Instances
newDeleteAlertResponse Source #
Arguments
| :: Int | |
| -> DeleteAlertResponse |
Create a value of DeleteAlertResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:DeleteAlertResponse', deleteAlertResponse_httpStatus - The response's http status code.
DeleteAnomalyDetector
data DeleteAnomalyDetector Source #
See: newDeleteAnomalyDetector smart constructor.
Constructors
| DeleteAnomalyDetector' Text |
Instances
newDeleteAnomalyDetector Source #
Arguments
| :: Text | |
| -> DeleteAnomalyDetector |
Create a value of DeleteAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DeleteAnomalyDetector, deleteAnomalyDetector_anomalyDetectorArn - The ARN of the detector to delete.
data DeleteAnomalyDetectorResponse Source #
See: newDeleteAnomalyDetectorResponse smart constructor.
Constructors
| DeleteAnomalyDetectorResponse' Int |
Instances
newDeleteAnomalyDetectorResponse Source #
Create a value of DeleteAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:DeleteAnomalyDetectorResponse', deleteAnomalyDetectorResponse_httpStatus - The response's http status code.
DescribeAlert
data DescribeAlert Source #
See: newDescribeAlert smart constructor.
Constructors
| DescribeAlert' Text |
Instances
Arguments
| :: Text | |
| -> DescribeAlert |
Create a value of DescribeAlert with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DescribeAlert, describeAlert_alertArn - The ARN of the alert to describe.
data DescribeAlertResponse Source #
See: newDescribeAlertResponse smart constructor.
Constructors
| DescribeAlertResponse' (Maybe Alert) Int |
Instances
newDescribeAlertResponse Source #
Create a value of DescribeAlertResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:alert:DescribeAlertResponse', describeAlertResponse_alert - Contains information about an alert.
$sel:httpStatus:DescribeAlertResponse', describeAlertResponse_httpStatus - The response's http status code.
DescribeAnomalyDetectionExecutions
data DescribeAnomalyDetectionExecutions Source #
See: newDescribeAnomalyDetectionExecutions smart constructor.
Instances
newDescribeAnomalyDetectionExecutions Source #
Create a value of DescribeAnomalyDetectionExecutions with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:DescribeAnomalyDetectionExecutions', describeAnomalyDetectionExecutions_maxResults - The number of items to return in the response.
DescribeAnomalyDetectionExecutions, describeAnomalyDetectionExecutions_nextToken - Specify the pagination token that's returned by a previous request to
retrieve the next page of results.
DescribeAnomalyDetectionExecutions, describeAnomalyDetectionExecutions_timestamp - The timestamp of the anomaly detection job.
DescribeAnomalyDetectionExecutions, describeAnomalyDetectionExecutions_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
data DescribeAnomalyDetectionExecutionsResponse Source #
See: newDescribeAnomalyDetectionExecutionsResponse smart constructor.
Constructors
| DescribeAnomalyDetectionExecutionsResponse' (Maybe [ExecutionStatus]) (Maybe Text) Int |
Instances
newDescribeAnomalyDetectionExecutionsResponse Source #
Arguments
| :: Int | |
| -> DescribeAnomalyDetectionExecutionsResponse |
Create a value of DescribeAnomalyDetectionExecutionsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:executionList:DescribeAnomalyDetectionExecutionsResponse', describeAnomalyDetectionExecutionsResponse_executionList - A list of detection jobs.
DescribeAnomalyDetectionExecutions, describeAnomalyDetectionExecutionsResponse_nextToken - The pagination token that's included if more results are available.
$sel:httpStatus:DescribeAnomalyDetectionExecutionsResponse', describeAnomalyDetectionExecutionsResponse_httpStatus - The response's http status code.
DescribeAnomalyDetector
data DescribeAnomalyDetector Source #
See: newDescribeAnomalyDetector smart constructor.
Constructors
| DescribeAnomalyDetector' Text |
Instances
newDescribeAnomalyDetector Source #
Arguments
| :: Text | |
| -> DescribeAnomalyDetector |
Create a value of DescribeAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DescribeAnomalyDetector, describeAnomalyDetector_anomalyDetectorArn - The ARN of the detector to describe.
data DescribeAnomalyDetectorResponse Source #
See: newDescribeAnomalyDetectorResponse smart constructor.
Constructors
Instances
newDescribeAnomalyDetectorResponse Source #
Create a value of DescribeAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DescribeAnomalyDetector, describeAnomalyDetectorResponse_anomalyDetectorArn - The ARN of the detector.
$sel:anomalyDetectorConfig:DescribeAnomalyDetectorResponse', describeAnomalyDetectorResponse_anomalyDetectorConfig - Contains information about the detector's configuration.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_anomalyDetectorDescription - A description of the detector.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_anomalyDetectorName - The name of the detector.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_creationTime - The time at which the detector was created.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_failureReason - The reason that the detector failed.
$sel:failureType:DescribeAnomalyDetectorResponse', describeAnomalyDetectorResponse_failureType - The process that caused the detector to fail.
$sel:kmsKeyArn:DescribeAnomalyDetectorResponse', describeAnomalyDetectorResponse_kmsKeyArn - The ARN of the KMS key to use to encrypt your data.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_lastModificationTime - The time at which the detector was last modified.
DescribeAnomalyDetectorResponse, describeAnomalyDetectorResponse_status - The status of the detector.
$sel:httpStatus:DescribeAnomalyDetectorResponse', describeAnomalyDetectorResponse_httpStatus - The response's http status code.
DescribeMetricSet
data DescribeMetricSet Source #
See: newDescribeMetricSet smart constructor.
Constructors
| DescribeMetricSet' Text |
Instances
Arguments
| :: Text | |
| -> DescribeMetricSet |
Create a value of DescribeMetricSet with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DescribeMetricSet, describeMetricSet_metricSetArn - The ARN of the dataset.
data DescribeMetricSetResponse Source #
See: newDescribeMetricSetResponse smart constructor.
Constructors
| DescribeMetricSetResponse' (Maybe Text) (Maybe POSIX) (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe POSIX) (Maybe (NonEmpty Metric)) (Maybe Text) (Maybe Text) (Maybe Frequency) (Maybe Text) (Maybe MetricSource) (Maybe Natural) (Maybe TimestampColumn) (Maybe Text) Int |
Instances
newDescribeMetricSetResponse Source #
Create a value of DescribeMetricSetResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DescribeMetricSetResponse, describeMetricSetResponse_anomalyDetectorArn - The ARN of the detector that contains the dataset.
DescribeMetricSetResponse, describeMetricSetResponse_creationTime - The time at which the dataset was created.
DescribeMetricSetResponse, describeMetricSetResponse_dimensionFilterList - The dimensions and their values that were used to filter the dataset.
DescribeMetricSetResponse, describeMetricSetResponse_dimensionList - A list of the dimensions chosen for analysis.
DescribeMetricSetResponse, describeMetricSetResponse_lastModificationTime - The time at which the dataset was last modified.
DescribeMetricSetResponse, describeMetricSetResponse_metricList - A list of the metrics defined by the dataset.
DescribeMetricSet, describeMetricSetResponse_metricSetArn - The ARN of the dataset.
DescribeMetricSetResponse, describeMetricSetResponse_metricSetDescription - The dataset's description.
DescribeMetricSetResponse, describeMetricSetResponse_metricSetFrequency - The interval at which the data will be analyzed for anomalies.
DescribeMetricSetResponse, describeMetricSetResponse_metricSetName - The name of the dataset.
DescribeMetricSetResponse, describeMetricSetResponse_metricSource - Contains information about the dataset's source data.
DescribeMetricSetResponse, describeMetricSetResponse_offset - After an interval ends, the amount of seconds that the detector waits
before importing data. Offset is only supported for S3, Redshift, Athena
and datasources.
$sel:timestampColumn:DescribeMetricSetResponse', describeMetricSetResponse_timestampColumn - Contains information about the column used for tracking time in your
source data.
$sel:timezone:DescribeMetricSetResponse', describeMetricSetResponse_timezone - The time zone in which the dataset's data was recorded.
$sel:httpStatus:DescribeMetricSetResponse', describeMetricSetResponse_httpStatus - The response's http status code.
DetectMetricSetConfig
data DetectMetricSetConfig Source #
See: newDetectMetricSetConfig smart constructor.
Constructors
| DetectMetricSetConfig' Text AutoDetectionMetricSource |
Instances
newDetectMetricSetConfig Source #
Arguments
| :: Text | |
| -> AutoDetectionMetricSource | |
| -> DetectMetricSetConfig |
Create a value of DetectMetricSetConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
DetectMetricSetConfig, detectMetricSetConfig_anomalyDetectorArn - An anomaly detector ARN.
$sel:autoDetectionMetricSource:DetectMetricSetConfig', detectMetricSetConfig_autoDetectionMetricSource - A data source.
data DetectMetricSetConfigResponse Source #
See: newDetectMetricSetConfigResponse smart constructor.
Constructors
| DetectMetricSetConfigResponse' (Maybe DetectedMetricSetConfig) Int |
Instances
newDetectMetricSetConfigResponse Source #
Create a value of DetectMetricSetConfigResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:detectedMetricSetConfig:DetectMetricSetConfigResponse', detectMetricSetConfigResponse_detectedMetricSetConfig - The inferred dataset configuration for the datasource.
$sel:httpStatus:DetectMetricSetConfigResponse', detectMetricSetConfigResponse_httpStatus - The response's http status code.
GetAnomalyGroup
data GetAnomalyGroup Source #
See: newGetAnomalyGroup smart constructor.
Constructors
| GetAnomalyGroup' Text Text |
Instances
Arguments
| :: Text | |
| -> Text | |
| -> GetAnomalyGroup |
Create a value of GetAnomalyGroup with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
GetAnomalyGroup, getAnomalyGroup_anomalyGroupId - The ID of the anomaly group.
GetAnomalyGroup, getAnomalyGroup_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
data GetAnomalyGroupResponse Source #
See: newGetAnomalyGroupResponse smart constructor.
Constructors
| GetAnomalyGroupResponse' (Maybe AnomalyGroup) Int |
Instances
newGetAnomalyGroupResponse Source #
Create a value of GetAnomalyGroupResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroup:GetAnomalyGroupResponse', getAnomalyGroupResponse_anomalyGroup - Details about the anomaly group.
$sel:httpStatus:GetAnomalyGroupResponse', getAnomalyGroupResponse_httpStatus - The response's http status code.
GetDataQualityMetrics
data GetDataQualityMetrics Source #
See: newGetDataQualityMetrics smart constructor.
Constructors
| GetDataQualityMetrics' (Maybe Text) Text |
Instances
newGetDataQualityMetrics Source #
Arguments
| :: Text | |
| -> GetDataQualityMetrics |
Create a value of GetDataQualityMetrics with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
GetDataQualityMetrics, getDataQualityMetrics_metricSetArn - The Amazon Resource Name (ARN) of a specific data quality metric set.
GetDataQualityMetrics, getDataQualityMetrics_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector that you want to
investigate.
data GetDataQualityMetricsResponse Source #
See: newGetDataQualityMetricsResponse smart constructor.
Constructors
| GetDataQualityMetricsResponse' (Maybe [AnomalyDetectorDataQualityMetric]) Int |
Instances
newGetDataQualityMetricsResponse Source #
Create a value of GetDataQualityMetricsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorDataQualityMetricList:GetDataQualityMetricsResponse', getDataQualityMetricsResponse_anomalyDetectorDataQualityMetricList - A list of the data quality metrics for the AnomalyDetectorArn that you
requested.
$sel:httpStatus:GetDataQualityMetricsResponse', getDataQualityMetricsResponse_httpStatus - The response's http status code.
GetFeedback
data GetFeedback Source #
See: newGetFeedback smart constructor.
Constructors
| GetFeedback' (Maybe Natural) (Maybe Text) Text AnomalyGroupTimeSeries |
Instances
Arguments
| :: Text | |
| -> AnomalyGroupTimeSeries | |
| -> GetFeedback |
Create a value of GetFeedback with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:GetFeedback', getFeedback_maxResults - The maximum number of results to return.
GetFeedback, getFeedback_nextToken - Specify the pagination token that's returned by a previous request to
retrieve the next page of results.
GetFeedback, getFeedback_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
GetFeedback, getFeedback_anomalyGroupTimeSeriesFeedback - The anomalous metric and group ID.
data GetFeedbackResponse Source #
See: newGetFeedbackResponse smart constructor.
Constructors
| GetFeedbackResponse' (Maybe [TimeSeriesFeedback]) (Maybe Text) Int |
Instances
newGetFeedbackResponse Source #
Arguments
| :: Int | |
| -> GetFeedbackResponse |
Create a value of GetFeedbackResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
GetFeedback, getFeedbackResponse_anomalyGroupTimeSeriesFeedback - Feedback for an anomalous metric.
GetFeedback, getFeedbackResponse_nextToken - The pagination token that's included if more results are available.
$sel:httpStatus:GetFeedbackResponse', getFeedbackResponse_httpStatus - The response's http status code.
GetSampleData
data GetSampleData Source #
See: newGetSampleData smart constructor.
Constructors
| GetSampleData' (Maybe SampleDataS3SourceConfig) |
Instances
newGetSampleData :: GetSampleData Source #
Create a value of GetSampleData with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
GetSampleData, getSampleData_s3SourceConfig - A datasource bucket in Amazon S3.
data GetSampleDataResponse Source #
See: newGetSampleDataResponse smart constructor.
Instances
newGetSampleDataResponse Source #
Create a value of GetSampleDataResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:headerValues:GetSampleDataResponse', getSampleDataResponse_headerValues - A list of header labels for the records.
$sel:sampleRows:GetSampleDataResponse', getSampleDataResponse_sampleRows - A list of records.
$sel:httpStatus:GetSampleDataResponse', getSampleDataResponse_httpStatus - The response's http status code.
ListAlerts
data ListAlerts Source #
See: newListAlerts smart constructor.
Instances
newListAlerts :: ListAlerts Source #
Create a value of ListAlerts with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
ListAlerts, listAlerts_anomalyDetectorArn - The ARN of the alert's detector.
$sel:maxResults:ListAlerts', listAlerts_maxResults - The maximum number of results that will be displayed by the request.
ListAlerts, listAlerts_nextToken - If the result of the previous request is truncated, the response
includes a NextToken. To retrieve the next set of results, use the
token in the next request. Tokens expire after 24 hours.
data ListAlertsResponse Source #
See: newListAlertsResponse smart constructor.
Constructors
| ListAlertsResponse' (Maybe [AlertSummary]) (Maybe Text) Int |
Instances
newListAlertsResponse Source #
Arguments
| :: Int | |
| -> ListAlertsResponse |
Create a value of ListAlertsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:alertSummaryList:ListAlertsResponse', listAlertsResponse_alertSummaryList - Contains information about an alert.
ListAlerts, listAlertsResponse_nextToken - If the response is truncated, the service returns this token. To
retrieve the next set of results, use this token in the next request.
$sel:httpStatus:ListAlertsResponse', listAlertsResponse_httpStatus - The response's http status code.
ListAnomalyDetectors
data ListAnomalyDetectors Source #
See: newListAnomalyDetectors smart constructor.
Constructors
| ListAnomalyDetectors' (Maybe Natural) (Maybe Text) |
Instances
newListAnomalyDetectors :: ListAnomalyDetectors Source #
Create a value of ListAnomalyDetectors with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:ListAnomalyDetectors', listAnomalyDetectors_maxResults - The maximum number of results to return.
ListAnomalyDetectors, listAnomalyDetectors_nextToken - If the result of the previous request was truncated, the response
includes a NextToken. To retrieve the next set of results, use the
token in the next request. Tokens expire after 24 hours.
data ListAnomalyDetectorsResponse Source #
See: newListAnomalyDetectorsResponse smart constructor.
Constructors
| ListAnomalyDetectorsResponse' (Maybe [AnomalyDetectorSummary]) (Maybe Text) Int |
Instances
newListAnomalyDetectorsResponse Source #
Create a value of ListAnomalyDetectorsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorSummaryList:ListAnomalyDetectorsResponse', listAnomalyDetectorsResponse_anomalyDetectorSummaryList - A list of anomaly detectors in the account in the current region.
ListAnomalyDetectors, listAnomalyDetectorsResponse_nextToken - If the response is truncated, the service returns this token. To
retrieve the next set of results, use the token in the next request.
$sel:httpStatus:ListAnomalyDetectorsResponse', listAnomalyDetectorsResponse_httpStatus - The response's http status code.
ListAnomalyGroupRelatedMetrics
data ListAnomalyGroupRelatedMetrics Source #
See: newListAnomalyGroupRelatedMetrics smart constructor.
Constructors
| ListAnomalyGroupRelatedMetrics' (Maybe Natural) (Maybe Text) (Maybe RelationshipType) Text Text |
Instances
newListAnomalyGroupRelatedMetrics Source #
Arguments
| :: Text | |
| -> Text | |
| -> ListAnomalyGroupRelatedMetrics |
Create a value of ListAnomalyGroupRelatedMetrics with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:ListAnomalyGroupRelatedMetrics', listAnomalyGroupRelatedMetrics_maxResults - The maximum number of results to return.
ListAnomalyGroupRelatedMetrics, listAnomalyGroupRelatedMetrics_nextToken - Specify the pagination token that's returned by a previous request to
retrieve the next page of results.
$sel:relationshipTypeFilter:ListAnomalyGroupRelatedMetrics', listAnomalyGroupRelatedMetrics_relationshipTypeFilter - Filter for potential causes (CAUSE_OF_INPUT_ANOMALY_GROUP) or
downstream effects (EFFECT_OF_INPUT_ANOMALY_GROUP) of the anomaly
group.
ListAnomalyGroupRelatedMetrics, listAnomalyGroupRelatedMetrics_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
ListAnomalyGroupRelatedMetrics, listAnomalyGroupRelatedMetrics_anomalyGroupId - The ID of the anomaly group.
data ListAnomalyGroupRelatedMetricsResponse Source #
See: newListAnomalyGroupRelatedMetricsResponse smart constructor.
Constructors
| ListAnomalyGroupRelatedMetricsResponse' (Maybe [InterMetricImpactDetails]) (Maybe Text) Int |
Instances
newListAnomalyGroupRelatedMetricsResponse Source #
Arguments
| :: Int | |
| -> ListAnomalyGroupRelatedMetricsResponse |
Create a value of ListAnomalyGroupRelatedMetricsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:interMetricImpactList:ListAnomalyGroupRelatedMetricsResponse', listAnomalyGroupRelatedMetricsResponse_interMetricImpactList - Aggregated details about the measures contributing to the anomaly group,
and the measures potentially impacted by the anomaly group.
ListAnomalyGroupRelatedMetrics, listAnomalyGroupRelatedMetricsResponse_nextToken - The pagination token that's included if more results are available.
$sel:httpStatus:ListAnomalyGroupRelatedMetricsResponse', listAnomalyGroupRelatedMetricsResponse_httpStatus - The response's http status code.
ListAnomalyGroupSummaries
data ListAnomalyGroupSummaries Source #
See: newListAnomalyGroupSummaries smart constructor.
Instances
newListAnomalyGroupSummaries Source #
Arguments
| :: Text | |
| -> Natural | |
| -> ListAnomalyGroupSummaries |
Create a value of ListAnomalyGroupSummaries with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:ListAnomalyGroupSummaries', listAnomalyGroupSummaries_maxResults - The maximum number of results to return.
ListAnomalyGroupSummaries, listAnomalyGroupSummaries_nextToken - Specify the pagination token that's returned by a previous request to
retrieve the next page of results.
ListAnomalyGroupSummaries, listAnomalyGroupSummaries_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
$sel:sensitivityThreshold:ListAnomalyGroupSummaries', listAnomalyGroupSummaries_sensitivityThreshold - The minimum severity score for inclusion in the output.
data ListAnomalyGroupSummariesResponse Source #
See: newListAnomalyGroupSummariesResponse smart constructor.
Constructors
| ListAnomalyGroupSummariesResponse' (Maybe AnomalyGroupStatistics) (Maybe [AnomalyGroupSummary]) (Maybe Text) Int |
Instances
newListAnomalyGroupSummariesResponse Source #
Arguments
| :: Int | |
| -> ListAnomalyGroupSummariesResponse |
Create a value of ListAnomalyGroupSummariesResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroupStatistics:ListAnomalyGroupSummariesResponse', listAnomalyGroupSummariesResponse_anomalyGroupStatistics - Aggregated details about the anomaly groups.
$sel:anomalyGroupSummaryList:ListAnomalyGroupSummariesResponse', listAnomalyGroupSummariesResponse_anomalyGroupSummaryList - A list of anomaly group summaries.
ListAnomalyGroupSummaries, listAnomalyGroupSummariesResponse_nextToken - The pagination token that's included if more results are available.
$sel:httpStatus:ListAnomalyGroupSummariesResponse', listAnomalyGroupSummariesResponse_httpStatus - The response's http status code.
ListAnomalyGroupTimeSeries
data ListAnomalyGroupTimeSeries Source #
See: newListAnomalyGroupTimeSeries smart constructor.
Instances
newListAnomalyGroupTimeSeries Source #
Arguments
| :: Text | |
| -> Text | |
| -> Text | |
| -> ListAnomalyGroupTimeSeries |
Create a value of ListAnomalyGroupTimeSeries with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:maxResults:ListAnomalyGroupTimeSeries', listAnomalyGroupTimeSeries_maxResults - The maximum number of results to return.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeries_nextToken - Specify the pagination token that's returned by a previous request to
retrieve the next page of results.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeries_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeries_anomalyGroupId - The ID of the anomaly group.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeries_metricName - The name of the measure field.
data ListAnomalyGroupTimeSeriesResponse Source #
See: newListAnomalyGroupTimeSeriesResponse smart constructor.
Constructors
| ListAnomalyGroupTimeSeriesResponse' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe [TimeSeries]) (Maybe [Text]) Int |
Instances
newListAnomalyGroupTimeSeriesResponse Source #
Arguments
| :: Int | |
| -> ListAnomalyGroupTimeSeriesResponse |
Create a value of ListAnomalyGroupTimeSeriesResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeriesResponse_anomalyGroupId - The ID of the anomaly group.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeriesResponse_metricName - The name of the measure field.
ListAnomalyGroupTimeSeries, listAnomalyGroupTimeSeriesResponse_nextToken - The pagination token that's included if more results are available.
$sel:timeSeriesList:ListAnomalyGroupTimeSeriesResponse', listAnomalyGroupTimeSeriesResponse_timeSeriesList - A list of anomalous metrics.
$sel:timestampList:ListAnomalyGroupTimeSeriesResponse', listAnomalyGroupTimeSeriesResponse_timestampList - Timestamps for the anomalous metrics.
$sel:httpStatus:ListAnomalyGroupTimeSeriesResponse', listAnomalyGroupTimeSeriesResponse_httpStatus - The response's http status code.
ListMetricSets
data ListMetricSets Source #
See: newListMetricSets smart constructor.
Instances
newListMetricSets :: ListMetricSets Source #
Create a value of ListMetricSets with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
ListMetricSets, listMetricSets_anomalyDetectorArn - The ARN of the anomaly detector containing the metrics sets to list.
$sel:maxResults:ListMetricSets', listMetricSets_maxResults - The maximum number of results to return.
ListMetricSets, listMetricSets_nextToken - If the result of the previous request was truncated, the response
includes a NextToken. To retrieve the next set of results, use the
token in the next request. Tokens expire after 24 hours.
data ListMetricSetsResponse Source #
See: newListMetricSetsResponse smart constructor.
Constructors
| ListMetricSetsResponse' (Maybe [MetricSetSummary]) (Maybe Text) Int |
Instances
newListMetricSetsResponse Source #
Create a value of ListMetricSetsResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:metricSetSummaryList:ListMetricSetsResponse', listMetricSetsResponse_metricSetSummaryList - A list of the datasets in the AWS Region, with configuration details for
each.
ListMetricSets, listMetricSetsResponse_nextToken - If the response is truncated, the list call returns this token. To
retrieve the next set of results, use the token in the next list
request.
$sel:httpStatus:ListMetricSetsResponse', listMetricSetsResponse_httpStatus - The response's http status code.
ListTagsForResource
data ListTagsForResource Source #
See: newListTagsForResource smart constructor.
Constructors
| ListTagsForResource' Text |
Instances
newListTagsForResource Source #
Arguments
| :: Text | |
| -> ListTagsForResource |
Create a value of ListTagsForResource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:resourceArn:ListTagsForResource', listTagsForResource_resourceArn - The resource's Amazon Resource Name (ARN).
data ListTagsForResourceResponse Source #
See: newListTagsForResourceResponse smart constructor.
Instances
newListTagsForResourceResponse Source #
Create a value of ListTagsForResourceResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
ListTagsForResourceResponse, listTagsForResourceResponse_tags - The resource's tags.
$sel:httpStatus:ListTagsForResourceResponse', listTagsForResourceResponse_httpStatus - The response's http status code.
PutFeedback
data PutFeedback Source #
See: newPutFeedback smart constructor.
Constructors
| PutFeedback' Text AnomalyGroupTimeSeriesFeedback |
Instances
Arguments
| :: Text | |
| -> AnomalyGroupTimeSeriesFeedback | |
| -> PutFeedback |
Create a value of PutFeedback with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
PutFeedback, putFeedback_anomalyDetectorArn - The Amazon Resource Name (ARN) of the anomaly detector.
$sel:anomalyGroupTimeSeriesFeedback:PutFeedback', putFeedback_anomalyGroupTimeSeriesFeedback - Feedback for an anomalous metric.
data PutFeedbackResponse Source #
See: newPutFeedbackResponse smart constructor.
Constructors
| PutFeedbackResponse' Int |
Instances
newPutFeedbackResponse Source #
Arguments
| :: Int | |
| -> PutFeedbackResponse |
Create a value of PutFeedbackResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:PutFeedbackResponse', putFeedbackResponse_httpStatus - The response's http status code.
TagResource
data TagResource Source #
See: newTagResource smart constructor.
Constructors
| TagResource' Text (HashMap Text Text) |
Instances
Arguments
| :: Text | |
| -> TagResource |
Create a value of TagResource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:resourceArn:TagResource', tagResource_resourceArn - The resource's Amazon Resource Name (ARN).
TagResource, tagResource_tags - Tags to apply to the resource. Tag keys and values can contain letters,
numbers, spaces, and the following symbols: _.:/=+@-
data TagResourceResponse Source #
See: newTagResourceResponse smart constructor.
Constructors
| TagResourceResponse' Int |
Instances
newTagResourceResponse Source #
Arguments
| :: Int | |
| -> TagResourceResponse |
Create a value of TagResourceResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:TagResourceResponse', tagResourceResponse_httpStatus - The response's http status code.
UntagResource
data UntagResource Source #
See: newUntagResource smart constructor.
Constructors
| UntagResource' Text (NonEmpty Text) |
Instances
Arguments
| :: Text | |
| -> NonEmpty Text | |
| -> UntagResource |
Create a value of UntagResource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:resourceArn:UntagResource', untagResource_resourceArn - The resource's Amazon Resource Name (ARN).
$sel:tagKeys:UntagResource', untagResource_tagKeys - Keys to remove from the resource's tags.
data UntagResourceResponse Source #
See: newUntagResourceResponse smart constructor.
Constructors
| UntagResourceResponse' Int |
Instances
newUntagResourceResponse Source #
Create a value of UntagResourceResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:httpStatus:UntagResourceResponse', untagResourceResponse_httpStatus - The response's http status code.
UpdateAlert
data UpdateAlert Source #
See: newUpdateAlert smart constructor.
Constructors
| UpdateAlert' (Maybe Action) (Maybe Text) (Maybe AlertFilters) (Maybe Natural) Text |
Instances
Arguments
| :: Text | |
| -> UpdateAlert |
Create a value of UpdateAlert with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
UpdateAlert, updateAlert_action - Action that will be triggered when there is an alert.
UpdateAlert, updateAlert_alertDescription - A description of the alert.
UpdateAlert, updateAlert_alertFilters - The configuration of the alert filters, containing MetricList and
DimensionFilterList.
UpdateAlert, updateAlert_alertSensitivityThreshold - An integer from 0 to 100 specifying the alert sensitivity threshold.
UpdateAlert, updateAlert_alertArn - The ARN of the alert to update.
data UpdateAlertResponse Source #
See: newUpdateAlertResponse smart constructor.
Constructors
| UpdateAlertResponse' (Maybe Text) Int |
Instances
newUpdateAlertResponse Source #
Arguments
| :: Int | |
| -> UpdateAlertResponse |
Create a value of UpdateAlertResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
UpdateAlert, updateAlertResponse_alertArn - The ARN of the updated alert.
$sel:httpStatus:UpdateAlertResponse', updateAlertResponse_httpStatus - The response's http status code.
UpdateAnomalyDetector
data UpdateAnomalyDetector Source #
See: newUpdateAnomalyDetector smart constructor.
Constructors
| UpdateAnomalyDetector' (Maybe AnomalyDetectorConfig) (Maybe Text) (Maybe Text) Text |
Instances
newUpdateAnomalyDetector Source #
Arguments
| :: Text | |
| -> UpdateAnomalyDetector |
Create a value of UpdateAnomalyDetector with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorConfig:UpdateAnomalyDetector', updateAnomalyDetector_anomalyDetectorConfig - Contains information about the configuration to which the detector will
be updated.
UpdateAnomalyDetector, updateAnomalyDetector_anomalyDetectorDescription - The updated detector description.
$sel:kmsKeyArn:UpdateAnomalyDetector', updateAnomalyDetector_kmsKeyArn - The Amazon Resource Name (ARN) of an AWS KMS encryption key.
UpdateAnomalyDetector, updateAnomalyDetector_anomalyDetectorArn - The ARN of the detector to update.
data UpdateAnomalyDetectorResponse Source #
See: newUpdateAnomalyDetectorResponse smart constructor.
Constructors
| UpdateAnomalyDetectorResponse' (Maybe Text) Int |
Instances
newUpdateAnomalyDetectorResponse Source #
Create a value of UpdateAnomalyDetectorResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
UpdateAnomalyDetector, updateAnomalyDetectorResponse_anomalyDetectorArn - The ARN of the updated detector.
$sel:httpStatus:UpdateAnomalyDetectorResponse', updateAnomalyDetectorResponse_httpStatus - The response's http status code.
UpdateMetricSet
data UpdateMetricSet Source #
See: newUpdateMetricSet smart constructor.
Constructors
| UpdateMetricSet' (Maybe [MetricSetDimensionFilter]) (Maybe (NonEmpty Text)) (Maybe (NonEmpty Metric)) (Maybe Text) (Maybe Frequency) (Maybe MetricSource) (Maybe Natural) (Maybe TimestampColumn) Text |
Instances
Arguments
| :: Text | |
| -> UpdateMetricSet |
Create a value of UpdateMetricSet with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
UpdateMetricSet, updateMetricSet_dimensionFilterList - Describes a list of filters for choosing specific dimensions and
specific values. Each filter consists of the dimension and one of its
values that you want to include. When multiple dimensions or values are
specified, the dimensions are joined with an AND operation and the
values are joined with an OR operation.
UpdateMetricSet, updateMetricSet_dimensionList - The dimension list.
UpdateMetricSet, updateMetricSet_metricList - The metric list.
UpdateMetricSet, updateMetricSet_metricSetDescription - The dataset's description.
UpdateMetricSet, updateMetricSet_metricSetFrequency - The dataset's interval.
UpdateMetricSet, updateMetricSet_metricSource - Undocumented member.
UpdateMetricSet, updateMetricSet_offset - After an interval ends, the amount of seconds that the detector waits
before importing data. Offset is only supported for S3, Redshift, Athena
and datasources.
$sel:timestampColumn:UpdateMetricSet', updateMetricSet_timestampColumn - The timestamp column.
UpdateMetricSet, updateMetricSet_metricSetArn - The ARN of the dataset to update.
data UpdateMetricSetResponse Source #
See: newUpdateMetricSetResponse smart constructor.
Constructors
| UpdateMetricSetResponse' (Maybe Text) Int |
Instances
newUpdateMetricSetResponse Source #
Create a value of UpdateMetricSetResponse with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
UpdateMetricSet, updateMetricSetResponse_metricSetArn - The ARN of the dataset.
$sel:httpStatus:UpdateMetricSetResponse', updateMetricSetResponse_httpStatus - The response's http status code.
Types
AggregationFunction
newtype AggregationFunction Source #
Constructors
| AggregationFunction' | |
Fields | |
Bundled Patterns
| pattern AggregationFunction_AVG :: AggregationFunction | |
| pattern AggregationFunction_SUM :: AggregationFunction |
Instances
AlertStatus
newtype AlertStatus Source #
Constructors
| AlertStatus' | |
Fields | |
Bundled Patterns
| pattern AlertStatus_ACTIVE :: AlertStatus | |
| pattern AlertStatus_INACTIVE :: AlertStatus |
Instances
AlertType
Constructors
| AlertType' | |
Fields | |
Bundled Patterns
| pattern AlertType_LAMBDA :: AlertType | |
| pattern AlertType_SNS :: AlertType |
Instances
AnomalyDetectionTaskStatus
newtype AnomalyDetectionTaskStatus Source #
Constructors
| AnomalyDetectionTaskStatus' | |
Fields | |
Bundled Patterns
Instances
AnomalyDetectorFailureType
newtype AnomalyDetectorFailureType Source #
Constructors
| AnomalyDetectorFailureType' | |
Fields | |
Bundled Patterns
Instances
AnomalyDetectorStatus
newtype AnomalyDetectorStatus Source #
Constructors
| AnomalyDetectorStatus' | |
Fields | |
Bundled Patterns
Instances
CSVFileCompression
newtype CSVFileCompression Source #
Constructors
| CSVFileCompression' | |
Fields | |
Bundled Patterns
| pattern CSVFileCompression_GZIP :: CSVFileCompression | |
| pattern CSVFileCompression_NONE :: CSVFileCompression |
Instances
Confidence
newtype Confidence Source #
Constructors
| Confidence' | |
Fields | |
Bundled Patterns
| pattern Confidence_HIGH :: Confidence | |
| pattern Confidence_LOW :: Confidence | |
| pattern Confidence_NONE :: Confidence |
Instances
DataQualityMetricType
newtype DataQualityMetricType Source #
Constructors
| DataQualityMetricType' | |
Fields | |
Bundled Patterns
Instances
FilterOperation
newtype FilterOperation Source #
Constructors
| FilterOperation' | |
Fields | |
Bundled Patterns
| pattern FilterOperation_EQUALS :: FilterOperation |
Instances
Frequency
Constructors
| Frequency' | |
Fields | |
Bundled Patterns
| pattern Frequency_P1D :: Frequency | |
| pattern Frequency_PT10M :: Frequency | |
| pattern Frequency_PT1H :: Frequency | |
| pattern Frequency_PT5M :: Frequency |
Instances
JsonFileCompression
newtype JsonFileCompression Source #
Constructors
| JsonFileCompression' | |
Fields | |
Bundled Patterns
| pattern JsonFileCompression_GZIP :: JsonFileCompression | |
| pattern JsonFileCompression_NONE :: JsonFileCompression |
Instances
RelationshipType
newtype RelationshipType Source #
Constructors
| RelationshipType' | |
Fields | |
Bundled Patterns
| pattern RelationshipType_CAUSE_OF_INPUT_ANOMALY_GROUP :: RelationshipType | |
| pattern RelationshipType_EFFECT_OF_INPUT_ANOMALY_GROUP :: RelationshipType |
Instances
SnsFormat
Constructors
| SnsFormat' | |
Fields | |
Bundled Patterns
| pattern SnsFormat_JSON :: SnsFormat | |
| pattern SnsFormat_LONG_TEXT :: SnsFormat | |
| pattern SnsFormat_SHORT_TEXT :: SnsFormat |
Instances
Action
A configuration that specifies the action to perform when anomalies are detected.
See: newAction smart constructor.
Constructors
| Action' (Maybe LambdaConfiguration) (Maybe SNSConfiguration) |
Instances
| FromJSON Action Source # | |
| ToJSON Action Source # | |
Defined in Amazonka.LookoutMetrics.Types.Action | |
| Generic Action Source # | |
| Read Action Source # | |
| Show Action Source # | |
| NFData Action Source # | |
Defined in Amazonka.LookoutMetrics.Types.Action | |
| Eq Action Source # | |
| Hashable Action Source # | |
Defined in Amazonka.LookoutMetrics.Types.Action | |
| type Rep Action Source # | |
Defined in Amazonka.LookoutMetrics.Types.Action type Rep Action = D1 ('MetaData "Action" "Amazonka.LookoutMetrics.Types.Action" "amazonka-lookoutmetrics-2.0-5gJoMWEA4GrGsqHAPh1b9h" 'False) (C1 ('MetaCons "Action'" 'PrefixI 'True) (S1 ('MetaSel ('Just "lambdaConfiguration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe LambdaConfiguration)) :*: S1 ('MetaSel ('Just "sNSConfiguration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe SNSConfiguration)))) | |
Create a value of Action with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:lambdaConfiguration:Action', action_lambdaConfiguration - A configuration for an AWS Lambda channel.
$sel:sNSConfiguration:Action', action_sNSConfiguration - A configuration for an Amazon SNS channel.
Alert
A configuration for Amazon SNS-integrated notifications.
See: newAlert smart constructor.
Constructors
| Alert' (Maybe Action) (Maybe Text) (Maybe Text) (Maybe AlertFilters) (Maybe Text) (Maybe Natural) (Maybe AlertStatus) (Maybe AlertType) (Maybe Text) (Maybe POSIX) (Maybe POSIX) |
Instances
Create a value of Alert with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:action:Alert', alert_action - Action that will be triggered when there is an alert.
$sel:alertArn:Alert', alert_alertArn - The ARN of the alert.
$sel:alertDescription:Alert', alert_alertDescription - A description of the alert.
$sel:alertFilters:Alert', alert_alertFilters - The configuration of the alert filters, containing MetricList and
DimensionFilter.
$sel:alertName:Alert', alert_alertName - The name of the alert.
$sel:alertSensitivityThreshold:Alert', alert_alertSensitivityThreshold - The minimum severity for an anomaly to trigger the alert.
$sel:alertStatus:Alert', alert_alertStatus - The status of the alert.
$sel:alertType:Alert', alert_alertType - The type of the alert.
$sel:anomalyDetectorArn:Alert', alert_anomalyDetectorArn - The ARN of the detector to which the alert is attached.
$sel:creationTime:Alert', alert_creationTime - The time at which the alert was created.
$sel:lastModificationTime:Alert', alert_lastModificationTime - The time at which the alert was last modified.
AlertFilters
data AlertFilters Source #
The configuration of the alert filters.
See: newAlertFilters smart constructor.
Constructors
| AlertFilters' (Maybe (NonEmpty DimensionFilter)) (Maybe (NonEmpty Text)) |
Instances
newAlertFilters :: AlertFilters Source #
Create a value of AlertFilters with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionFilterList:AlertFilters', alertFilters_dimensionFilterList - The list of DimensionFilter objects that are used for dimension-based
filtering.
$sel:metricList:AlertFilters', alertFilters_metricList - The list of measures that you want to get alerts for.
AlertSummary
data AlertSummary Source #
Provides a summary of an alert's configuration.
See: newAlertSummary smart constructor.
Constructors
| AlertSummary' (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe AlertStatus) (Maybe AlertType) (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe (HashMap Text Text)) |
Instances
newAlertSummary :: AlertSummary Source #
Create a value of AlertSummary with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:alertArn:AlertSummary', alertSummary_alertArn - The ARN of the alert.
$sel:alertName:AlertSummary', alertSummary_alertName - The name of the alert.
$sel:alertSensitivityThreshold:AlertSummary', alertSummary_alertSensitivityThreshold - The minimum severity for an anomaly to trigger the alert.
$sel:alertStatus:AlertSummary', alertSummary_alertStatus - The status of the alert.
$sel:alertType:AlertSummary', alertSummary_alertType - The type of the alert.
$sel:anomalyDetectorArn:AlertSummary', alertSummary_anomalyDetectorArn - The ARN of the detector to which the alert is attached.
$sel:creationTime:AlertSummary', alertSummary_creationTime - The time at which the alert was created.
$sel:lastModificationTime:AlertSummary', alertSummary_lastModificationTime - The time at which the alert was last modified.
$sel:tags:AlertSummary', alertSummary_tags - The alert's
tags.
AnomalyDetectorConfig
data AnomalyDetectorConfig Source #
Contains information about a detector's configuration.
See: newAnomalyDetectorConfig smart constructor.
Constructors
| AnomalyDetectorConfig' (Maybe Frequency) |
Instances
newAnomalyDetectorConfig :: AnomalyDetectorConfig Source #
Create a value of AnomalyDetectorConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorFrequency:AnomalyDetectorConfig', anomalyDetectorConfig_anomalyDetectorFrequency - The frequency at which the detector analyzes its source data.
AnomalyDetectorConfigSummary
data AnomalyDetectorConfigSummary Source #
Contains information about a detector's configuration.
See: newAnomalyDetectorConfigSummary smart constructor.
Constructors
| AnomalyDetectorConfigSummary' (Maybe Frequency) |
Instances
newAnomalyDetectorConfigSummary :: AnomalyDetectorConfigSummary Source #
Create a value of AnomalyDetectorConfigSummary with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorFrequency:AnomalyDetectorConfigSummary', anomalyDetectorConfigSummary_anomalyDetectorFrequency - The interval at which the detector analyzes its source data.
AnomalyDetectorDataQualityMetric
data AnomalyDetectorDataQualityMetric Source #
Aggregated details about the data quality metrics collected for the
AnomalyDetectorArn provided in the GetDataQualityMetrics object.
See: newAnomalyDetectorDataQualityMetric smart constructor.
Constructors
| AnomalyDetectorDataQualityMetric' (Maybe [MetricSetDataQualityMetric]) (Maybe POSIX) |
Instances
newAnomalyDetectorDataQualityMetric :: AnomalyDetectorDataQualityMetric Source #
Create a value of AnomalyDetectorDataQualityMetric with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:metricSetDataQualityMetricList:AnomalyDetectorDataQualityMetric', anomalyDetectorDataQualityMetric_metricSetDataQualityMetricList - An array of DataQualityMetricList objects. Each object in the array
contains information about a data quality metric.
$sel:startTimestamp:AnomalyDetectorDataQualityMetric', anomalyDetectorDataQualityMetric_startTimestamp - The start time for the data quality metrics collection.
AnomalyDetectorSummary
data AnomalyDetectorSummary Source #
Contains information about an an anomaly detector.
See: newAnomalyDetectorSummary smart constructor.
Constructors
| AnomalyDetectorSummary' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe AnomalyDetectorStatus) (Maybe (HashMap Text Text)) |
Instances
newAnomalyDetectorSummary :: AnomalyDetectorSummary Source #
Create a value of AnomalyDetectorSummary with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorArn:AnomalyDetectorSummary', anomalyDetectorSummary_anomalyDetectorArn - The ARN of the detector.
$sel:anomalyDetectorDescription:AnomalyDetectorSummary', anomalyDetectorSummary_anomalyDetectorDescription - A description of the detector.
$sel:anomalyDetectorName:AnomalyDetectorSummary', anomalyDetectorSummary_anomalyDetectorName - The name of the detector.
$sel:creationTime:AnomalyDetectorSummary', anomalyDetectorSummary_creationTime - The time at which the detector was created.
$sel:lastModificationTime:AnomalyDetectorSummary', anomalyDetectorSummary_lastModificationTime - The time at which the detector was last modified.
$sel:status:AnomalyDetectorSummary', anomalyDetectorSummary_status - The status of detector.
$sel:tags:AnomalyDetectorSummary', anomalyDetectorSummary_tags - The detector's
tags.
AnomalyGroup
data AnomalyGroup Source #
A group of anomalous metrics
See: newAnomalyGroup smart constructor.
Constructors
| AnomalyGroup' (Maybe Text) (Maybe Double) (Maybe Text) (Maybe [MetricLevelImpact]) (Maybe Text) (Maybe Text) |
Instances
newAnomalyGroup :: AnomalyGroup Source #
Create a value of AnomalyGroup with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroupId:AnomalyGroup', anomalyGroup_anomalyGroupId - The ID of the anomaly group.
$sel:anomalyGroupScore:AnomalyGroup', anomalyGroup_anomalyGroupScore - The severity score of the group.
$sel:endTime:AnomalyGroup', anomalyGroup_endTime - The end time for the group.
$sel:metricLevelImpactList:AnomalyGroup', anomalyGroup_metricLevelImpactList - A list of measures affected by the anomaly.
$sel:primaryMetricName:AnomalyGroup', anomalyGroup_primaryMetricName - The name of the primary affected measure for the group.
$sel:startTime:AnomalyGroup', anomalyGroup_startTime - The start time for the group.
AnomalyGroupStatistics
data AnomalyGroupStatistics Source #
Aggregated statistics for a group of anomalous metrics.
See: newAnomalyGroupStatistics smart constructor.
Constructors
| AnomalyGroupStatistics' (Maybe Text) (Maybe [ItemizedMetricStats]) (Maybe Int) |
Instances
newAnomalyGroupStatistics :: AnomalyGroupStatistics Source #
Create a value of AnomalyGroupStatistics with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:evaluationStartDate:AnomalyGroupStatistics', anomalyGroupStatistics_evaluationStartDate - The start of the time range that was searched.
$sel:itemizedMetricStatsList:AnomalyGroupStatistics', anomalyGroupStatistics_itemizedMetricStatsList - Statistics for individual metrics within the group.
$sel:totalCount:AnomalyGroupStatistics', anomalyGroupStatistics_totalCount - The number of groups found.
AnomalyGroupSummary
data AnomalyGroupSummary Source #
Details about a group of anomalous metrics.
See: newAnomalyGroupSummary smart constructor.
Instances
newAnomalyGroupSummary :: AnomalyGroupSummary Source #
Create a value of AnomalyGroupSummary with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroupId:AnomalyGroupSummary', anomalyGroupSummary_anomalyGroupId - The ID of the anomaly group.
$sel:anomalyGroupScore:AnomalyGroupSummary', anomalyGroupSummary_anomalyGroupScore - The severity score of the group.
$sel:endTime:AnomalyGroupSummary', anomalyGroupSummary_endTime - The end time for the group.
$sel:primaryMetricName:AnomalyGroupSummary', anomalyGroupSummary_primaryMetricName - The name of the primary affected measure for the group.
$sel:startTime:AnomalyGroupSummary', anomalyGroupSummary_startTime - The start time for the group.
AnomalyGroupTimeSeries
data AnomalyGroupTimeSeries Source #
An anomalous metric in an anomaly group.
See: newAnomalyGroupTimeSeries smart constructor.
Constructors
| AnomalyGroupTimeSeries' (Maybe Text) Text |
Instances
newAnomalyGroupTimeSeries Source #
Create a value of AnomalyGroupTimeSeries with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:timeSeriesId:AnomalyGroupTimeSeries', anomalyGroupTimeSeries_timeSeriesId - The ID of the metric.
$sel:anomalyGroupId:AnomalyGroupTimeSeries', anomalyGroupTimeSeries_anomalyGroupId - The ID of the anomaly group.
AnomalyGroupTimeSeriesFeedback
data AnomalyGroupTimeSeriesFeedback Source #
Feedback for an anomalous metric.
See: newAnomalyGroupTimeSeriesFeedback smart constructor.
Constructors
| AnomalyGroupTimeSeriesFeedback' Text Text Bool |
Instances
newAnomalyGroupTimeSeriesFeedback Source #
Arguments
| :: Text | |
| -> Text | |
| -> Bool | |
| -> AnomalyGroupTimeSeriesFeedback |
Create a value of AnomalyGroupTimeSeriesFeedback with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroupId:AnomalyGroupTimeSeriesFeedback', anomalyGroupTimeSeriesFeedback_anomalyGroupId - The ID of the anomaly group.
$sel:timeSeriesId:AnomalyGroupTimeSeriesFeedback', anomalyGroupTimeSeriesFeedback_timeSeriesId - The ID of the metric.
$sel:isAnomaly:AnomalyGroupTimeSeriesFeedback', anomalyGroupTimeSeriesFeedback_isAnomaly - Feedback on whether the metric is a legitimate anomaly.
AppFlowConfig
data AppFlowConfig Source #
Details about an Amazon AppFlow flow datasource.
See: newAppFlowConfig smart constructor.
Constructors
| AppFlowConfig' (Maybe Text) (Maybe Text) |
Instances
newAppFlowConfig :: AppFlowConfig Source #
Create a value of AppFlowConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:flowName:AppFlowConfig', appFlowConfig_flowName - name of the flow.
$sel:roleArn:AppFlowConfig', appFlowConfig_roleArn - An IAM role that gives Amazon Lookout for Metrics permission to access
the flow.
AthenaSourceConfig
data AthenaSourceConfig Source #
Details about an Amazon Athena datasource.
See: newAthenaSourceConfig smart constructor.
Constructors
| AthenaSourceConfig' (Maybe BackTestConfiguration) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Text) |
Instances
newAthenaSourceConfig :: AthenaSourceConfig Source #
Create a value of AthenaSourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:backTestConfiguration:AthenaSourceConfig', athenaSourceConfig_backTestConfiguration - Settings for backtest mode.
$sel:dataCatalog:AthenaSourceConfig', athenaSourceConfig_dataCatalog - The database's data catalog.
$sel:databaseName:AthenaSourceConfig', athenaSourceConfig_databaseName - The database's name.
$sel:roleArn:AthenaSourceConfig', athenaSourceConfig_roleArn - An IAM role that gives Amazon Lookout for Metrics permission to access
the data.
$sel:s3ResultsPath:AthenaSourceConfig', athenaSourceConfig_s3ResultsPath - The database's results path.
$sel:tableName:AthenaSourceConfig', athenaSourceConfig_tableName - The database's table name.
$sel:workGroupName:AthenaSourceConfig', athenaSourceConfig_workGroupName - The database's work group name.
AttributeValue
data AttributeValue Source #
An attribute value.
See: newAttributeValue smart constructor.
Constructors
| AttributeValue' (Maybe Text) (Maybe [Text]) (Maybe Text) (Maybe [Text]) (Maybe Text) (Maybe [Text]) |
Instances
newAttributeValue :: AttributeValue Source #
Create a value of AttributeValue with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:b:AttributeValue', attributeValue_b - A binary value.
$sel:bs:AttributeValue', attributeValue_bs - A list of binary values.
$sel:n:AttributeValue', attributeValue_n - A number.
$sel:ns:AttributeValue', attributeValue_ns - A list of numbers.
$sel:s:AttributeValue', attributeValue_s - A string.
$sel:ss:AttributeValue', attributeValue_ss - A list of strings.
AutoDetectionMetricSource
data AutoDetectionMetricSource Source #
An auto detection metric source.
See: newAutoDetectionMetricSource smart constructor.
Constructors
| AutoDetectionMetricSource' (Maybe AutoDetectionS3SourceConfig) |
Instances
newAutoDetectionMetricSource :: AutoDetectionMetricSource Source #
Create a value of AutoDetectionMetricSource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:s3SourceConfig:AutoDetectionMetricSource', autoDetectionMetricSource_s3SourceConfig - The source's source config.
AutoDetectionS3SourceConfig
data AutoDetectionS3SourceConfig Source #
An auto detection source config.
See: newAutoDetectionS3SourceConfig smart constructor.
Instances
newAutoDetectionS3SourceConfig :: AutoDetectionS3SourceConfig Source #
Create a value of AutoDetectionS3SourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:historicalDataPathList:AutoDetectionS3SourceConfig', autoDetectionS3SourceConfig_historicalDataPathList - The config's historical data path list.
$sel:templatedPathList:AutoDetectionS3SourceConfig', autoDetectionS3SourceConfig_templatedPathList - The config's templated path list.
BackTestConfiguration
data BackTestConfiguration Source #
Settings for backtest mode.
See: newBackTestConfiguration smart constructor.
Constructors
| BackTestConfiguration' Bool |
Instances
newBackTestConfiguration Source #
Create a value of BackTestConfiguration with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:runBackTestMode:BackTestConfiguration', backTestConfiguration_runBackTestMode - Run a backtest instead of monitoring new data.
CloudWatchConfig
data CloudWatchConfig Source #
Details about an Amazon CloudWatch datasource.
See: newCloudWatchConfig smart constructor.
Constructors
| CloudWatchConfig' (Maybe BackTestConfiguration) (Maybe Text) |
Instances
newCloudWatchConfig :: CloudWatchConfig Source #
Create a value of CloudWatchConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:backTestConfiguration:CloudWatchConfig', cloudWatchConfig_backTestConfiguration - Settings for backtest mode.
$sel:roleArn:CloudWatchConfig', cloudWatchConfig_roleArn - An IAM role that gives Amazon Lookout for Metrics permission to access
data in Amazon CloudWatch.
ContributionMatrix
data ContributionMatrix Source #
Details about dimensions that contributed to an anomaly.
See: newContributionMatrix smart constructor.
Constructors
| ContributionMatrix' (Maybe [DimensionContribution]) |
Instances
newContributionMatrix :: ContributionMatrix Source #
Create a value of ContributionMatrix with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionContributionList:ContributionMatrix', contributionMatrix_dimensionContributionList - A list of contributing dimensions.
CsvFormatDescriptor
data CsvFormatDescriptor Source #
Contains information about how a source CSV data file should be analyzed.
See: newCsvFormatDescriptor smart constructor.
Constructors
| CsvFormatDescriptor' (Maybe Text) (Maybe Bool) (Maybe Text) (Maybe CSVFileCompression) (Maybe [Text]) (Maybe Text) |
Instances
newCsvFormatDescriptor :: CsvFormatDescriptor Source #
Create a value of CsvFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:charset:CsvFormatDescriptor', csvFormatDescriptor_charset - The character set in which the source CSV file is written.
$sel:containsHeader:CsvFormatDescriptor', csvFormatDescriptor_containsHeader - Whether or not the source CSV file contains a header.
$sel:delimiter:CsvFormatDescriptor', csvFormatDescriptor_delimiter - The character used to delimit the source CSV file.
$sel:fileCompression:CsvFormatDescriptor', csvFormatDescriptor_fileCompression - The level of compression of the source CSV file.
$sel:headerList:CsvFormatDescriptor', csvFormatDescriptor_headerList - A list of the source CSV file's headers, if any.
$sel:quoteSymbol:CsvFormatDescriptor', csvFormatDescriptor_quoteSymbol - The character used as a quote character.
DataQualityMetric
data DataQualityMetric Source #
An array that describes a data quality metric. Each DataQualityMetric
object contains the data quality metric name, its value, a description
of the metric, and the affected column.
See: newDataQualityMetric smart constructor.
Constructors
| DataQualityMetric' (Maybe Text) (Maybe DataQualityMetricType) (Maybe Double) (Maybe Text) |
Instances
newDataQualityMetric :: DataQualityMetric Source #
Create a value of DataQualityMetric with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:metricDescription:DataQualityMetric', dataQualityMetric_metricDescription - A description of the data quality metric.
$sel:metricType:DataQualityMetric', dataQualityMetric_metricType - The name of the data quality metric.
$sel:metricValue:DataQualityMetric', dataQualityMetric_metricValue - The value of the data quality metric.
$sel:relatedColumnName:DataQualityMetric', dataQualityMetric_relatedColumnName - The column that is being monitored.
DetectedCsvFormatDescriptor
data DetectedCsvFormatDescriptor Source #
Properties of an inferred CSV format.
See: newDetectedCsvFormatDescriptor smart constructor.
Constructors
| DetectedCsvFormatDescriptor' (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) (Maybe DetectedField) |
Instances
newDetectedCsvFormatDescriptor :: DetectedCsvFormatDescriptor Source #
Create a value of DetectedCsvFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:charset:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_charset - The format's charset.
$sel:containsHeader:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_containsHeader - Whether the format includes a header.
$sel:delimiter:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_delimiter - The format's delimiter.
$sel:fileCompression:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_fileCompression - The format's file compression.
$sel:headerList:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_headerList - The format's header list.
$sel:quoteSymbol:DetectedCsvFormatDescriptor', detectedCsvFormatDescriptor_quoteSymbol - The format's quote symbol.
DetectedField
data DetectedField Source #
An inferred field.
See: newDetectedField smart constructor.
Constructors
| DetectedField' (Maybe Confidence) (Maybe Text) (Maybe AttributeValue) |
Instances
newDetectedField :: DetectedField Source #
Create a value of DetectedField with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:confidence:DetectedField', detectedField_confidence - The field's confidence.
$sel:message:DetectedField', detectedField_message - The field's message.
$sel:value:DetectedField', detectedField_value - The field's value.
DetectedFileFormatDescriptor
data DetectedFileFormatDescriptor Source #
Properties of an inferred data format.
See: newDetectedFileFormatDescriptor smart constructor.
Constructors
| DetectedFileFormatDescriptor' (Maybe DetectedCsvFormatDescriptor) (Maybe DetectedJsonFormatDescriptor) |
Instances
newDetectedFileFormatDescriptor :: DetectedFileFormatDescriptor Source #
Create a value of DetectedFileFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:csvFormatDescriptor:DetectedFileFormatDescriptor', detectedFileFormatDescriptor_csvFormatDescriptor - Details about a CSV format.
$sel:jsonFormatDescriptor:DetectedFileFormatDescriptor', detectedFileFormatDescriptor_jsonFormatDescriptor - Details about a JSON format.
DetectedJsonFormatDescriptor
data DetectedJsonFormatDescriptor Source #
A detected JSON format descriptor.
See: newDetectedJsonFormatDescriptor smart constructor.
Constructors
| DetectedJsonFormatDescriptor' (Maybe DetectedField) (Maybe DetectedField) |
Instances
newDetectedJsonFormatDescriptor :: DetectedJsonFormatDescriptor Source #
Create a value of DetectedJsonFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:charset:DetectedJsonFormatDescriptor', detectedJsonFormatDescriptor_charset - The format's character set.
$sel:fileCompression:DetectedJsonFormatDescriptor', detectedJsonFormatDescriptor_fileCompression - The format's file compression.
DetectedMetricSetConfig
data DetectedMetricSetConfig Source #
An inferred dataset configuration.
See: newDetectedMetricSetConfig smart constructor.
Constructors
| DetectedMetricSetConfig' (Maybe DetectedField) (Maybe DetectedMetricSource) (Maybe DetectedField) |
Instances
newDetectedMetricSetConfig :: DetectedMetricSetConfig Source #
Create a value of DetectedMetricSetConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:metricSetFrequency:DetectedMetricSetConfig', detectedMetricSetConfig_metricSetFrequency - The dataset's interval.
$sel:metricSource:DetectedMetricSetConfig', detectedMetricSetConfig_metricSource - The dataset's data source.
$sel:offset:DetectedMetricSetConfig', detectedMetricSetConfig_offset - The dataset's offset.
DetectedMetricSource
data DetectedMetricSource Source #
An inferred data source.
See: newDetectedMetricSource smart constructor.
Constructors
| DetectedMetricSource' (Maybe DetectedS3SourceConfig) |
Instances
newDetectedMetricSource :: DetectedMetricSource Source #
Create a value of DetectedMetricSource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:s3SourceConfig:DetectedMetricSource', detectedMetricSource_s3SourceConfig - The data source's source configuration.
DetectedS3SourceConfig
data DetectedS3SourceConfig Source #
An inferred source configuration.
See: newDetectedS3SourceConfig smart constructor.
Constructors
| DetectedS3SourceConfig' (Maybe DetectedFileFormatDescriptor) |
Instances
newDetectedS3SourceConfig :: DetectedS3SourceConfig Source #
Create a value of DetectedS3SourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:fileFormatDescriptor:DetectedS3SourceConfig', detectedS3SourceConfig_fileFormatDescriptor - The source's file format descriptor.
DimensionContribution
data DimensionContribution Source #
Details about a dimension that contributed to an anomaly.
See: newDimensionContribution smart constructor.
Constructors
| DimensionContribution' (Maybe Text) (Maybe [DimensionValueContribution]) |
Instances
newDimensionContribution :: DimensionContribution Source #
Create a value of DimensionContribution with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionName:DimensionContribution', dimensionContribution_dimensionName - The name of the dimension.
$sel:dimensionValueContributionList:DimensionContribution', dimensionContribution_dimensionValueContributionList - A list of dimension values that contributed to the anomaly.
DimensionFilter
data DimensionFilter Source #
The dimension filter, containing DimensionName and DimensionValueList.
See: newDimensionFilter smart constructor.
Instances
newDimensionFilter :: DimensionFilter Source #
Create a value of DimensionFilter with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionName:DimensionFilter', dimensionFilter_dimensionName - The name of the dimension to filter on.
$sel:dimensionValueList:DimensionFilter', dimensionFilter_dimensionValueList - The list of values for the dimension specified in DimensionName that you
want to filter on.
DimensionNameValue
data DimensionNameValue Source #
A dimension name and value.
See: newDimensionNameValue smart constructor.
Constructors
| DimensionNameValue' Text Text |
Instances
newDimensionNameValue Source #
Arguments
| :: Text | |
| -> Text | |
| -> DimensionNameValue |
Create a value of DimensionNameValue with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionName:DimensionNameValue', dimensionNameValue_dimensionName - The name of the dimension.
$sel:dimensionValue:DimensionNameValue', dimensionNameValue_dimensionValue - The value of the dimension.
DimensionValueContribution
data DimensionValueContribution Source #
The severity of a value of a dimension that contributed to an anomaly.
See: newDimensionValueContribution smart constructor.
Constructors
| DimensionValueContribution' (Maybe Double) (Maybe Text) |
Instances
newDimensionValueContribution :: DimensionValueContribution Source #
Create a value of DimensionValueContribution with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:contributionScore:DimensionValueContribution', dimensionValueContribution_contributionScore - The severity score of the value.
$sel:dimensionValue:DimensionValueContribution', dimensionValueContribution_dimensionValue - The value of the dimension.
ExecutionStatus
data ExecutionStatus Source #
The status of an anomaly detector run.
See: newExecutionStatus smart constructor.
Constructors
| ExecutionStatus' (Maybe Text) (Maybe AnomalyDetectionTaskStatus) (Maybe Text) |
Instances
newExecutionStatus :: ExecutionStatus Source #
Create a value of ExecutionStatus with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:failureReason:ExecutionStatus', executionStatus_failureReason - The reason that the run failed, if applicable.
$sel:status:ExecutionStatus', executionStatus_status - The run's status.
$sel:timestamp:ExecutionStatus', executionStatus_timestamp - The run's timestamp.
FileFormatDescriptor
data FileFormatDescriptor Source #
Contains information about a source file's formatting.
See: newFileFormatDescriptor smart constructor.
Constructors
| FileFormatDescriptor' (Maybe CsvFormatDescriptor) (Maybe JsonFormatDescriptor) |
Instances
newFileFormatDescriptor :: FileFormatDescriptor Source #
Create a value of FileFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:csvFormatDescriptor:FileFormatDescriptor', fileFormatDescriptor_csvFormatDescriptor - Contains information about how a source CSV data file should be
analyzed.
$sel:jsonFormatDescriptor:FileFormatDescriptor', fileFormatDescriptor_jsonFormatDescriptor - Contains information about how a source JSON data file should be
analyzed.
Filter
Describes a filter for choosing a subset of dimension values. Each
filter consists of the dimension that you want to include and the
condition statement. The condition statement is specified in the
FilterOperation object.
See: newFilter smart constructor.
Constructors
| Filter' (Maybe Text) (Maybe FilterOperation) |
Instances
| FromJSON Filter Source # | |
| ToJSON Filter Source # | |
Defined in Amazonka.LookoutMetrics.Types.Filter | |
| Generic Filter Source # | |
| Read Filter Source # | |
| Show Filter Source # | |
| NFData Filter Source # | |
Defined in Amazonka.LookoutMetrics.Types.Filter | |
| Eq Filter Source # | |
| Hashable Filter Source # | |
Defined in Amazonka.LookoutMetrics.Types.Filter | |
| type Rep Filter Source # | |
Defined in Amazonka.LookoutMetrics.Types.Filter type Rep Filter = D1 ('MetaData "Filter" "Amazonka.LookoutMetrics.Types.Filter" "amazonka-lookoutmetrics-2.0-5gJoMWEA4GrGsqHAPh1b9h" 'False) (C1 ('MetaCons "Filter'" 'PrefixI 'True) (S1 ('MetaSel ('Just "dimensionValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "filterOperation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe FilterOperation)))) | |
Create a value of Filter with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dimensionValue:Filter', filter_dimensionValue - The value that you want to include in the filter.
$sel:filterOperation:Filter', filter_filterOperation - The condition to apply.
InterMetricImpactDetails
data InterMetricImpactDetails Source #
Aggregated details about the measures contributing to the anomaly group, and the measures potentially impacted by the anomaly group.
See: newInterMetricImpactDetails smart constructor.
Constructors
| InterMetricImpactDetails' (Maybe Text) (Maybe Double) (Maybe Text) (Maybe RelationshipType) |
Instances
newInterMetricImpactDetails :: InterMetricImpactDetails Source #
Create a value of InterMetricImpactDetails with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyGroupId:InterMetricImpactDetails', interMetricImpactDetails_anomalyGroupId - The ID of the anomaly group.
$sel:contributionPercentage:InterMetricImpactDetails', interMetricImpactDetails_contributionPercentage - For potential causes (CAUSE_OF_INPUT_ANOMALY_GROUP), the percentage
contribution the measure has in causing the anomalies.
$sel:metricName:InterMetricImpactDetails', interMetricImpactDetails_metricName - The name of the measure.
$sel:relationshipType:InterMetricImpactDetails', interMetricImpactDetails_relationshipType - Whether a measure is a potential cause of the anomaly group
(CAUSE_OF_INPUT_ANOMALY_GROUP), or whether the measure is impacted by
the anomaly group (EFFECT_OF_INPUT_ANOMALY_GROUP).
ItemizedMetricStats
data ItemizedMetricStats Source #
Aggregated statistics about a measure affected by an anomaly.
See: newItemizedMetricStats smart constructor.
Constructors
| ItemizedMetricStats' (Maybe Text) (Maybe Int) |
Instances
newItemizedMetricStats :: ItemizedMetricStats Source #
Create a value of ItemizedMetricStats with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:metricName:ItemizedMetricStats', itemizedMetricStats_metricName - The name of the measure.
$sel:occurrenceCount:ItemizedMetricStats', itemizedMetricStats_occurrenceCount - The number of times that the measure appears.
JsonFormatDescriptor
data JsonFormatDescriptor Source #
Contains information about how a source JSON data file should be analyzed.
See: newJsonFormatDescriptor smart constructor.
Constructors
| JsonFormatDescriptor' (Maybe Text) (Maybe JsonFileCompression) |
Instances
newJsonFormatDescriptor :: JsonFormatDescriptor Source #
Create a value of JsonFormatDescriptor with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:charset:JsonFormatDescriptor', jsonFormatDescriptor_charset - The character set in which the source JSON file is written.
$sel:fileCompression:JsonFormatDescriptor', jsonFormatDescriptor_fileCompression - The level of compression of the source CSV file.
LambdaConfiguration
data LambdaConfiguration Source #
Contains information about a Lambda configuration.
See: newLambdaConfiguration smart constructor.
Constructors
| LambdaConfiguration' Text Text |
Instances
newLambdaConfiguration Source #
Arguments
| :: Text | |
| -> Text | |
| -> LambdaConfiguration |
Create a value of LambdaConfiguration with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:roleArn:LambdaConfiguration', lambdaConfiguration_roleArn - The ARN of an IAM role that has permission to invoke the Lambda
function.
$sel:lambdaArn:LambdaConfiguration', lambdaConfiguration_lambdaArn - The ARN of the Lambda function.
Metric
A calculation made by contrasting a measure and a dimension from your source data.
See: newMetric smart constructor.
Constructors
| Metric' (Maybe Text) Text AggregationFunction |
Instances
| FromJSON Metric Source # | |
| ToJSON Metric Source # | |
Defined in Amazonka.LookoutMetrics.Types.Metric | |
| Generic Metric Source # | |
| Read Metric Source # | |
| Show Metric Source # | |
| NFData Metric Source # | |
Defined in Amazonka.LookoutMetrics.Types.Metric | |
| Eq Metric Source # | |
| Hashable Metric Source # | |
Defined in Amazonka.LookoutMetrics.Types.Metric | |
| type Rep Metric Source # | |
Defined in Amazonka.LookoutMetrics.Types.Metric type Rep Metric = D1 ('MetaData "Metric" "Amazonka.LookoutMetrics.Types.Metric" "amazonka-lookoutmetrics-2.0-5gJoMWEA4GrGsqHAPh1b9h" 'False) (C1 ('MetaCons "Metric'" 'PrefixI 'True) (S1 ('MetaSel ('Just "namespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "metricName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "aggregationFunction") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AggregationFunction)))) | |
Arguments
| :: Text | |
| -> AggregationFunction | |
| -> Metric |
Create a value of Metric with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:namespace:Metric', metric_namespace - The namespace for the metric.
$sel:metricName:Metric', metric_metricName - The name of the metric.
$sel:aggregationFunction:Metric', metric_aggregationFunction - The function with which the metric is calculated.
MetricLevelImpact
data MetricLevelImpact Source #
Details about a measure affected by an anomaly.
See: newMetricLevelImpact smart constructor.
Constructors
| MetricLevelImpact' (Maybe ContributionMatrix) (Maybe Text) (Maybe Int) |
Instances
newMetricLevelImpact :: MetricLevelImpact Source #
Create a value of MetricLevelImpact with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:contributionMatrix:MetricLevelImpact', metricLevelImpact_contributionMatrix - Details about the dimensions that contributed to the anomaly.
$sel:metricName:MetricLevelImpact', metricLevelImpact_metricName - The name of the measure.
$sel:numTimeSeries:MetricLevelImpact', metricLevelImpact_numTimeSeries - The number of anomalous metrics for the measure.
MetricSetDataQualityMetric
data MetricSetDataQualityMetric Source #
An array of DataQualityMetric objects that describes one or more data
quality metrics.
See: newMetricSetDataQualityMetric smart constructor.
Constructors
| MetricSetDataQualityMetric' (Maybe [DataQualityMetric]) (Maybe Text) |
Instances
newMetricSetDataQualityMetric :: MetricSetDataQualityMetric Source #
Create a value of MetricSetDataQualityMetric with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dataQualityMetricList:MetricSetDataQualityMetric', metricSetDataQualityMetric_dataQualityMetricList - The array of data quality metrics contained in the data quality metric
set.
$sel:metricSetArn:MetricSetDataQualityMetric', metricSetDataQualityMetric_metricSetArn - The Amazon Resource Name (ARN) of the data quality metric array.
MetricSetDimensionFilter
data MetricSetDimensionFilter Source #
Describes a list of filters for choosing a subset of dimension values. Each filter consists of the dimension and one of its values that you want to include. When multiple dimensions or values are specified, the dimensions are joined with an AND operation and the values are joined with an OR operation.
See: newMetricSetDimensionFilter smart constructor.
Instances
newMetricSetDimensionFilter :: MetricSetDimensionFilter Source #
Create a value of MetricSetDimensionFilter with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:filterList:MetricSetDimensionFilter', metricSetDimensionFilter_filterList - The list of filters that you are applying.
$sel:name:MetricSetDimensionFilter', metricSetDimensionFilter_name - The dimension that you want to filter on.
MetricSetSummary
data MetricSetSummary Source #
Contains information about a dataset.
See: newMetricSetSummary smart constructor.
Constructors
| MetricSetSummary' (Maybe Text) (Maybe POSIX) (Maybe POSIX) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe (HashMap Text Text)) |
Instances
newMetricSetSummary :: MetricSetSummary Source #
Create a value of MetricSetSummary with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:anomalyDetectorArn:MetricSetSummary', metricSetSummary_anomalyDetectorArn - The ARN of the detector to which the dataset belongs.
$sel:creationTime:MetricSetSummary', metricSetSummary_creationTime - The time at which the dataset was created.
$sel:lastModificationTime:MetricSetSummary', metricSetSummary_lastModificationTime - The time at which the dataset was last modified.
$sel:metricSetArn:MetricSetSummary', metricSetSummary_metricSetArn - The ARN of the dataset.
$sel:metricSetDescription:MetricSetSummary', metricSetSummary_metricSetDescription - The description of the dataset.
$sel:metricSetName:MetricSetSummary', metricSetSummary_metricSetName - The name of the dataset.
$sel:tags:MetricSetSummary', metricSetSummary_tags - The dataset's
tags.
MetricSource
data MetricSource Source #
Contains information about source data used to generate metrics.
See: newMetricSource smart constructor.
Constructors
| MetricSource' (Maybe AppFlowConfig) (Maybe AthenaSourceConfig) (Maybe CloudWatchConfig) (Maybe RDSSourceConfig) (Maybe RedshiftSourceConfig) (Maybe S3SourceConfig) |
Instances
newMetricSource :: MetricSource Source #
Create a value of MetricSource with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:appFlowConfig:MetricSource', metricSource_appFlowConfig - Details about an AppFlow datasource.
$sel:athenaSourceConfig:MetricSource', metricSource_athenaSourceConfig - Details about an Amazon Athena datasource.
$sel:cloudWatchConfig:MetricSource', metricSource_cloudWatchConfig - Details about an Amazon CloudWatch monitoring datasource.
$sel:rDSSourceConfig:MetricSource', metricSource_rDSSourceConfig - Details about an Amazon Relational Database Service (RDS) datasource.
$sel:redshiftSourceConfig:MetricSource', metricSource_redshiftSourceConfig - Details about an Amazon Redshift database datasource.
$sel:s3SourceConfig:MetricSource', metricSource_s3SourceConfig - Undocumented member.
RDSSourceConfig
data RDSSourceConfig Source #
Contains information about the Amazon Relational Database Service (RDS) configuration.
See: newRDSSourceConfig smart constructor.
Constructors
| RDSSourceConfig' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe VpcConfiguration) |
Instances
newRDSSourceConfig :: RDSSourceConfig Source #
Create a value of RDSSourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:dbInstanceIdentifier:RDSSourceConfig', rDSSourceConfig_dbInstanceIdentifier - A string identifying the database instance.
$sel:databaseHost:RDSSourceConfig', rDSSourceConfig_databaseHost - The host name of the database.
$sel:databaseName:RDSSourceConfig', rDSSourceConfig_databaseName - The name of the RDS database.
$sel:databasePort:RDSSourceConfig', rDSSourceConfig_databasePort - The port number where the database can be accessed.
$sel:roleArn:RDSSourceConfig', rDSSourceConfig_roleArn - The Amazon Resource Name (ARN) of the role.
$sel:secretManagerArn:RDSSourceConfig', rDSSourceConfig_secretManagerArn - The Amazon Resource Name (ARN) of the AWS Secrets Manager role.
$sel:tableName:RDSSourceConfig', rDSSourceConfig_tableName - The name of the table in the database.
$sel:vpcConfiguration:RDSSourceConfig', rDSSourceConfig_vpcConfiguration - An object containing information about the Amazon Virtual Private Cloud
(VPC) configuration.
RedshiftSourceConfig
data RedshiftSourceConfig Source #
Provides information about the Amazon Redshift database configuration.
See: newRedshiftSourceConfig smart constructor.
Constructors
| RedshiftSourceConfig' (Maybe Text) (Maybe Text) (Maybe Text) (Maybe Natural) (Maybe Text) (Maybe Text) (Maybe Text) (Maybe VpcConfiguration) |
Instances
newRedshiftSourceConfig :: RedshiftSourceConfig Source #
Create a value of RedshiftSourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:clusterIdentifier:RedshiftSourceConfig', redshiftSourceConfig_clusterIdentifier - A string identifying the Redshift cluster.
$sel:databaseHost:RedshiftSourceConfig', redshiftSourceConfig_databaseHost - The name of the database host.
$sel:databaseName:RedshiftSourceConfig', redshiftSourceConfig_databaseName - The Redshift database name.
$sel:databasePort:RedshiftSourceConfig', redshiftSourceConfig_databasePort - The port number where the database can be accessed.
$sel:roleArn:RedshiftSourceConfig', redshiftSourceConfig_roleArn - The Amazon Resource Name (ARN) of the role providing access to the
database.
$sel:secretManagerArn:RedshiftSourceConfig', redshiftSourceConfig_secretManagerArn - The Amazon Resource Name (ARN) of the AWS Secrets Manager role.
$sel:tableName:RedshiftSourceConfig', redshiftSourceConfig_tableName - The table name of the Redshift database.
$sel:vpcConfiguration:RedshiftSourceConfig', redshiftSourceConfig_vpcConfiguration - Contains information about the Amazon Virtual Private Cloud (VPC)
configuration.
S3SourceConfig
data S3SourceConfig Source #
Contains information about the configuration of the S3 bucket that contains source files.
See: newS3SourceConfig smart constructor.
Constructors
| S3SourceConfig' (Maybe FileFormatDescriptor) (Maybe (NonEmpty Text)) (Maybe Text) (Maybe (NonEmpty Text)) |
Instances
newS3SourceConfig :: S3SourceConfig Source #
Create a value of S3SourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:fileFormatDescriptor:S3SourceConfig', s3SourceConfig_fileFormatDescriptor - Contains information about a source file's formatting.
$sel:historicalDataPathList:S3SourceConfig', s3SourceConfig_historicalDataPathList - A list of paths to the historical data files.
$sel:roleArn:S3SourceConfig', s3SourceConfig_roleArn - The ARN of an IAM role that has read and write access permissions to the
source S3 bucket.
$sel:templatedPathList:S3SourceConfig', s3SourceConfig_templatedPathList - A list of templated paths to the source files.
SNSConfiguration
data SNSConfiguration Source #
Contains information about the SNS topic to which you want to send your alerts and the IAM role that has access to that topic.
See: newSNSConfiguration smart constructor.
Constructors
| SNSConfiguration' (Maybe SnsFormat) Text Text |
Instances
Arguments
| :: Text | |
| -> Text | |
| -> SNSConfiguration |
Create a value of SNSConfiguration with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:snsFormat:SNSConfiguration', sNSConfiguration_snsFormat - The format of the SNS topic.
JSON– Send JSON alerts with an anomaly ID and a link to the anomaly detail page. This is the default.LONG_TEXT– Send human-readable alerts with information about the impacted timeseries and a link to the anomaly detail page. We recommend this for email.SHORT_TEXT– Send human-readable alerts with a link to the anomaly detail page. We recommend this for SMS.
$sel:roleArn:SNSConfiguration', sNSConfiguration_roleArn - The ARN of the IAM role that has access to the target SNS topic.
$sel:snsTopicArn:SNSConfiguration', sNSConfiguration_snsTopicArn - The ARN of the target SNS topic.
SampleDataS3SourceConfig
data SampleDataS3SourceConfig Source #
Contains information about the source configuration in Amazon S3.
See: newSampleDataS3SourceConfig smart constructor.
Constructors
| SampleDataS3SourceConfig' (Maybe (NonEmpty Text)) (Maybe (NonEmpty Text)) Text FileFormatDescriptor |
Instances
newSampleDataS3SourceConfig Source #
Arguments
| :: Text | |
| -> FileFormatDescriptor | |
| -> SampleDataS3SourceConfig |
Create a value of SampleDataS3SourceConfig with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:historicalDataPathList:SampleDataS3SourceConfig', sampleDataS3SourceConfig_historicalDataPathList - An array of strings containing the historical set of data paths.
$sel:templatedPathList:SampleDataS3SourceConfig', sampleDataS3SourceConfig_templatedPathList - An array of strings containing the list of templated paths.
$sel:roleArn:SampleDataS3SourceConfig', sampleDataS3SourceConfig_roleArn - The Amazon Resource Name (ARN) of the role.
$sel:fileFormatDescriptor:SampleDataS3SourceConfig', sampleDataS3SourceConfig_fileFormatDescriptor - Undocumented member.
TimeSeries
data TimeSeries Source #
Details about a metric. A metric is an aggregation of the values of a measure for a dimension value, such as availability in the us-east-1 Region.
See: newTimeSeries smart constructor.
Constructors
| TimeSeries' Text [DimensionNameValue] [Double] |
Instances
Arguments
| :: Text | |
| -> TimeSeries |
Create a value of TimeSeries with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:timeSeriesId:TimeSeries', timeSeries_timeSeriesId - The ID of the metric.
$sel:dimensionList:TimeSeries', timeSeries_dimensionList - The dimensions of the metric.
$sel:metricValueList:TimeSeries', timeSeries_metricValueList - The values for the metric.
TimeSeriesFeedback
data TimeSeriesFeedback Source #
Details about feedback submitted for an anomalous metric.
See: newTimeSeriesFeedback smart constructor.
Constructors
| TimeSeriesFeedback' (Maybe Bool) (Maybe Text) |
Instances
newTimeSeriesFeedback :: TimeSeriesFeedback Source #
Create a value of TimeSeriesFeedback with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:isAnomaly:TimeSeriesFeedback', timeSeriesFeedback_isAnomaly - Feedback on whether the metric is a legitimate anomaly.
$sel:timeSeriesId:TimeSeriesFeedback', timeSeriesFeedback_timeSeriesId - The ID of the metric.
TimestampColumn
data TimestampColumn Source #
Contains information about the column used to track time in a source data file.
See: newTimestampColumn smart constructor.
Constructors
| TimestampColumn' (Maybe Text) (Maybe Text) |
Instances
newTimestampColumn :: TimestampColumn Source #
Create a value of TimestampColumn with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:columnFormat:TimestampColumn', timestampColumn_columnFormat - The format of the timestamp column.
$sel:columnName:TimestampColumn', timestampColumn_columnName - The name of the timestamp column.
VpcConfiguration
data VpcConfiguration Source #
Contains configuration information about the Amazon Virtual Private Cloud (VPC).
See: newVpcConfiguration smart constructor.
Constructors
| VpcConfiguration' [Text] [Text] |
Instances
newVpcConfiguration :: VpcConfiguration Source #
Create a value of VpcConfiguration with all optional fields omitted.
Use generic-lens or optics to modify other optional fields.
The following record fields are available, with the corresponding lenses provided for backwards compatibility:
$sel:subnetIdList:VpcConfiguration', vpcConfiguration_subnetIdList - An array of strings containing the Amazon VPC subnet IDs (e.g.,
subnet-0bb1c79de3EXAMPLE.
$sel:securityGroupIdList:VpcConfiguration', vpcConfiguration_securityGroupIdList - An array of strings containing the list of security groups.