Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Pinecone.Vectors
Contents
Description
Vectors
Synopsis
- newtype Namespace = Namespace {}
- data UpsertVectors = UpsertVectors {
- vectors :: Vector VectorObject
- namespace :: Maybe Namespace
- _UpsertVectors :: UpsertVectors
- data UpsertStats = UpsertStats {}
- data Vectors = Vectors {}
- data UpdateVector = UpdateVector {}
- _UpdateVector :: UpdateVector
- data DeleteVectors = DeleteVectors {}
- _DeleteVectors :: DeleteVectors
- data VectorIDs = VectorIDs {
- vectors :: Vector Text
- pagination :: Maybe Pagination
- namespace :: Namespace
- usage :: Usage
- data Record = Record {}
- _Record :: Record
- data VectorObject = VectorObject {}
- data SparseValues = SparseValues {}
- data Usage = Usage {}
- type API = ("vectors" :> (("upsert" :> (ReqBody '[JSON] UpsertVectors :> Post '[JSON] UpsertStats)) :<|> (("fetch" :> (QueryParams "ids" Text :> (QueryParam "namespace" Namespace :> Get '[JSON] Vectors))) :<|> (("update" :> (ReqBody '[JSON] UpdateVector :> Post '[JSON] NoContent)) :<|> (("delete" :> (ReqBody '[JSON] DeleteVectors :> Post '[JSON] NoContent)) :<|> ("list" :> (QueryParam "prefix" Text :> (QueryParam "limit" Natural :> (QueryParam "paginationToken" Text :> (QueryParam "namespace" Namespace :> Get '[JSON] VectorIDs)))))))))) :<|> ("records" :> ("namespaces" :> (Capture "namespace" Namespace :> ("upsert" :> (ReqBody '[JSON] Record :> PostCreated '[JSON] NoContent)))))
Main types
The namespace of a record
Instances
FromJSON Namespace Source # | |
Defined in Pinecone.Vectors | |
ToJSON Namespace Source # | |
IsString Namespace Source # | |
Defined in Pinecone.Vectors Methods fromString :: String -> Namespace # | |
Show Namespace Source # | |
Eq Namespace Source # | |
ToHttpApiData Namespace Source # | |
Defined in Pinecone.Vectors Methods toUrlPiece :: Namespace -> Text # toEncodedUrlPiece :: Namespace -> Builder # toHeader :: Namespace -> ByteString # toQueryParam :: Namespace -> Text # toEncodedQueryParam :: Namespace -> Builder # |
data UpsertVectors Source #
Request body for /vectors/upsert
Constructors
UpsertVectors | |
Fields
|
Instances
_UpsertVectors :: UpsertVectors Source #
Default UpsertVectors
data UpsertStats Source #
Response body for /vectors/upsert
Constructors
UpsertStats | |
Fields |
Instances
FromJSON UpsertStats Source # | |
Defined in Pinecone.Vectors | |
ToJSON UpsertStats Source # | |
Defined in Pinecone.Vectors Methods toJSON :: UpsertStats -> Value # toEncoding :: UpsertStats -> Encoding # toJSONList :: [UpsertStats] -> Value # toEncodingList :: [UpsertStats] -> Encoding # omitField :: UpsertStats -> Bool # | |
Generic UpsertStats Source # | |
Defined in Pinecone.Vectors Associated Types type Rep UpsertStats :: Type -> Type # | |
Show UpsertStats Source # | |
Defined in Pinecone.Vectors Methods showsPrec :: Int -> UpsertStats -> ShowS # show :: UpsertStats -> String # showList :: [UpsertStats] -> ShowS # | |
Eq UpsertStats Source # | |
Defined in Pinecone.Vectors | |
type Rep UpsertStats Source # | |
Defined in Pinecone.Vectors type Rep UpsertStats = D1 ('MetaData "UpsertStats" "Pinecone.Vectors" "pinecone-1.0.0-Ex4c0YruToKASgnObHGBW7" 'False) (C1 ('MetaCons "UpsertStats" 'PrefixI 'True) (S1 ('MetaSel ('Just "upsertedCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural))) |
Response body for /vectors/fetch
Constructors
Vectors | |
Instances
FromJSON Vectors Source # | |
Defined in Pinecone.Vectors | |
ToJSON Vectors Source # | |
Generic Vectors Source # | |
Show Vectors Source # | |
Eq Vectors Source # | |
type Rep Vectors Source # | |
Defined in Pinecone.Vectors type Rep Vectors = D1 ('MetaData "Vectors" "Pinecone.Vectors" "pinecone-1.0.0-Ex4c0YruToKASgnObHGBW7" 'False) (C1 ('MetaCons "Vectors" 'PrefixI 'True) (S1 ('MetaSel ('Just "vectors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text VectorObject)) :*: (S1 ('MetaSel ('Just "namespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Namespace) :*: S1 ('MetaSel ('Just "usage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Usage))))) |
data UpdateVector Source #
Request body for /vectors/update
Constructors
UpdateVector | |
Instances
_UpdateVector :: UpdateVector Source #
Default UpdateVector
data DeleteVectors Source #
Request body for /vectors/delete
Constructors
DeleteVectors | |
Instances
_DeleteVectors :: DeleteVectors Source #
Default DeleteVectors
Response body for /vectors/list
Constructors
VectorIDs | |
Fields
|
Instances
FromJSON VectorIDs Source # | |
Defined in Pinecone.Vectors | |
Generic VectorIDs Source # | |
Show VectorIDs Source # | |
Eq VectorIDs Source # | |
type Rep VectorIDs Source # | |
Defined in Pinecone.Vectors type Rep VectorIDs = D1 ('MetaData "VectorIDs" "Pinecone.Vectors" "pinecone-1.0.0-Ex4c0YruToKASgnObHGBW7" 'False) (C1 ('MetaCons "VectorIDs" 'PrefixI 'True) ((S1 ('MetaSel ('Just "vectors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Vector Text)) :*: S1 ('MetaSel ('Just "pagination") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Pagination))) :*: (S1 ('MetaSel ('Just "namespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Namespace) :*: S1 ('MetaSel ('Just "usage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Usage)))) |
Record to upsert
Instances
FromJSON Record Source # | |
Defined in Pinecone.Vectors | |
ToJSON Record Source # | |
Generic Record Source # | |
Show Record Source # | |
Eq Record Source # | |
type Rep Record Source # | |
Defined in Pinecone.Vectors type Rep Record = D1 ('MetaData "Record" "Pinecone.Vectors" "pinecone-1.0.0-Ex4c0YruToKASgnObHGBW7" 'False) (C1 ('MetaCons "Record" 'PrefixI 'True) (S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "metadata") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map Text Scalar)))))) |
Other types
data VectorObject Source #
A vector
Constructors
VectorObject | |
Instances
data SparseValues Source #
Vector sparse data
Constructors
SparseValues | |
Instances
Usage
Servant
type API = ("vectors" :> (("upsert" :> (ReqBody '[JSON] UpsertVectors :> Post '[JSON] UpsertStats)) :<|> (("fetch" :> (QueryParams "ids" Text :> (QueryParam "namespace" Namespace :> Get '[JSON] Vectors))) :<|> (("update" :> (ReqBody '[JSON] UpdateVector :> Post '[JSON] NoContent)) :<|> (("delete" :> (ReqBody '[JSON] DeleteVectors :> Post '[JSON] NoContent)) :<|> ("list" :> (QueryParam "prefix" Text :> (QueryParam "limit" Natural :> (QueryParam "paginationToken" Text :> (QueryParam "namespace" Namespace :> Get '[JSON] VectorIDs)))))))))) :<|> ("records" :> ("namespaces" :> (Capture "namespace" Namespace :> ("upsert" :> (ReqBody '[JSON] Record :> PostCreated '[JSON] NoContent))))) Source #
Servant API