gogol-kgsearch-0.4.0: Google Knowledge Graph Search SDK.

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

Network.Google.KnowledgeGraphSearch

Contents

Description

Searches the Google Knowledge Graph for entities.

See: Knowledge Graph Search API Reference

Synopsis

Service Configuration

knowledgeGraphSearchService :: ServiceConfig Source #

Default request referring to version v1 of the Knowledge Graph Search API. This contains the host and root path used as a starting point for constructing service requests.

API Declaration

type KnowledgeGraphSearchAPI = EntitiesSearchResource Source #

Represents the entirety of the methods and resources available for the Knowledge Graph Search API service.

Resources

kgsearch.entities.search

Types

SearchResponse

data SearchResponse Source #

Response message includes the context and a list of matching results which contain the detail of associated entities.

See: searchResponse smart constructor.

Instances
Eq SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

Data SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

Methods

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

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

toConstr :: SearchResponse -> Constr #

dataTypeOf :: SearchResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

Generic SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

Associated Types

type Rep SearchResponse :: Type -> Type #

ToJSON SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

FromJSON SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

type Rep SearchResponse Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Product

type Rep SearchResponse = D1 (MetaData "SearchResponse" "Network.Google.KnowledgeGraphSearch.Types.Product" "gogol-kgsearch-0.4.0-KXcdVth8YboCjW4HunaolZ" False) (C1 (MetaCons "SearchResponse'" PrefixI True) (S1 (MetaSel (Just "_srContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe JSONValue)) :*: (S1 (MetaSel (Just "_srItemListElement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [JSONValue])) :*: S1 (MetaSel (Just "_srType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe JSONValue)))))

searchResponse :: SearchResponse Source #

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

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

srContext :: Lens' SearchResponse (Maybe JSONValue) Source #

The local context applicable for the response. See more details at http://www.w3.org/TR/json-ld/#context-definitions.

srItemListElement :: Lens' SearchResponse [JSONValue] Source #

The item list of search results.

srType :: Lens' SearchResponse (Maybe JSONValue) Source #

The schema type of top-level JSON-LD object, e.g. ItemList.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances
Enum Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Methods

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

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

toConstr :: Xgafv -> Constr #

dataTypeOf :: Xgafv -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Methods

compare :: Xgafv -> Xgafv -> Ordering #

(<) :: Xgafv -> Xgafv -> Bool #

(<=) :: Xgafv -> Xgafv -> Bool #

(>) :: Xgafv -> Xgafv -> Bool #

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

max :: Xgafv -> Xgafv -> Xgafv #

min :: Xgafv -> Xgafv -> Xgafv #

Read Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Associated Types

type Rep Xgafv :: Type -> Type #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.KnowledgeGraphSearch.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.KnowledgeGraphSearch.Types.Sum" "gogol-kgsearch-0.4.0-KXcdVth8YboCjW4HunaolZ" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))