github-0.16.0: Access to the GitHub API, v3.

LicenseBSD-3-Clause
MaintainerOleg Grenrus <oleg.grenrus@iki.fi>
Safe HaskellNone
LanguageHaskell2010

GitHub.Data.Content

Description

 

Synopsis

Documentation

data Content Source #

Instances

Eq Content Source # 

Methods

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

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

Data Content Source # 

Methods

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

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

toConstr :: Content -> Constr #

dataTypeOf :: Content -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Content Source # 
Show Content Source # 
Generic Content Source # 

Associated Types

type Rep Content :: * -> * #

Methods

from :: Content -> Rep Content x #

to :: Rep Content x -> Content #

FromJSON Content Source # 
Binary Content Source # 

Methods

put :: Content -> Put #

get :: Get Content #

putList :: [Content] -> Put #

NFData Content Source # 

Methods

rnf :: Content -> () #

type Rep Content Source # 
type Rep Content = D1 (MetaData "Content" "GitHub.Data.Content" "github-0.16.0-ETPuDhps3VfArbUujbUjPm" False) ((:+:) (C1 (MetaCons "ContentFile" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ContentFileData))) (C1 (MetaCons "ContentDirectory" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Vector ContentItem)))))

data ContentFileData Source #

Instances

Eq ContentFileData Source # 
Data ContentFileData Source # 

Methods

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

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

toConstr :: ContentFileData -> Constr #

dataTypeOf :: ContentFileData -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ContentFileData Source # 
Show ContentFileData Source # 
Generic ContentFileData Source # 
FromJSON ContentFileData Source # 
Binary ContentFileData Source # 
NFData ContentFileData Source # 

Methods

rnf :: ContentFileData -> () #

type Rep ContentFileData Source # 
type Rep ContentFileData = D1 (MetaData "ContentFileData" "GitHub.Data.Content" "github-0.16.0-ETPuDhps3VfArbUujbUjPm" False) (C1 (MetaCons "ContentFileData" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "contentFileInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ContentInfo)) (S1 (MetaSel (Just Symbol "contentFileEncoding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))) ((:*:) (S1 (MetaSel (Just Symbol "contentFileSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Int)) (S1 (MetaSel (Just Symbol "contentFileContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))))

data ContentItem Source #

An item in a directory listing.

Instances

Eq ContentItem Source # 
Data ContentItem Source # 

Methods

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

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

toConstr :: ContentItem -> Constr #

dataTypeOf :: ContentItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ContentItem Source # 
Show ContentItem Source # 
Generic ContentItem Source # 

Associated Types

type Rep ContentItem :: * -> * #

FromJSON ContentItem Source # 
Binary ContentItem Source # 
NFData ContentItem Source # 

Methods

rnf :: ContentItem -> () #

type Rep ContentItem Source # 
type Rep ContentItem = D1 (MetaData "ContentItem" "GitHub.Data.Content" "github-0.16.0-ETPuDhps3VfArbUujbUjPm" False) (C1 (MetaCons "ContentItem" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "contentItemType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ContentItemType)) (S1 (MetaSel (Just Symbol "contentItemInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ContentInfo))))

data ContentItemType Source #

Constructors

ItemFile 
ItemDir 

Instances

Eq ContentItemType Source # 
Data ContentItemType Source # 

Methods

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

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

toConstr :: ContentItemType -> Constr #

dataTypeOf :: ContentItemType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ContentItemType Source # 
Show ContentItemType Source # 
Generic ContentItemType Source # 
FromJSON ContentItemType Source # 
Binary ContentItemType Source # 
NFData ContentItemType Source # 

Methods

rnf :: ContentItemType -> () #

type Rep ContentItemType Source # 
type Rep ContentItemType = D1 (MetaData "ContentItemType" "GitHub.Data.Content" "github-0.16.0-ETPuDhps3VfArbUujbUjPm" False) ((:+:) (C1 (MetaCons "ItemFile" PrefixI False) U1) (C1 (MetaCons "ItemDir" PrefixI False) U1))

data ContentInfo Source #

Information common to both kinds of Content: files and directories.

Instances

Eq ContentInfo Source # 
Data ContentInfo Source # 

Methods

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

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

toConstr :: ContentInfo -> Constr #

dataTypeOf :: ContentInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ContentInfo Source # 
Show ContentInfo Source # 
Generic ContentInfo Source # 

Associated Types

type Rep ContentInfo :: * -> * #

FromJSON ContentInfo Source # 
Binary ContentInfo Source # 
NFData ContentInfo Source # 

Methods

rnf :: ContentInfo -> () #

type Rep ContentInfo Source #