{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Prediction.Types
(
predictionService
, cloudPlatformScope
, storageReadOnlyScope
, storageReadWriteScope
, predictionScope
, storageFullControlScope
, Insert2ModelInfo
, insert2ModelInfo
, imiModelType
, imiClassWeightedAccuracy
, imiClassificationAccuracy
, imiMeanSquaredError
, imiNumberLabels
, imiNumberInstances
, AnalyzeModelDescriptionConfusionMatrixRowTotals
, analyzeModelDescriptionConfusionMatrixRowTotals
, amdcmrtAddtional
, Insert
, insert
, iStorageDataLocation
, iModelType
, iTrainingInstances
, iUtility
, iStoragePMMLModelLocation
, iSourceModel
, iId
, iStoragePMMLLocation
, List
, list
, lNextPageToken
, lKind
, lItems
, lSelfLink
, InsertUtilityItem
, insertUtilityItem
, iuiAddtional
, Insert2
, insert2
, insStorageDataLocation
, insModelType
, insKind
, insCreated
, insTrainingComplete
, insSelfLink
, insTrainingStatus
, insStoragePMMLModelLocation
, insId
, insStoragePMMLLocation
, insModelInfo
, InsertTrainingInstancesItem
, insertTrainingInstancesItem
, itiiCSVInstance
, itiiOutput
, InputInput
, inputInput
, iiCSVInstance
, AnalyzeDataDescriptionFeaturesItemCategoricalValuesItem
, analyzeDataDescriptionFeaturesItemCategoricalValuesItem
, addficviValue
, addficviCount
, AnalyzeDataDescriptionFeaturesItemNumeric
, analyzeDataDescriptionFeaturesItemNumeric
, addfinMean
, addfinCount
, addfinVariance
, Input
, input
, iInput
, AnalyzeDataDescriptionFeaturesItemCategorical
, analyzeDataDescriptionFeaturesItemCategorical
, addficValues
, addficCount
, AnalyzeDataDescriptionOutputFeatureTextItem
, analyzeDataDescriptionOutputFeatureTextItem
, addoftiValue
, addoftiCount
, OutputOutputMultiItem
, outputOutputMultiItem
, oomiScore
, oomiLabel
, Analyze
, analyze
, aKind
, aModelDescription
, aSelfLink
, aId
, aErrors
, aDataDescription
, AnalyzeModelDescriptionConfusionMatrix
, analyzeModelDescriptionConfusionMatrix
, amdcmAddtional
, Output
, output
, oOutputValue
, oKind
, oOutputLabel
, oSelfLink
, oId
, oOutputMulti
, AnalyzeDataDescriptionOutputFeatureNumeric
, analyzeDataDescriptionOutputFeatureNumeric
, addofnMean
, addofnCount
, addofnVariance
, AnalyzeErrorsItem
, analyzeErrorsItem
, aeiAddtional
, AnalyzeDataDescription
, analyzeDataDescription
, addOutputFeature
, addFeatures
, AnalyzeModelDescription
, analyzeModelDescription
, amdConfusionMatrixRowTotals
, amdConfusionMatrix
, amdModelInfo
, AnalyzeDataDescriptionFeaturesItemText
, analyzeDataDescriptionFeaturesItemText
, addfitCount
, AnalyzeModelDescriptionConfusionMatrixAdditional
, analyzeModelDescriptionConfusionMatrixAdditional
, amdcmaAddtional
, AnalyzeDataDescriptionFeaturesItem
, analyzeDataDescriptionFeaturesItem
, addfiText
, addfiNumeric
, addfiIndex
, addfiCategorical
, Update
, update
, uCSVInstance
, uOutput
, AnalyzeDataDescriptionOutputFeature
, analyzeDataDescriptionOutputFeature
, addofText
, addofNumeric
) where
import Network.Google.Prediction.Types.Product
import Network.Google.Prediction.Types.Sum
import Network.Google.Prelude
predictionService :: ServiceConfig
predictionService
= defaultService (ServiceId "prediction:v1.6")
"www.googleapis.com"
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;
storageReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/devstorage.read_only"]
storageReadOnlyScope = Proxy;
storageReadWriteScope :: Proxy '["https://www.googleapis.com/auth/devstorage.read_write"]
storageReadWriteScope = Proxy;
predictionScope :: Proxy '["https://www.googleapis.com/auth/prediction"]
predictionScope = Proxy;
storageFullControlScope :: Proxy '["https://www.googleapis.com/auth/devstorage.full_control"]
storageFullControlScope = Proxy;