amazonka-sagemaker-1.6.1: Amazon SageMaker Service SDK.

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

Network.AWS.SageMaker

Contents

Description

Definition of the public APIs exposed by SageMaker

Synopsis

Service Configuration

sageMaker :: Service Source #

API version 2017-07-24 of the Amazon SageMaker Service 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 SageMaker.

ResourceLimitExceeded

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

You have exceeded an Amazon SageMaker resource limit. For example, you might have too many training jobs created.

ResourceInUse

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

Resource being accessed is in use.

ResourceNotFound

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

Resource being access is not found.

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.

NotebookInstanceDeleted

notebookInstanceDeleted :: Wait DescribeNotebookInstance Source #

Polls DescribeNotebookInstance every 30 seconds until a successful state is reached. An error is returned after 60 failed checks.

EndpointDeleted

endpointDeleted :: Wait DescribeEndpoint Source #

Polls DescribeEndpoint every 30 seconds until a successful state is reached. An error is returned after 60 failed checks.

EndpointInService

endpointInService :: Wait DescribeEndpoint Source #

Polls DescribeEndpoint every 30 seconds until a successful state is reached. An error is returned after 120 failed checks.

NotebookInstanceInService

notebookInstanceInService :: Wait DescribeNotebookInstance Source #

Polls DescribeNotebookInstance every 30 seconds until a successful state is reached. An error is returned after 60 failed checks.

TrainingJobCompletedOrStopped

trainingJobCompletedOrStopped :: Wait DescribeTrainingJob Source #

Polls DescribeTrainingJob every 120 seconds until a successful state is reached. An error is returned after 180 failed checks.

NotebookInstanceStopped

notebookInstanceStopped :: Wait DescribeNotebookInstance Source #

Polls DescribeNotebookInstance every 30 seconds until a successful state is reached. An error is returned after 60 failed checks.

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.

CreateNotebookInstance

DescribeEndpointConfig

CreateEndpoint

DescribeTrainingJob

DeleteEndpoint

UpdateEndpoint

DeleteNotebookInstanceLifecycleConfig

UpdateNotebookInstanceLifecycleConfig

DescribeNotebookInstance

CreateEndpointConfig

StopNotebookInstance

UpdateEndpointWeightsAndCapacities

DeleteTags

DeleteEndpointConfig

CreateModel

DeleteModel

ListModels (Paginated)

DescribeNotebookInstanceLifecycleConfig

ListNotebookInstances (Paginated)

DeleteNotebookInstance

UpdateNotebookInstance

StopTrainingJob

DescribeModel

ListEndpoints (Paginated)

CreatePresignedNotebookInstanceURL

ListNotebookInstanceLifecycleConfigs

CreateNotebookInstanceLifecycleConfig

StartNotebookInstance

AddTags

ListEndpointConfigs (Paginated)

ListTags (Paginated)

CreateTrainingJob

DescribeEndpoint

ListTrainingJobs (Paginated)

Types

CompressionType

data CompressionType Source #

Constructors

CTGzip 
CTNone 
Instances
Bounded CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: CompressionType -> Constr #

dataTypeOf :: CompressionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep CompressionType :: Type -> Type #

Hashable CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: CompressionType -> () #

type Rep CompressionType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep CompressionType = D1 (MetaData "CompressionType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "CTGzip" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CTNone" PrefixI False) (U1 :: Type -> Type))

DirectInternetAccess

data DirectInternetAccess Source #

Constructors

Disabled 
Enabled 
Instances
Bounded DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: DirectInternetAccess -> Constr #

dataTypeOf :: DirectInternetAccess -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep DirectInternetAccess :: Type -> Type #

Hashable DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: DirectInternetAccess -> () #

type Rep DirectInternetAccess Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep DirectInternetAccess = D1 (MetaData "DirectInternetAccess" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "Disabled" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Enabled" PrefixI False) (U1 :: Type -> Type))

EndpointConfigSortKey

data EndpointConfigSortKey Source #

Constructors

CreationTime 
Name 
Instances
Bounded EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: EndpointConfigSortKey -> Constr #

dataTypeOf :: EndpointConfigSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep EndpointConfigSortKey :: Type -> Type #

Hashable EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: EndpointConfigSortKey -> () #

type Rep EndpointConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep EndpointConfigSortKey = D1 (MetaData "EndpointConfigSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "CreationTime" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Name" PrefixI False) (U1 :: Type -> Type))

EndpointSortKey

data EndpointSortKey Source #

Instances
Bounded EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: EndpointSortKey -> Constr #

dataTypeOf :: EndpointSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep EndpointSortKey :: Type -> Type #

Hashable EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: EndpointSortKey -> () #

type Rep EndpointSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep EndpointSortKey = D1 (MetaData "EndpointSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ESKCreationTime" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ESKName" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESKStatus" PrefixI False) (U1 :: Type -> Type)))

EndpointStatus

data EndpointStatus Source #

Instances
Bounded EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: EndpointStatus -> Constr #

dataTypeOf :: EndpointStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep EndpointStatus :: Type -> Type #

Hashable EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: EndpointStatus -> () #

type Rep EndpointStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep EndpointStatus = D1 (MetaData "EndpointStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) ((C1 (MetaCons "Creating" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Deleting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Failed" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "InService" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OutOfService" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "RollingBack" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Updating" PrefixI False) (U1 :: Type -> Type))))

InstanceType

data InstanceType Source #

Instances
Bounded InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: InstanceType -> Constr #

dataTypeOf :: InstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep InstanceType :: Type -> Type #

Hashable InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: InstanceType -> Text #

NFData InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: InstanceType -> () #

type Rep InstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep InstanceType = D1 (MetaData "InstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (((C1 (MetaCons "Ml_M4_10XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Ml_M4_16XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_M4_2XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Ml_M4_4XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_M4_XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Ml_P2_16XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_P2_8XLarge" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "Ml_P2_XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_P3_16XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Ml_P3_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_P3_8XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Ml_T2_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_T2_Large" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Ml_T2_Medium" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ml_T2_XLarge" PrefixI False) (U1 :: Type -> Type)))))

ModelSortKey

data ModelSortKey Source #

Constructors

MSKCreationTime 
MSKName 
Instances
Bounded ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: ModelSortKey -> Constr #

dataTypeOf :: ModelSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep ModelSortKey :: Type -> Type #

Hashable ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: ModelSortKey -> Text #

NFData ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: ModelSortKey -> () #

type Rep ModelSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep ModelSortKey = D1 (MetaData "ModelSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "MSKCreationTime" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MSKName" PrefixI False) (U1 :: Type -> Type))

NotebookInstanceLifecycleConfigSortKey

data NotebookInstanceLifecycleConfigSortKey Source #

Instances
Bounded NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSortKey -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Hashable NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceLifecycleConfigSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceLifecycleConfigSortKey = D1 (MetaData "NotebookInstanceLifecycleConfigSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "NILCSKCreationTime" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NILCSKLastModifiedTime" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NILCSKName" PrefixI False) (U1 :: Type -> Type)))

NotebookInstanceLifecycleConfigSortOrder

data NotebookInstanceLifecycleConfigSortOrder Source #

Instances
Bounded NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSortOrder -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Hashable NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceLifecycleConfigSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceLifecycleConfigSortOrder = D1 (MetaData "NotebookInstanceLifecycleConfigSortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "NILCSOAscending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NILCSODescending" PrefixI False) (U1 :: Type -> Type))

NotebookInstanceSortKey

data NotebookInstanceSortKey Source #

Instances
Bounded NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: NotebookInstanceSortKey -> Constr #

dataTypeOf :: NotebookInstanceSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep NotebookInstanceSortKey :: Type -> Type #

Hashable NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: NotebookInstanceSortKey -> () #

type Rep NotebookInstanceSortKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceSortKey = D1 (MetaData "NotebookInstanceSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "NISKCreationTime" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NISKName" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NISKStatus" PrefixI False) (U1 :: Type -> Type)))

NotebookInstanceSortOrder

data NotebookInstanceSortOrder Source #

Constructors

Ascending 
Descending 
Instances
Bounded NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: NotebookInstanceSortOrder -> Constr #

dataTypeOf :: NotebookInstanceSortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep NotebookInstanceSortOrder :: Type -> Type #

Hashable NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceSortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceSortOrder = D1 (MetaData "NotebookInstanceSortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "Ascending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Descending" PrefixI False) (U1 :: Type -> Type))

NotebookInstanceStatus

data NotebookInstanceStatus Source #

Instances
Bounded NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: NotebookInstanceStatus -> Constr #

dataTypeOf :: NotebookInstanceStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep NotebookInstanceStatus :: Type -> Type #

Hashable NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: NotebookInstanceStatus -> () #

type Rep NotebookInstanceStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep NotebookInstanceStatus = D1 (MetaData "NotebookInstanceStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) ((C1 (MetaCons "NISDeleting" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NISFailed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NISInService" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "NISPending" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NISStopped" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NISStopping" PrefixI False) (U1 :: Type -> Type))))

OrderKey

data OrderKey Source #

Constructors

OKAscending 
OKDescending 
Instances
Bounded OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: OrderKey -> Constr #

dataTypeOf :: OrderKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep OrderKey :: Type -> Type #

Methods

from :: OrderKey -> Rep OrderKey x #

to :: Rep OrderKey x -> OrderKey #

Hashable OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

hashWithSalt :: Int -> OrderKey -> Int #

hash :: OrderKey -> Int #

ToJSON OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

ToQuery OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toBS :: OrderKey -> ByteString #

FromText OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: OrderKey -> Text #

NFData OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: OrderKey -> () #

type Rep OrderKey Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep OrderKey = D1 (MetaData "OrderKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "OKAscending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OKDescending" PrefixI False) (U1 :: Type -> Type))

ProductionVariantInstanceType

data ProductionVariantInstanceType Source #

Instances
Bounded ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: ProductionVariantInstanceType -> Constr #

dataTypeOf :: ProductionVariantInstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep ProductionVariantInstanceType :: Type -> Type #

Hashable ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep ProductionVariantInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep ProductionVariantInstanceType = D1 (MetaData "ProductionVariantInstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (((((C1 (MetaCons "PVITMl_C4_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_C4_4XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_C4_8XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_C4_Large" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PVITMl_C4_XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_C5_18XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_C5_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_C5_4XLarge" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "PVITMl_C5_9XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_C5_Large" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_C5_XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M4_10XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PVITMl_M4_16XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M4_2XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_M4_4XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M4_XLarge" PrefixI False) (U1 :: Type -> Type))))) :+: ((((C1 (MetaCons "PVITMl_M5_12XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M5_24XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_M5_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M5_4XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PVITMl_M5_Large" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_M5_XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_P2_16XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_P2_8XLarge" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "PVITMl_P2_XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_P3_16XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_P3_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_P3_8XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PVITMl_T2_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_T2_Large" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PVITMl_T2_Medium" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PVITMl_T2_XLarge" PrefixI False) (U1 :: Type -> Type))))))

RecordWrapper

data RecordWrapper Source #

Constructors

None 
RecordIO 
Instances
Bounded RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: RecordWrapper -> Constr #

dataTypeOf :: RecordWrapper -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep RecordWrapper :: Type -> Type #

Hashable RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: RecordWrapper -> Text #

NFData RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: RecordWrapper -> () #

type Rep RecordWrapper Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep RecordWrapper = D1 (MetaData "RecordWrapper" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RecordIO" PrefixI False) (U1 :: Type -> Type))

S3DataDistribution

data S3DataDistribution Source #

Instances
Bounded S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: S3DataDistribution -> Constr #

dataTypeOf :: S3DataDistribution -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep S3DataDistribution :: Type -> Type #

Hashable S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: S3DataDistribution -> () #

type Rep S3DataDistribution Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep S3DataDistribution = D1 (MetaData "S3DataDistribution" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "FullyReplicated" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ShardedByS3Key" PrefixI False) (U1 :: Type -> Type))

S3DataType

data S3DataType Source #

Constructors

ManifestFile 
S3Prefix 
Instances
Bounded S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: S3DataType -> Constr #

dataTypeOf :: S3DataType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep S3DataType :: Type -> Type #

Hashable S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: S3DataType -> Text #

NFData S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: S3DataType -> () #

type Rep S3DataType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep S3DataType = D1 (MetaData "S3DataType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ManifestFile" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "S3Prefix" PrefixI False) (U1 :: Type -> Type))

SecondaryStatus

data SecondaryStatus Source #

Instances
Bounded SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: SecondaryStatus -> Constr #

dataTypeOf :: SecondaryStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep SecondaryStatus :: Type -> Type #

Hashable SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: SecondaryStatus -> () #

type Rep SecondaryStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep SecondaryStatus = D1 (MetaData "SecondaryStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (((C1 (MetaCons "SSCompleted" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SSDownloading" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SSFailed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SSMaxRuntimeExceeded" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "SSStarting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SSStopped" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SSStopping" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SSTraining" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SSUploading" PrefixI False) (U1 :: Type -> Type)))))

SortBy

data SortBy Source #

Instances
Bounded SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

Data SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: SortBy -> Constr #

dataTypeOf :: SortBy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep SortBy :: Type -> Type #

Methods

from :: SortBy -> Rep SortBy x #

to :: Rep SortBy x -> SortBy #

Hashable SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

hashWithSalt :: Int -> SortBy -> Int #

hash :: SortBy -> Int #

ToJSON SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

ToQuery SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toBS :: SortBy -> ByteString #

FromText SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

parser :: Parser SortBy #

ToText SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: SortBy -> Text #

NFData SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: SortBy -> () #

type Rep SortBy Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep SortBy = D1 (MetaData "SortBy" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "SBCreationTime" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SBName" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SBStatus" PrefixI False) (U1 :: Type -> Type)))

SortOrder

data SortOrder Source #

Constructors

SOAscending 
SODescending 
Instances
Bounded SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: SortOrder -> Constr #

dataTypeOf :: SortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep SortOrder :: Type -> Type #

Hashable SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toBS :: SortOrder -> ByteString #

FromText SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

toText :: SortOrder -> Text #

NFData SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: SortOrder -> () #

type Rep SortOrder Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep SortOrder = D1 (MetaData "SortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "SOAscending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SODescending" PrefixI False) (U1 :: Type -> Type))

TrainingInputMode

data TrainingInputMode Source #

Constructors

File 
Pipe 
Instances
Bounded TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: TrainingInputMode -> Constr #

dataTypeOf :: TrainingInputMode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep TrainingInputMode :: Type -> Type #

Hashable TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: TrainingInputMode -> () #

type Rep TrainingInputMode Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep TrainingInputMode = D1 (MetaData "TrainingInputMode" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "File" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Pipe" PrefixI False) (U1 :: Type -> Type))

TrainingInstanceType

data TrainingInstanceType Source #

Instances
Bounded TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: TrainingInstanceType -> Constr #

dataTypeOf :: TrainingInstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep TrainingInstanceType :: Type -> Type #

Hashable TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: TrainingInstanceType -> () #

type Rep TrainingInstanceType Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep TrainingInstanceType = D1 (MetaData "TrainingInstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) ((((C1 (MetaCons "TITMl_C4_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_C4_4XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_C4_8XLarge" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "TITMl_C4_XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_C5_18XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_C5_2XLarge" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "TITMl_C5_4XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_C5_9XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_C5_XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "TITMl_M4_10XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_M4_16XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TITMl_M4_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_M4_4XLarge" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "TITMl_M4_XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_M5_12XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_M5_24XLarge" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "TITMl_M5_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_M5_4XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_M5_Large" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "TITMl_M5_XLarge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TITMl_P2_16XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_P2_8XLarge" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "TITMl_P2_XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_P3_16XLarge" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TITMl_P3_2XLarge" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TITMl_P3_8XLarge" PrefixI False) (U1 :: Type -> Type))))))

TrainingJobStatus

data TrainingJobStatus Source #

Instances
Bounded TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Enum TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Eq TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Data TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

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

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

toConstr :: TrainingJobStatus -> Constr #

dataTypeOf :: TrainingJobStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Read TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Show TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Generic TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Associated Types

type Rep TrainingJobStatus :: Type -> Type #

Hashable TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToJSON TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromJSON TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToHeader TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToQuery TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToByteString TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

FromText TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

ToText TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

NFData TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

Methods

rnf :: TrainingJobStatus -> () #

type Rep TrainingJobStatus Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Sum

type Rep TrainingJobStatus = D1 (MetaData "TrainingJobStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) ((C1 (MetaCons "TJSCompleted" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TJSFailed" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TJSInProgress" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TJSStopped" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TJSStopping" PrefixI False) (U1 :: Type -> Type))))

AlgorithmSpecification

data AlgorithmSpecification Source #

Specifies the training algorithm to use in a CreateTrainingJob request.

For more information about algorithms provided by Amazon SageMaker, see Algorithms . For information about using your own algorithms, see 'your-algorithms' .

See: algorithmSpecification smart constructor.

Instances
Eq AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: AlgorithmSpecification -> Constr #

dataTypeOf :: AlgorithmSpecification -> DataType #

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

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

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

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

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

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

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

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

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

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

Read AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep AlgorithmSpecification :: Type -> Type #

Hashable AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: AlgorithmSpecification -> () #

type Rep AlgorithmSpecification Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep AlgorithmSpecification = D1 (MetaData "AlgorithmSpecification" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "AlgorithmSpecification'" PrefixI True) (S1 (MetaSel (Just "_asTrainingImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_asTrainingInputMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TrainingInputMode)))

algorithmSpecification Source #

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

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

  • asTrainingImage - The registry path of the Docker image that contains the training algorithm. For information about docker registry paths for built-in algorithms, see 'sagemaker-algo-docker-registry-paths' .
  • asTrainingInputMode - The input mode that the algorithm supports. For the input modes that Amazon SageMaker algorithms support, see Algorithms . If an algorithm supports the File input mode, Amazon SageMaker downloads the training data from S3 to the provisioned ML storage Volume, and mounts the directory to docker volume for training container. If an algorithm supports the Pipe input mode, Amazon SageMaker streams data directly from S3 to the container. In File mode, make sure you provision ML storage volume with sufficient capacity to accommodate the data download from S3. In addition to the training data, the ML storage volume also stores the output model. The algorithm container use ML storage volume to also store intermediate information, if any. For distributed algorithms using File mode, training data is distributed uniformly, and your training duration is predictable if the input data objects size is approximately same. Amazon SageMaker does not split the files any further for model training. If the object sizes are skewed, training won't be optimal as the data distribution is also skewed where one host in a training cluster is overloaded, thus becoming bottleneck in training.

asTrainingImage :: Lens' AlgorithmSpecification Text Source #

The registry path of the Docker image that contains the training algorithm. For information about docker registry paths for built-in algorithms, see 'sagemaker-algo-docker-registry-paths' .

asTrainingInputMode :: Lens' AlgorithmSpecification TrainingInputMode Source #

The input mode that the algorithm supports. For the input modes that Amazon SageMaker algorithms support, see Algorithms . If an algorithm supports the File input mode, Amazon SageMaker downloads the training data from S3 to the provisioned ML storage Volume, and mounts the directory to docker volume for training container. If an algorithm supports the Pipe input mode, Amazon SageMaker streams data directly from S3 to the container. In File mode, make sure you provision ML storage volume with sufficient capacity to accommodate the data download from S3. In addition to the training data, the ML storage volume also stores the output model. The algorithm container use ML storage volume to also store intermediate information, if any. For distributed algorithms using File mode, training data is distributed uniformly, and your training duration is predictable if the input data objects size is approximately same. Amazon SageMaker does not split the files any further for model training. If the object sizes are skewed, training won't be optimal as the data distribution is also skewed where one host in a training cluster is overloaded, thus becoming bottleneck in training.

Channel

data Channel Source #

A channel is a named input source that training algorithms can consume.

See: channel smart constructor.

Instances
Eq Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

Data Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: Channel -> Constr #

dataTypeOf :: Channel -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep Channel :: Type -> Type #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

Hashable Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

hashWithSalt :: Int -> Channel -> Int #

hash :: Channel -> Int #

ToJSON Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: Channel -> () #

type Rep Channel Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep Channel = D1 (MetaData "Channel" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "Channel'" PrefixI True) ((S1 (MetaSel (Just "_cRecordWrapperType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RecordWrapper)) :*: S1 (MetaSel (Just "_cCompressionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CompressionType))) :*: (S1 (MetaSel (Just "_cContentType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cChannelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_cDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DataSource)))))

channel Source #

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

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

  • cRecordWrapperType - Specify RecordIO as the value when input data is in raw format but the training algorithm requires the RecordIO format, in which caseAmazon SageMaker wraps each individual S3 object in a RecordIO record. If the input data is already in RecordIO format, you don't need to set this attribute. For more information, see Create a Dataset Using RecordIO . In FILE mode, leave this field unset or set it to None.
  • cCompressionType - If training data is compressed, the compression type. The default value is None . CompressionType is used only in PIPE input mode. In FILE mode, leave this field unset or set it to None.
  • cContentType - The MIME type of the data.
  • cChannelName - The name of the channel.
  • cDataSource - The location of the channel data.

cRecordWrapperType :: Lens' Channel (Maybe RecordWrapper) Source #

Specify RecordIO as the value when input data is in raw format but the training algorithm requires the RecordIO format, in which caseAmazon SageMaker wraps each individual S3 object in a RecordIO record. If the input data is already in RecordIO format, you don't need to set this attribute. For more information, see Create a Dataset Using RecordIO . In FILE mode, leave this field unset or set it to None.

cCompressionType :: Lens' Channel (Maybe CompressionType) Source #

If training data is compressed, the compression type. The default value is None . CompressionType is used only in PIPE input mode. In FILE mode, leave this field unset or set it to None.

cContentType :: Lens' Channel (Maybe Text) Source #

The MIME type of the data.

cChannelName :: Lens' Channel Text Source #

The name of the channel.

cDataSource :: Lens' Channel DataSource Source #

The location of the channel data.

ContainerDefinition

data ContainerDefinition Source #

Describes the container, as part of model definition.

See: containerDefinition smart constructor.

Instances
Eq ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ContainerDefinition -> Constr #

dataTypeOf :: ContainerDefinition -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ContainerDefinition :: Type -> Type #

Hashable ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: ContainerDefinition -> () #

type Rep ContainerDefinition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ContainerDefinition = D1 (MetaData "ContainerDefinition" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ContainerDefinition'" PrefixI True) ((S1 (MetaSel (Just "_cdModelDataURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cdEnvironment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Map Text Text)))) :*: (S1 (MetaSel (Just "_cdContainerHostname") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cdImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

containerDefinition Source #

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

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

  • cdModelDataURL - The S3 path where the model artifacts, which result from model training, are stored. This path must point to a single gzip compressed tar archive (.tar.gz suffix).
  • cdEnvironment - The environment variables to set in the Docker container. Each key and value in the Environment string to string map can have length of up to 1024. We support up to 16 entries in the map.
  • cdContainerHostname - The DNS host name for the container after Amazon SageMaker deploys it.
  • cdImage - The Amazon EC2 Container Registry (Amazon ECR) path where inference code is stored. If you are using your own custom algorithm instead of an algorithm provided by Amazon SageMaker, the inference code must meet Amazon SageMaker requirements. For more information, see Using Your Own Algorithms with Amazon SageMaker

cdModelDataURL :: Lens' ContainerDefinition (Maybe Text) Source #

The S3 path where the model artifacts, which result from model training, are stored. This path must point to a single gzip compressed tar archive (.tar.gz suffix).

cdEnvironment :: Lens' ContainerDefinition (HashMap Text Text) Source #

The environment variables to set in the Docker container. Each key and value in the Environment string to string map can have length of up to 1024. We support up to 16 entries in the map.

cdContainerHostname :: Lens' ContainerDefinition (Maybe Text) Source #

The DNS host name for the container after Amazon SageMaker deploys it.

cdImage :: Lens' ContainerDefinition Text Source #

The Amazon EC2 Container Registry (Amazon ECR) path where inference code is stored. If you are using your own custom algorithm instead of an algorithm provided by Amazon SageMaker, the inference code must meet Amazon SageMaker requirements. For more information, see Using Your Own Algorithms with Amazon SageMaker

DataSource

data DataSource Source #

Describes the location of the channel data.

See: dataSource smart constructor.

Instances
Eq DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: DataSource -> Constr #

dataTypeOf :: DataSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep DataSource :: Type -> Type #

Hashable DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: DataSource -> () #

type Rep DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep DataSource = D1 (MetaData "DataSource" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" True) (C1 (MetaCons "DataSource'" PrefixI True) (S1 (MetaSel (Just "_dsS3DataSource") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 S3DataSource)))

dataSource Source #

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

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

  • dsS3DataSource - The S3 location of the data source that is associated with a channel.

dsS3DataSource :: Lens' DataSource S3DataSource Source #

The S3 location of the data source that is associated with a channel.

DesiredWeightAndCapacity

data DesiredWeightAndCapacity Source #

Specifies weight and capacity values for a production variant.

See: desiredWeightAndCapacity smart constructor.

Instances
Eq DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: DesiredWeightAndCapacity -> Constr #

dataTypeOf :: DesiredWeightAndCapacity -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep DesiredWeightAndCapacity :: Type -> Type #

Hashable DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep DesiredWeightAndCapacity Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep DesiredWeightAndCapacity = D1 (MetaData "DesiredWeightAndCapacity" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "DesiredWeightAndCapacity'" PrefixI True) (S1 (MetaSel (Just "_dwacDesiredInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Nat)) :*: (S1 (MetaSel (Just "_dwacDesiredWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double)) :*: S1 (MetaSel (Just "_dwacVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

desiredWeightAndCapacity Source #

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

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

dwacVariantName :: Lens' DesiredWeightAndCapacity Text Source #

The name of the variant to update.

EndpointConfigSummary

data EndpointConfigSummary Source #

Provides summary information for an endpoint configuration.

See: endpointConfigSummary smart constructor.

Instances
Eq EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: EndpointConfigSummary -> Constr #

dataTypeOf :: EndpointConfigSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep EndpointConfigSummary :: Type -> Type #

Hashable EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: EndpointConfigSummary -> () #

type Rep EndpointConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep EndpointConfigSummary = D1 (MetaData "EndpointConfigSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "EndpointConfigSummary'" PrefixI True) (S1 (MetaSel (Just "_ecsEndpointConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_ecsEndpointConfigARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_ecsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 POSIX))))

endpointConfigSummary Source #

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

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

ecsEndpointConfigName :: Lens' EndpointConfigSummary Text Source #

The name of the endpoint configuration.

ecsEndpointConfigARN :: Lens' EndpointConfigSummary Text Source #

The Amazon Resource Name (ARN) of the endpoint configuration.

ecsCreationTime :: Lens' EndpointConfigSummary UTCTime Source #

A timestamp that shows when the endpoint configuration was created.

EndpointSummary

data EndpointSummary Source #

Provides summary information for an endpoint.

See: endpointSummary smart constructor.

Instances
Eq EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: EndpointSummary -> Constr #

dataTypeOf :: EndpointSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep EndpointSummary :: Type -> Type #

Hashable EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: EndpointSummary -> () #

type Rep EndpointSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep EndpointSummary = D1 (MetaData "EndpointSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "EndpointSummary'" PrefixI True) ((S1 (MetaSel (Just "_esEndpointName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_esEndpointARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) :*: (S1 (MetaSel (Just "_esCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 POSIX) :*: (S1 (MetaSel (Just "_esLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 POSIX) :*: S1 (MetaSel (Just "_esEndpointStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 EndpointStatus)))))

endpointSummary Source #

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

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

esEndpointName :: Lens' EndpointSummary Text Source #

The name of the endpoint.

esEndpointARN :: Lens' EndpointSummary Text Source #

The Amazon Resource Name (ARN) of the endpoint.

esCreationTime :: Lens' EndpointSummary UTCTime Source #

A timestamp that shows when the endpoint was created.

esLastModifiedTime :: Lens' EndpointSummary UTCTime Source #

A timestamp that shows when the endpoint was last modified.

ModelArtifacts

data ModelArtifacts Source #

Provides information about the location that is configured for storing model artifacts.

See: modelArtifacts smart constructor.

Instances
Eq ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ModelArtifacts -> Constr #

dataTypeOf :: ModelArtifacts -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ModelArtifacts :: Type -> Type #

Hashable ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: ModelArtifacts -> () #

type Rep ModelArtifacts Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ModelArtifacts = D1 (MetaData "ModelArtifacts" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" True) (C1 (MetaCons "ModelArtifacts'" PrefixI True) (S1 (MetaSel (Just "_maS3ModelArtifacts") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

modelArtifacts Source #

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

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

  • maS3ModelArtifacts - The path of the S3 object that contains the model artifacts. For example, s3:/bucket-namekeynameprefix/model.tar.gz .

maS3ModelArtifacts :: Lens' ModelArtifacts Text Source #

The path of the S3 object that contains the model artifacts. For example, s3:/bucket-namekeynameprefix/model.tar.gz .

ModelSummary

data ModelSummary Source #

Provides summary information about a model.

See: modelSummary smart constructor.

Instances
Eq ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ModelSummary -> Constr #

dataTypeOf :: ModelSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ModelSummary :: Type -> Type #

Hashable ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: ModelSummary -> () #

type Rep ModelSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ModelSummary = D1 (MetaData "ModelSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ModelSummary'" PrefixI True) (S1 (MetaSel (Just "_msModelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_msModelARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_msCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 POSIX))))

modelSummary Source #

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

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

  • msModelName - The name of the model that you want a summary for.
  • msModelARN - The Amazon Resource Name (ARN) of the model.
  • msCreationTime - A timestamp that indicates when the model was created.

msModelName :: Lens' ModelSummary Text Source #

The name of the model that you want a summary for.

msModelARN :: Lens' ModelSummary Text Source #

The Amazon Resource Name (ARN) of the model.

msCreationTime :: Lens' ModelSummary UTCTime Source #

A timestamp that indicates when the model was created.

NotebookInstanceLifecycleConfigSummary

data NotebookInstanceLifecycleConfigSummary Source #

Provides a summary of a notebook instance lifecycle configuration.

See: notebookInstanceLifecycleConfigSummary smart constructor.

Instances
Eq NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSummary -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Hashable NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep NotebookInstanceLifecycleConfigSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep NotebookInstanceLifecycleConfigSummary = D1 (MetaData "NotebookInstanceLifecycleConfigSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "NotebookInstanceLifecycleConfigSummary'" PrefixI True) ((S1 (MetaSel (Just "_nilcsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)) :*: S1 (MetaSel (Just "_nilcsLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) :*: (S1 (MetaSel (Just "_nilcsNotebookInstanceLifecycleConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_nilcsNotebookInstanceLifecycleConfigARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

notebookInstanceLifecycleConfigSummary Source #

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

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

nilcsCreationTime :: Lens' NotebookInstanceLifecycleConfigSummary (Maybe UTCTime) Source #

A timestamp that tells when the lifecycle configuration was created.

nilcsLastModifiedTime :: Lens' NotebookInstanceLifecycleConfigSummary (Maybe UTCTime) Source #

A timestamp that tells when the lifecycle configuration was last modified.

nilcsNotebookInstanceLifecycleConfigARN :: Lens' NotebookInstanceLifecycleConfigSummary Text Source #

The Amazon Resource Name (ARN) of the lifecycle configuration.

NotebookInstanceLifecycleHook

data NotebookInstanceLifecycleHook Source #

Contains the notebook instance lifecycle configuration script.

Each lifecycle configuration script has a limit of 16384 characters.

The value of the > PATH environment variable that is available to both scripts is sbin:bin:usrsbin:usr/bin .

View CloudWatch Logs for notebook instance lifecycle configurations in log group awssagemaker/NotebookInstances in log stream [notebook-instance-name]/[LifecycleConfigHook] .

Lifecycle configuration scripts cannot run for longer than 5 minutes. If a script runs for longer than 5 minutes, it fails and the notebook instance is not created or started.

For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .

See: notebookInstanceLifecycleHook smart constructor.

Instances
Eq NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: NotebookInstanceLifecycleHook -> Constr #

dataTypeOf :: NotebookInstanceLifecycleHook -> DataType #

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

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

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

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

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

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

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

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

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

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

Read NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep NotebookInstanceLifecycleHook :: Type -> Type #

Hashable NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep NotebookInstanceLifecycleHook Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep NotebookInstanceLifecycleHook = D1 (MetaData "NotebookInstanceLifecycleHook" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" True) (C1 (MetaCons "NotebookInstanceLifecycleHook'" PrefixI True) (S1 (MetaSel (Just "_nilhContent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

notebookInstanceLifecycleHook :: NotebookInstanceLifecycleHook Source #

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

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

  • nilhContent - A base64-encoded string that contains a shell script for a notebook instance lifecycle configuration.

nilhContent :: Lens' NotebookInstanceLifecycleHook (Maybe Text) Source #

A base64-encoded string that contains a shell script for a notebook instance lifecycle configuration.

NotebookInstanceSummary

data NotebookInstanceSummary Source #

Provides summary information for an Amazon SageMaker notebook instance.

See: notebookInstanceSummary smart constructor.

Instances
Eq NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: NotebookInstanceSummary -> Constr #

dataTypeOf :: NotebookInstanceSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep NotebookInstanceSummary :: Type -> Type #

Hashable NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: NotebookInstanceSummary -> () #

type Rep NotebookInstanceSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep NotebookInstanceSummary = D1 (MetaData "NotebookInstanceSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "NotebookInstanceSummary'" PrefixI True) (((S1 (MetaSel (Just "_nisCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)) :*: S1 (MetaSel (Just "_nisURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_nisLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)) :*: S1 (MetaSel (Just "_nisInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InstanceType)))) :*: ((S1 (MetaSel (Just "_nisNotebookInstanceStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NotebookInstanceStatus)) :*: S1 (MetaSel (Just "_nisNotebookInstanceLifecycleConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_nisNotebookInstanceName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_nisNotebookInstanceARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))))

notebookInstanceSummary Source #

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

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

  • nisCreationTime - A timestamp that shows when the notebook instance was created.
  • nisURL - The URL that you use to connect to the Jupyter instance running in your notebook instance.
  • nisLastModifiedTime - A timestamp that shows when the notebook instance was last modified.
  • nisInstanceType - The type of ML compute instance that the notebook instance is running on.
  • nisNotebookInstanceStatus - The status of the notebook instance.
  • nisNotebookInstanceLifecycleConfigName - The name of a notebook instance lifecycle configuration associated with this notebook instance. For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .
  • nisNotebookInstanceName - The name of the notebook instance that you want a summary for.
  • nisNotebookInstanceARN - The Amazon Resource Name (ARN) of the notebook instance.

nisCreationTime :: Lens' NotebookInstanceSummary (Maybe UTCTime) Source #

A timestamp that shows when the notebook instance was created.

nisURL :: Lens' NotebookInstanceSummary (Maybe Text) Source #

The URL that you use to connect to the Jupyter instance running in your notebook instance.

nisLastModifiedTime :: Lens' NotebookInstanceSummary (Maybe UTCTime) Source #

A timestamp that shows when the notebook instance was last modified.

nisInstanceType :: Lens' NotebookInstanceSummary (Maybe InstanceType) Source #

The type of ML compute instance that the notebook instance is running on.

nisNotebookInstanceLifecycleConfigName :: Lens' NotebookInstanceSummary (Maybe Text) Source #

The name of a notebook instance lifecycle configuration associated with this notebook instance. For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .

nisNotebookInstanceName :: Lens' NotebookInstanceSummary Text Source #

The name of the notebook instance that you want a summary for.

nisNotebookInstanceARN :: Lens' NotebookInstanceSummary Text Source #

The Amazon Resource Name (ARN) of the notebook instance.

OutputDataConfig

data OutputDataConfig Source #

Provides information about how to store model training results (model artifacts).

See: outputDataConfig smart constructor.

Instances
Eq OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: OutputDataConfig -> Constr #

dataTypeOf :: OutputDataConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Read OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep OutputDataConfig :: Type -> Type #

Hashable OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: OutputDataConfig -> () #

type Rep OutputDataConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep OutputDataConfig = D1 (MetaData "OutputDataConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "OutputDataConfig'" PrefixI True) (S1 (MetaSel (Just "_odcKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_odcS3OutputPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

outputDataConfig Source #

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

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

  • odcKMSKeyId - The AWS Key Management Service (AWS KMS) key that Amazon SageMaker uses to encrypt the model artifacts at rest using Amazon S3 server-side encryption.
  • odcS3OutputPath - Identifies the S3 path where you want Amazon SageMaker to store the model artifacts. For example, s3:/bucket-namekey-name-prefix .

odcKMSKeyId :: Lens' OutputDataConfig (Maybe Text) Source #

The AWS Key Management Service (AWS KMS) key that Amazon SageMaker uses to encrypt the model artifacts at rest using Amazon S3 server-side encryption.

odcS3OutputPath :: Lens' OutputDataConfig Text Source #

Identifies the S3 path where you want Amazon SageMaker to store the model artifacts. For example, s3:/bucket-namekey-name-prefix .

ProductionVariant

data ProductionVariant Source #

Identifies a model that you want to host and the resources to deploy for hosting it. If you are deploying multiple models, tell Amazon SageMaker how to distribute traffic among the models by specifying variant weights.

See: productionVariant smart constructor.

Instances
Eq ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ProductionVariant -> Constr #

dataTypeOf :: ProductionVariant -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ProductionVariant :: Type -> Type #

Hashable ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: ProductionVariant -> () #

type Rep ProductionVariant Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ProductionVariant = D1 (MetaData "ProductionVariant" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ProductionVariant'" PrefixI True) ((S1 (MetaSel (Just "_pvInitialVariantWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double)) :*: S1 (MetaSel (Just "_pvVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) :*: (S1 (MetaSel (Just "_pvModelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_pvInitialInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Nat) :*: S1 (MetaSel (Just "_pvInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ProductionVariantInstanceType)))))

productionVariant Source #

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

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

  • pvInitialVariantWeight - Determines initial traffic distribution among all of the models that you specify in the endpoint configuration. The traffic to a production variant is determined by the ratio of the VariantWeight to the sum of all VariantWeight values across all ProductionVariants. If unspecified, it defaults to 1.0.
  • pvVariantName - The name of the production variant.
  • pvModelName - The name of the model that you want to host. This is the name that you specified when creating the model.
  • pvInitialInstanceCount - Number of instances to launch initially.
  • pvInstanceType - The ML compute instance type.

pvInitialVariantWeight :: Lens' ProductionVariant (Maybe Double) Source #

Determines initial traffic distribution among all of the models that you specify in the endpoint configuration. The traffic to a production variant is determined by the ratio of the VariantWeight to the sum of all VariantWeight values across all ProductionVariants. If unspecified, it defaults to 1.0.

pvVariantName :: Lens' ProductionVariant Text Source #

The name of the production variant.

pvModelName :: Lens' ProductionVariant Text Source #

The name of the model that you want to host. This is the name that you specified when creating the model.

pvInitialInstanceCount :: Lens' ProductionVariant Natural Source #

Number of instances to launch initially.

ProductionVariantSummary

data ProductionVariantSummary Source #

Describes weight and capacities for a production variant associated with an endpoint. If you sent a request to the UpdateEndpointWeightsAndCapacities API and the endpoint status is Updating , you get different desired and current values.

See: productionVariantSummary smart constructor.

Instances
Eq ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ProductionVariantSummary -> Constr #

dataTypeOf :: ProductionVariantSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ProductionVariantSummary :: Type -> Type #

Hashable ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ProductionVariantSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ProductionVariantSummary = D1 (MetaData "ProductionVariantSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ProductionVariantSummary'" PrefixI True) ((S1 (MetaSel (Just "_pvsDesiredInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Nat)) :*: S1 (MetaSel (Just "_pvsDesiredWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double))) :*: (S1 (MetaSel (Just "_pvsCurrentWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Double)) :*: (S1 (MetaSel (Just "_pvsCurrentInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Nat)) :*: S1 (MetaSel (Just "_pvsVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))))

productionVariantSummary Source #

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

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

pvsDesiredInstanceCount :: Lens' ProductionVariantSummary (Maybe Natural) Source #

The number of instances requested in the UpdateEndpointWeightsAndCapacities request.

pvsDesiredWeight :: Lens' ProductionVariantSummary (Maybe Double) Source #

The requested weight, as specified in the UpdateEndpointWeightsAndCapacities request.

pvsCurrentWeight :: Lens' ProductionVariantSummary (Maybe Double) Source #

The weight associated with the variant.

pvsCurrentInstanceCount :: Lens' ProductionVariantSummary (Maybe Natural) Source #

The number of instances associated with the variant.

ResourceConfig

data ResourceConfig Source #

Describes the resources, including ML compute instances and ML storage volumes, to use for model training.

See: resourceConfig smart constructor.

Instances
Eq ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: ResourceConfig -> Constr #

dataTypeOf :: ResourceConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep ResourceConfig :: Type -> Type #

Hashable ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: ResourceConfig -> () #

type Rep ResourceConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep ResourceConfig = D1 (MetaData "ResourceConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "ResourceConfig'" PrefixI True) ((S1 (MetaSel (Just "_rcVolumeKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rcInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TrainingInstanceType)) :*: (S1 (MetaSel (Just "_rcInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Nat) :*: S1 (MetaSel (Just "_rcVolumeSizeInGB") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Nat))))

resourceConfig Source #

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

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

  • rcVolumeKMSKeyId - The Amazon Resource Name (ARN) of a AWS Key Management Service key that Amazon SageMaker uses to encrypt data on the storage volume attached to the ML compute instance(s) that run the training job.
  • rcInstanceType - The ML compute instance type.
  • rcInstanceCount - The number of ML compute instances to use. For distributed training, provide a value greater than 1.
  • rcVolumeSizeInGB - The size of the ML storage volume that you want to provision. ML storage volumes store model artifacts and incremental states. Training algorithms might also use the ML storage volume for scratch space. If you want to store the training data in the ML storage volume, choose File as the TrainingInputMode in the algorithm specification. You must specify sufficient ML storage for your scenario.

rcVolumeKMSKeyId :: Lens' ResourceConfig (Maybe Text) Source #

The Amazon Resource Name (ARN) of a AWS Key Management Service key that Amazon SageMaker uses to encrypt data on the storage volume attached to the ML compute instance(s) that run the training job.

rcInstanceCount :: Lens' ResourceConfig Natural Source #

The number of ML compute instances to use. For distributed training, provide a value greater than 1.

rcVolumeSizeInGB :: Lens' ResourceConfig Natural Source #

The size of the ML storage volume that you want to provision. ML storage volumes store model artifacts and incremental states. Training algorithms might also use the ML storage volume for scratch space. If you want to store the training data in the ML storage volume, choose File as the TrainingInputMode in the algorithm specification. You must specify sufficient ML storage for your scenario.

S3DataSource

data S3DataSource Source #

Describes the S3 data source.

See: s3DataSource smart constructor.

Instances
Eq S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: S3DataSource -> Constr #

dataTypeOf :: S3DataSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Read S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep S3DataSource :: Type -> Type #

Hashable S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: S3DataSource -> () #

type Rep S3DataSource Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep S3DataSource = D1 (MetaData "S3DataSource" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "S3DataSource'" PrefixI True) (S1 (MetaSel (Just "_sdsS3DataDistributionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe S3DataDistribution)) :*: (S1 (MetaSel (Just "_sdsS3DataType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 S3DataType) :*: S1 (MetaSel (Just "_sdsS3URI") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

s3DataSource Source #

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

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

  • sdsS3DataDistributionType - If you want Amazon SageMaker to replicate the entire dataset on each ML compute instance that is launched for model training, specify FullyReplicated . If you want Amazon SageMaker to replicate a subset of data on each ML compute instance that is launched for model training, specify ShardedByS3Key . If there are n ML compute instances launched for a training job, each instance gets approximately 1/n of the number of S3 objects. In this case, model training on each machine uses only the subset of training data. Don't choose more ML compute instances for training than available S3 objects. If you do, some nodes won't get any data and you will pay for nodes that aren't getting any training data. This applies in both FILE and PIPE modes. Keep this in mind when developing algorithms. In distributed training, where you use multiple ML compute EC2 instances, you might choose ShardedByS3Key . If the algorithm requires copying training data to the ML storage volume (when TrainingInputMode is set to File ), this copies 1/n of the number of objects.
  • sdsS3DataType - If you choose S3Prefix , S3Uri identifies a key name prefix. Amazon SageMaker uses all objects with the specified key name prefix for model training. If you choose ManifestFile , S3Uri identifies an object that is a manifest file containing a list of object keys that you want Amazon SageMaker to use for model training.
  • sdsS3URI - Depending on the value specified for the S3DataType , identifies either a key name prefix or a manifest. For example: * A key name prefix might look like this: s3:/bucketnameexampleprefix . * A manifest might look like this: s3:/bucketnameexample.manifest The manifest is an S3 object which is a JSON file with the following format: [ {"prefix": "s3:/customer_bucketsomeprefix"}, "relativepathto/custdata-1", "relativepathcustdata-2", ... ] The preceding JSON matches the following s3Uris : s3:/customer_bucketsomeprefixrelativepathto/custdata-1 s3:/customer_bucketsomeprefixrelativepathcustdata-1 ... The complete set of s3uris in this manifest constitutes the input data for the channel for this datasource. The object that each s3uris points to must readable by the IAM role that Amazon SageMaker uses to perform tasks on your behalf.

sdsS3DataDistributionType :: Lens' S3DataSource (Maybe S3DataDistribution) Source #

If you want Amazon SageMaker to replicate the entire dataset on each ML compute instance that is launched for model training, specify FullyReplicated . If you want Amazon SageMaker to replicate a subset of data on each ML compute instance that is launched for model training, specify ShardedByS3Key . If there are n ML compute instances launched for a training job, each instance gets approximately 1/n of the number of S3 objects. In this case, model training on each machine uses only the subset of training data. Don't choose more ML compute instances for training than available S3 objects. If you do, some nodes won't get any data and you will pay for nodes that aren't getting any training data. This applies in both FILE and PIPE modes. Keep this in mind when developing algorithms. In distributed training, where you use multiple ML compute EC2 instances, you might choose ShardedByS3Key . If the algorithm requires copying training data to the ML storage volume (when TrainingInputMode is set to File ), this copies 1/n of the number of objects.

sdsS3DataType :: Lens' S3DataSource S3DataType Source #

If you choose S3Prefix , S3Uri identifies a key name prefix. Amazon SageMaker uses all objects with the specified key name prefix for model training. If you choose ManifestFile , S3Uri identifies an object that is a manifest file containing a list of object keys that you want Amazon SageMaker to use for model training.

sdsS3URI :: Lens' S3DataSource Text Source #

Depending on the value specified for the S3DataType , identifies either a key name prefix or a manifest. For example: * A key name prefix might look like this: s3:/bucketnameexampleprefix . * A manifest might look like this: s3:/bucketnameexample.manifest The manifest is an S3 object which is a JSON file with the following format: [ {"prefix": "s3:/customer_bucketsomeprefix"}, "relativepathto/custdata-1", "relativepathcustdata-2", ... ] The preceding JSON matches the following s3Uris : s3:/customer_bucketsomeprefixrelativepathto/custdata-1 s3:/customer_bucketsomeprefixrelativepathcustdata-1 ... The complete set of s3uris in this manifest constitutes the input data for the channel for this datasource. The object that each s3uris points to must readable by the IAM role that Amazon SageMaker uses to perform tasks on your behalf.

StoppingCondition

data StoppingCondition Source #

Specifies how long model training can run. When model training reaches the limit, Amazon SageMaker ends the training job. Use this API to cap model training cost.

To stop a job, Amazon SageMaker sends the algorithm the SIGTERM signal, which delays job termination for120 seconds. Algorithms might use this 120-second window to save the model artifacts, so the results of training is not lost.

Training algorithms provided by Amazon SageMaker automatically saves the intermediate results of a model training job (it is best effort case, as model might not be ready to save as some stages, for example training just started). This intermediate data is a valid model artifact. You can use it to create a model (CreateModel ).

See: stoppingCondition smart constructor.

Instances
Eq StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: StoppingCondition -> Constr #

dataTypeOf :: StoppingCondition -> DataType #

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

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

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

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

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

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

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

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

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

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

Read StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep StoppingCondition :: Type -> Type #

Hashable StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: StoppingCondition -> () #

type Rep StoppingCondition Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep StoppingCondition = D1 (MetaData "StoppingCondition" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" True) (C1 (MetaCons "StoppingCondition'" PrefixI True) (S1 (MetaSel (Just "_scMaxRuntimeInSeconds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Nat))))

stoppingCondition :: StoppingCondition Source #

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

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

  • scMaxRuntimeInSeconds - The maximum length of time, in seconds, that the training job can run. If model training does not complete during this time, Amazon SageMaker ends the job. If value is not specified, default value is 1 day. Maximum value is 5 days.

scMaxRuntimeInSeconds :: Lens' StoppingCondition (Maybe Natural) Source #

The maximum length of time, in seconds, that the training job can run. If model training does not complete during this time, Amazon SageMaker ends the job. If value is not specified, default value is 1 day. Maximum value is 5 days.

Tag

data Tag Source #

Describes a tag.

See: tag smart constructor.

Instances
Eq Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

Data Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: Tag -> Constr #

dataTypeOf :: Tag -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Generic Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep Tag :: Type -> Type #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Hashable Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

ToJSON Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: Tag -> () #

type Rep Tag Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep Tag = D1 (MetaData "Tag" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "Tag'" PrefixI True) (S1 (MetaSel (Just "_tagKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_tagValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))

tag Source #

Arguments

:: Text

tagKey

-> Text

tagValue

-> Tag 

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

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

tagKey :: Lens' Tag Text Source #

The tag key.

tagValue :: Lens' Tag Text Source #

The tag value.

TrainingJobSummary

data TrainingJobSummary Source #

Provides summary information about a training job.

See: trainingJobSummary smart constructor.

Instances
Eq TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: TrainingJobSummary -> Constr #

dataTypeOf :: TrainingJobSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep TrainingJobSummary :: Type -> Type #

Hashable TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: TrainingJobSummary -> () #

type Rep TrainingJobSummary Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep TrainingJobSummary = D1 (MetaData "TrainingJobSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "TrainingJobSummary'" PrefixI True) ((S1 (MetaSel (Just "_tjsTrainingEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)) :*: (S1 (MetaSel (Just "_tjsLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX)) :*: S1 (MetaSel (Just "_tjsTrainingJobName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))) :*: (S1 (MetaSel (Just "_tjsTrainingJobARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_tjsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 POSIX) :*: S1 (MetaSel (Just "_tjsTrainingJobStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 TrainingJobStatus)))))

trainingJobSummary Source #

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

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

tjsTrainingEndTime :: Lens' TrainingJobSummary (Maybe UTCTime) Source #

A timestamp that shows when the training job ended. This field is set only if the training job has one of the terminal statuses (Completed , Failed , or Stopped ).

tjsLastModifiedTime :: Lens' TrainingJobSummary (Maybe UTCTime) Source #

Timestamp when the training job was last modified.

tjsTrainingJobName :: Lens' TrainingJobSummary Text Source #

The name of the training job that you want a summary for.

tjsTrainingJobARN :: Lens' TrainingJobSummary Text Source #

The Amazon Resource Name (ARN) of the training job.

tjsCreationTime :: Lens' TrainingJobSummary UTCTime Source #

A timestamp that shows when the training job was created.

VPCConfig

data VPCConfig Source #

Specifies a VPC that your training jobs and hosted models have access to. Control access to and from your training and model containers by configuring the VPC. For more information, see 'host-vpc' and 'train-vpc' .

See: vpcConfig smart constructor.

Instances
Eq VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Data VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

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

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

toConstr :: VPCConfig -> Constr #

dataTypeOf :: VPCConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Read VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Show VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Generic VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Associated Types

type Rep VPCConfig :: Type -> Type #

Hashable VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

ToJSON VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

FromJSON VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

NFData VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

Methods

rnf :: VPCConfig -> () #

type Rep VPCConfig Source # 
Instance details

Defined in Network.AWS.SageMaker.Types.Product

type Rep VPCConfig = D1 (MetaData "VPCConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.1-KSR3FgWuE9u23bvJsHopKu" False) (C1 (MetaCons "VPCConfig'" PrefixI True) (S1 (MetaSel (Just "_vcSecurityGroupIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (List1 Text)) :*: S1 (MetaSel (Just "_vcSubnets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (List1 Text))))

vpcConfig Source #

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

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

  • vcSecurityGroupIds - The VPC security group IDs, in the form sg-xxxxxxxx. Specify the security groups for the VPC that is specified in the Subnets field.
  • vcSubnets - The ID of the subnets in the VPC to which you want to connect your training job or model.

vcSecurityGroupIds :: Lens' VPCConfig (NonEmpty Text) Source #

The VPC security group IDs, in the form sg-xxxxxxxx. Specify the security groups for the VPC that is specified in the Subnets field.

vcSubnets :: Lens' VPCConfig (NonEmpty Text) Source #

The ID of the subnets in the VPC to which you want to connect your training job or model.