{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Language.Types
(
languageService
, cloudLanguageScope
, cloudPlatformScope
, AnalyzeSyntaxRequest
, analyzeSyntaxRequest
, asrEncodingType
, asrDocument
, DependencyEdge
, dependencyEdge
, deHeadTokenIndex
, deLabel
, ClassifyTextRequest
, classifyTextRequest
, ctrDocument
, Status
, status
, sDetails
, sCode
, sMessage
, PartOfSpeechProper (..)
, PartOfSpeechTag (..)
, Sentiment
, sentiment
, sScore
, sMagnitude
, DocumentType (..)
, AnalyzeSyntaxRequestEncodingType (..)
, AnalyzeEntitySentimentRequestEncodingType (..)
, DependencyEdgeLabel (..)
, PartOfSpeechVoice (..)
, PartOfSpeechForm (..)
, PartOfSpeechPerson (..)
, Token
, token
, tDependencyEdge
, tText
, tLemma
, tPartOfSpeech
, EntityType (..)
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, ClassificationCategory
, classificationCategory
, ccConfidence
, ccName
, AnnotateTextRequest
, annotateTextRequest
, atrEncodingType
, atrFeatures
, atrDocument
, EntityMention
, entityMention
, emSentiment
, emText
, emType
, TextSpan
, textSpan
, tsBeginOffSet
, tsContent
, AnalyzeEntitySentimentRequest
, analyzeEntitySentimentRequest
, aesrEncodingType
, aesrDocument
, AnnotateTextResponse
, annotateTextResponse
, atrEntities
, atrTokens
, atrDocumentSentiment
, atrCategories
, atrSentences
, atrLanguage
, PartOfSpeechTense (..)
, Features
, features
, fExtractSyntax
, fExtractDocumentSentiment
, fClassifyText
, fExtractEntitySentiment
, fExtractEntities
, Document
, document
, dContent
, dLanguage
, dGcsContentURI
, dType
, PartOfSpeechMood (..)
, PartOfSpeechCase (..)
, AnalyzeSentimentRequest
, analyzeSentimentRequest
, aEncodingType
, aDocument
, Xgafv (..)
, AnalyzeEntitiesResponse
, analyzeEntitiesResponse
, aerEntities
, aerLanguage
, AnnotateTextRequestEncodingType (..)
, PartOfSpeechNumber (..)
, AnalyzeSentimentResponse
, analyzeSentimentResponse
, asrDocumentSentiment
, asrSentences
, asrLanguage
, AnalyzeEntitiesRequest
, analyzeEntitiesRequest
, aerEncodingType
, aerDocument
, AnalyzeEntitiesRequestEncodingType (..)
, Entity
, entity
, eSentiment
, eName
, eSalience
, eMetadata
, eType
, eMentions
, AnalyzeEntitySentimentResponse
, analyzeEntitySentimentResponse
, aesrEntities
, aesrLanguage
, AnalyzeSyntaxResponse
, analyzeSyntaxResponse
, aTokens
, aSentences
, aLanguage
, EntityMetadata
, entityMetadata
, emAddtional
, PartOfSpeechAspect (..)
, ClassifyTextResponse
, classifyTextResponse
, ctrCategories
, PartOfSpeech
, partOfSpeech
, posProper
, posTag
, posPerson
, posAspect
, posCase
, posGender
, posReciprocity
, posNumber
, posVoice
, posForm
, posTense
, posMood
, PartOfSpeechReciprocity (..)
, PartOfSpeechGender (..)
, AnalyzeSentimentRequestEncodingType (..)
, EntityMentionType (..)
, Sentence
, sentence
, sSentiment
, sText
) where
import Network.Google.Language.Types.Product
import Network.Google.Language.Types.Sum
import Network.Google.Prelude
languageService :: ServiceConfig
languageService
= defaultService (ServiceId "language:v1")
"language.googleapis.com"
cloudLanguageScope :: Proxy '["https://www.googleapis.com/auth/cloud-language"]
cloudLanguageScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;