dropbox-0.0.2: Dropbox API client
Safe HaskellNone
LanguageHaskell2010

Dropbox

Description

A dropbox client

Synopsis

Documentation

data Dropbox route Source #

To use the various endpoints make sure you have the right scope in your app on dropbox: https://www.dropbox.com/developers/apps/info/t282kls5wbrtofs#permissions then regenerate your token (because it's attached to that)

Instances

Instances details
Generic (Dropbox route) Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep (Dropbox route) :: Type -> Type #

Methods

from :: Dropbox route -> Rep (Dropbox route) x #

to :: Rep (Dropbox route) x -> Dropbox route #

type Rep (Dropbox route) Source # 
Instance details

Defined in Dropbox

type Rep (Dropbox route)

data FileTag Source #

Constructors

File 
Folder 

Instances

Instances details
Eq FileTag Source # 
Instance details

Defined in Dropbox

Methods

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

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

Show FileTag Source # 
Instance details

Defined in Dropbox

Generic FileTag Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep FileTag :: Type -> Type #

Methods

from :: FileTag -> Rep FileTag x #

to :: Rep FileTag x -> FileTag #

FromJSON FileTag Source # 
Instance details

Defined in Dropbox

type Rep FileTag Source # 
Instance details

Defined in Dropbox

type Rep FileTag = D1 ('MetaData "FileTag" "Dropbox" "dropbox-0.0.2-inplace" 'False) (C1 ('MetaCons "File" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Folder" 'PrefixI 'False) (U1 :: Type -> Type))

data Entry Source #

Constructors

Entry 

Fields

Instances

Instances details
Eq Entry Source # 
Instance details

Defined in Dropbox

Methods

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

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

Show Entry Source # 
Instance details

Defined in Dropbox

Methods

showsPrec :: Int -> Entry -> ShowS #

show :: Entry -> String #

showList :: [Entry] -> ShowS #

Generic Entry Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep Entry :: Type -> Type #

Methods

from :: Entry -> Rep Entry x #

to :: Rep Entry x -> Entry #

FromJSON Entry Source # 
Instance details

Defined in Dropbox

type Rep Entry Source # 
Instance details

Defined in Dropbox

newtype ListFolderResponse Source #

Constructors

ListFolderResponse 

Fields

Instances

Instances details
Eq ListFolderResponse Source # 
Instance details

Defined in Dropbox

Show ListFolderResponse Source # 
Instance details

Defined in Dropbox

Generic ListFolderResponse Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep ListFolderResponse :: Type -> Type #

FromJSON ListFolderResponse Source # 
Instance details

Defined in Dropbox

type Rep ListFolderResponse Source # 
Instance details

Defined in Dropbox

type Rep ListFolderResponse = D1 ('MetaData "ListFolderResponse" "Dropbox" "dropbox-0.0.2-inplace" 'True) (C1 ('MetaCons "ListFolderResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "entries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entry])))

data ListFolderRequest Source #

Instances

Instances details
Generic ListFolderRequest Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep ListFolderRequest :: Type -> Type #

ToJSON ListFolderRequest Source # 
Instance details

Defined in Dropbox

type Rep ListFolderRequest Source # 
Instance details

Defined in Dropbox

type Rep ListFolderRequest = D1 ('MetaData "ListFolderRequest" "Dropbox" "dropbox-0.0.2-inplace" 'False) (C1 ('MetaCons "ListFolderRequest" 'PrefixI 'True) ((S1 ('MetaSel ('Just "path") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "recursive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "include_media_info") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "include_deleted") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "include_has_explicit_shared_members") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "include_mounted_folders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "include_non_downloadable_files") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))

newtype LinkResponse Source #

Constructors

LinkResponse 

Fields

Instances

Instances details
Show LinkResponse Source # 
Instance details

Defined in Dropbox

Generic LinkResponse Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep LinkResponse :: Type -> Type #

FromJSON LinkResponse Source # 
Instance details

Defined in Dropbox

type Rep LinkResponse Source # 
Instance details

Defined in Dropbox

type Rep LinkResponse = D1 ('MetaData "LinkResponse" "Dropbox" "dropbox-0.0.2-inplace" 'True) (C1 ('MetaCons "LinkResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "link") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype LinkRequest Source #

Constructors

LinkRequest 

Fields

Instances

Instances details
Generic LinkRequest Source # 
Instance details

Defined in Dropbox

Associated Types

type Rep LinkRequest :: Type -> Type #

ToJSON LinkRequest Source # 
Instance details

Defined in Dropbox

type Rep LinkRequest Source # 
Instance details

Defined in Dropbox

type Rep LinkRequest = D1 ('MetaData "LinkRequest" "Dropbox" "dropbox-0.0.2-inplace" 'True) (C1 ('MetaCons "LinkRequest" 'PrefixI 'True) (S1 ('MetaSel ('Just "linkPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))