twitter-types-0.11.0: Twitter JSON parser and types
Safe HaskellNone
LanguageHaskell2010

Web.Twitter.Types

Synopsis

Documentation

data StreamingAPI Source #

Instances

Instances details
Eq StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

Data StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: StreamingAPI -> Constr #

dataTypeOf :: StreamingAPI -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

Generic StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep StreamingAPI :: Type -> Type #

ToJSON StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

type Rep StreamingAPI Source # 
Instance details

Defined in Web.Twitter.Types

data Status Source #

This type represents a Twitter tweet structure. See https://dev.twitter.com/docs/platform-objects/tweets.

Instances

Instances details
Eq Status Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data Status Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Instance details

Defined in Web.Twitter.Types

Generic Status Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Status :: Type -> Type #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Status Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Status Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Status = D1 ('MetaData "Status" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Status" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "statusContributors") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Contributor])) :*: (S1 ('MetaSel ('Just "statusCoordinates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Coordinates)) :*: S1 ('MetaSel ('Just "statusCreatedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime))) :*: ((S1 ('MetaSel ('Just "statusCurrentUserRetweet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe StatusId)) :*: S1 ('MetaSel ('Just "statusEntities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Entities))) :*: (S1 ('MetaSel ('Just "statusExtendedEntities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ExtendedEntities)) :*: S1 ('MetaSel ('Just "statusFavoriteCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))) :*: (((S1 ('MetaSel ('Just "statusFavorited") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "statusFilterLevel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "statusId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StatusId) :*: S1 ('MetaSel ('Just "statusInReplyToScreenName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))) :*: ((S1 ('MetaSel ('Just "statusInReplyToStatusId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe StatusId)) :*: S1 ('MetaSel ('Just "statusInReplyToUserId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UserId))) :*: (S1 ('MetaSel ('Just "statusLang") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LanguageCode)) :*: S1 ('MetaSel ('Just "statusPlace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Place)))))) :*: (((S1 ('MetaSel ('Just "statusPossiblySensitive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "statusScopes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Object)) :*: S1 ('MetaSel ('Just "statusQuotedStatusId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe StatusId)))) :*: ((S1 ('MetaSel ('Just "statusQuotedStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Status)) :*: S1 ('MetaSel ('Just "statusRetweetCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :*: (S1 ('MetaSel ('Just "statusRetweeted") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "statusRetweetedStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Status))))) :*: (((S1 ('MetaSel ('Just "statusSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "statusText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "statusTruncated") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "statusUser") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 User))) :*: ((S1 ('MetaSel ('Just "statusWithheldCopyright") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "statusWithheldInCountries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Text]))) :*: (S1 ('MetaSel ('Just "statusWithheldScope") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "statusDisplayTextRange") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DisplayTextRange))))))))

data SearchResult body Source #

Instances

Instances details
Eq body => Eq (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

(==) :: SearchResult body -> SearchResult body -> Bool #

(/=) :: SearchResult body -> SearchResult body -> Bool #

Data body => Data (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: SearchResult body -> Constr #

dataTypeOf :: SearchResult body -> DataType #

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

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

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

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

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

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

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

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

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

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

Show body => Show (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> SearchResult body -> ShowS #

show :: SearchResult body -> String #

showList :: [SearchResult body] -> ShowS #

Generic (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep (SearchResult body) :: Type -> Type #

Methods

from :: SearchResult body -> Rep (SearchResult body) x #

to :: Rep (SearchResult body) x -> SearchResult body #

ToJSON body => ToJSON (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON body => FromJSON (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

type Rep (SearchResult body) Source # 
Instance details

Defined in Web.Twitter.Types

type Rep (SearchResult body) = D1 ('MetaData "SearchResult" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "SearchResult" 'PrefixI 'True) (S1 ('MetaSel ('Just "searchResultStatuses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 body) :*: S1 ('MetaSel ('Just "searchResultSearchMetadata") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SearchMetadata)))

data SearchStatus Source #

Instances

Instances details
Eq SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

Data SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: SearchStatus -> Constr #

dataTypeOf :: SearchStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

Generic SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep SearchStatus :: Type -> Type #

ToJSON SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

type Rep SearchStatus Source # 
Instance details

Defined in Web.Twitter.Types

type Rep SearchStatus = D1 ('MetaData "SearchStatus" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "SearchStatus" 'PrefixI 'True) ((S1 ('MetaSel ('Just "searchStatusCreatedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime) :*: (S1 ('MetaSel ('Just "searchStatusId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StatusId) :*: S1 ('MetaSel ('Just "searchStatusText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))) :*: (S1 ('MetaSel ('Just "searchStatusSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "searchStatusUser") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 User) :*: S1 ('MetaSel ('Just "searchStatusCoordinates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Coordinates))))))

data SearchMetadata Source #

Instances

Instances details
Eq SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

Data SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: SearchMetadata -> Constr #

dataTypeOf :: SearchMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

Generic SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep SearchMetadata :: Type -> Type #

ToJSON SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

type Rep SearchMetadata Source # 
Instance details

Defined in Web.Twitter.Types

type Rep SearchMetadata = D1 ('MetaData "SearchMetadata" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "SearchMetadata" 'PrefixI 'True) (((S1 ('MetaSel ('Just "searchMetadataMaxId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StatusId) :*: S1 ('MetaSel ('Just "searchMetadataSinceId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StatusId)) :*: (S1 ('MetaSel ('Just "searchMetadataRefreshURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URIString) :*: S1 ('MetaSel ('Just "searchMetadataNextResults") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString)))) :*: ((S1 ('MetaSel ('Just "searchMetadataCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "searchMetadataCompletedIn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Float))) :*: (S1 ('MetaSel ('Just "searchMetadataSinceIdStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "searchMetadataQuery") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "searchMetadataMaxIdStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))))

data RetweetedStatus Source #

Instances

Instances details
Eq RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

Data RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: RetweetedStatus -> Constr #

dataTypeOf :: RetweetedStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

Generic RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep RetweetedStatus :: Type -> Type #

ToJSON RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

type Rep RetweetedStatus Source # 
Instance details

Defined in Web.Twitter.Types

data DirectMessage Source #

Instances

Instances details
Eq DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

Data DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: DirectMessage -> Constr #

dataTypeOf :: DirectMessage -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

Generic DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep DirectMessage :: Type -> Type #

ToJSON DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

type Rep DirectMessage Source # 
Instance details

Defined in Web.Twitter.Types

data EventTarget Source #

Instances

Instances details
Eq EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

Data EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: EventTarget -> Constr #

dataTypeOf :: EventTarget -> DataType #

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

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

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

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

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

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

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

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

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

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

Show EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

Generic EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep EventTarget :: Type -> Type #

ToJSON EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

type Rep EventTarget Source # 
Instance details

Defined in Web.Twitter.Types

data Event Source #

Instances

Instances details
Eq Event Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data Event Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Event Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Generic Event Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

ToJSON Event Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Event Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Event Source # 
Instance details

Defined in Web.Twitter.Types

data Delete Source #

Constructors

Delete 

Instances

Instances details
Eq Delete Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data Delete Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Delete -> Constr #

dataTypeOf :: Delete -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Delete Source # 
Instance details

Defined in Web.Twitter.Types

Generic Delete Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Delete :: Type -> Type #

Methods

from :: Delete -> Rep Delete x #

to :: Rep Delete x -> Delete #

ToJSON Delete Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Delete Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Delete Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Delete = D1 ('MetaData "Delete" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Delete" 'PrefixI 'True) (S1 ('MetaSel ('Just "delId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StatusId) :*: S1 ('MetaSel ('Just "delUserId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserId)))

data User Source #

This type represents the Twitter user. See https://dev.twitter.com/docs/platform-objects/users.

Instances

Instances details
Eq User Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data User Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: User -> Constr #

dataTypeOf :: User -> DataType #

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

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

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

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

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

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

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

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

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

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

Show User Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

Generic User Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep User :: Type -> Type #

Methods

from :: User -> Rep User x #

to :: Rep User x -> User #

ToJSON User Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON User Source # 
Instance details

Defined in Web.Twitter.Types

type Rep User Source # 
Instance details

Defined in Web.Twitter.Types

type Rep User = D1 ('MetaData "User" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "User" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "userContributorsEnabled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "userCreatedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UTCTime)) :*: (S1 ('MetaSel ('Just "userDefaultProfile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "userDefaultProfileImage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "userDescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))) :*: ((S1 ('MetaSel ('Just "userEmail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "userFavoritesCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "userFollowRequestSent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "userFollowing") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "userFollowersCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))) :*: (((S1 ('MetaSel ('Just "userFriendsCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "userGeoEnabled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "userId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserId) :*: (S1 ('MetaSel ('Just "userIsTranslator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "userLang") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LanguageCode))))) :*: ((S1 ('MetaSel ('Just "userListedCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "userLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 ('MetaSel ('Just "userName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "userNotifications") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "userProfileBackgroundColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))))) :*: ((((S1 ('MetaSel ('Just "userProfileBackgroundImageURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString)) :*: S1 ('MetaSel ('Just "userProfileBackgroundImageURLHttps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString))) :*: (S1 ('MetaSel ('Just "userProfileBackgroundTile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: (S1 ('MetaSel ('Just "userProfileBannerURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString)) :*: S1 ('MetaSel ('Just "userProfileImageURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString))))) :*: ((S1 ('MetaSel ('Just "userProfileImageURLHttps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString)) :*: S1 ('MetaSel ('Just "userProfileLinkColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "userProfileSidebarBorderColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "userProfileSidebarFillColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "userProfileTextColor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))) :*: (((S1 ('MetaSel ('Just "userProfileUseBackgroundImage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "userProtected") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "userScreenName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "userShowAllInlineMedia") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "userStatusesCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))) :*: ((S1 ('MetaSel ('Just "userTimeZone") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "userURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIString)) :*: S1 ('MetaSel ('Just "userUtcOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)))) :*: (S1 ('MetaSel ('Just "userVerified") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "userWithheldInCountries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Text])) :*: S1 ('MetaSel ('Just "userWithheldScope") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))))))

data List Source #

Instances

Instances details
Eq List Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data List Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: List -> Constr #

dataTypeOf :: List -> DataType #

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

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

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

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

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

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

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

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

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

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

Show List Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> List -> ShowS #

show :: List -> String #

showList :: [List] -> ShowS #

Generic List Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep List :: Type -> Type #

Methods

from :: List -> Rep List x #

to :: Rep List x -> List #

ToJSON List Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON List Source # 
Instance details

Defined in Web.Twitter.Types

type Rep List Source # 
Instance details

Defined in Web.Twitter.Types

data Entities Source #

Instances

Instances details
Eq Entities Source # 
Instance details

Defined in Web.Twitter.Types

Data Entities Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Entities -> Constr #

dataTypeOf :: Entities -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Entities Source # 
Instance details

Defined in Web.Twitter.Types

Generic Entities Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Entities :: Type -> Type #

Methods

from :: Entities -> Rep Entities x #

to :: Rep Entities x -> Entities #

ToJSON Entities Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Entities Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Entities Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Entities = D1 ('MetaData "Entities" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Entities" 'PrefixI 'True) ((S1 ('MetaSel ('Just "enHashTags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entity HashTagEntity]) :*: S1 ('MetaSel ('Just "enUserMentions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entity UserEntity])) :*: (S1 ('MetaSel ('Just "enURLs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entity URLEntity]) :*: S1 ('MetaSel ('Just "enMedia") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entity MediaEntity]))))

type EntityIndices = [Int] Source #

The character positions the Entity was extracted from

This is experimental implementation. This may be replaced by more definite types.

data ExtendedEntities Source #

Instances

Instances details
Eq ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

Data ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: ExtendedEntities -> Constr #

dataTypeOf :: ExtendedEntities -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

Generic ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep ExtendedEntities :: Type -> Type #

ToJSON ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

type Rep ExtendedEntities Source # 
Instance details

Defined in Web.Twitter.Types

type Rep ExtendedEntities = D1 ('MetaData "ExtendedEntities" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "ExtendedEntities" 'PrefixI 'True) (S1 ('MetaSel ('Just "exeMedia") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Entity ExtendedEntity])))

data Variant Source #

Constructors

Variant 

Instances

Instances details
Eq Variant Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data Variant Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Variant -> Constr #

dataTypeOf :: Variant -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Variant Source # 
Instance details

Defined in Web.Twitter.Types

Generic Variant Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Variant :: Type -> Type #

Methods

from :: Variant -> Rep Variant x #

to :: Rep Variant x -> Variant #

ToJSON Variant Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Variant Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Variant Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Variant = D1 ('MetaData "Variant" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Variant" 'PrefixI 'True) (S1 ('MetaSel ('Just "vBitrate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: (S1 ('MetaSel ('Just "vContentType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "vUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URIString))))

data VideoInfo Source #

Instances

Instances details
Eq VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

Data VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: VideoInfo -> Constr #

dataTypeOf :: VideoInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

Generic VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep VideoInfo :: Type -> Type #

ToJSON VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

type Rep VideoInfo Source # 
Instance details

Defined in Web.Twitter.Types

type Rep VideoInfo = D1 ('MetaData "VideoInfo" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "VideoInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "vsAspectRatio") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int]) :*: (S1 ('MetaSel ('Just "vsDurationMillis") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "vsVariants") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Variant]))))

data ExtendedEntity Source #

Instances

Instances details
Eq ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

Data ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: ExtendedEntity -> Constr #

dataTypeOf :: ExtendedEntity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

Generic ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep ExtendedEntity :: Type -> Type #

ToJSON ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep ExtendedEntity Source # 
Instance details

Defined in Web.Twitter.Types

data Entity a Source #

Constructors

Entity 

Fields

Instances

Instances details
Eq a => Eq (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

(==) :: Entity a -> Entity a -> Bool #

(/=) :: Entity a -> Entity a -> Bool #

Data a => Data (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Entity a -> Constr #

dataTypeOf :: Entity a -> DataType #

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

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

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

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

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

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

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

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

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

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

Show a => Show (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> Entity a -> ShowS #

show :: Entity a -> String #

showList :: [Entity a] -> ShowS #

Generic (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep (Entity a) :: Type -> Type #

Methods

from :: Entity a -> Rep (Entity a) x #

to :: Rep (Entity a) x -> Entity a #

ToJSON a => ToJSON (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON a => FromJSON (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

Generic1 Entity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep1 Entity :: k -> Type #

Methods

from1 :: forall (a :: k). Entity a -> Rep1 Entity a #

to1 :: forall (a :: k). Rep1 Entity a -> Entity a #

type Rep (Entity a) Source # 
Instance details

Defined in Web.Twitter.Types

type Rep (Entity a) = D1 ('MetaData "Entity" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Entity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entityBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "entityIndices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EntityIndices)))
type Rep1 Entity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep1 Entity = D1 ('MetaData "Entity" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Entity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entityBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "entityIndices") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EntityIndices)))

data HashTagEntity Source #

Constructors

HashTagEntity 

Fields

Instances

Instances details
Eq HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

Data HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: HashTagEntity -> Constr #

dataTypeOf :: HashTagEntity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

Generic HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep HashTagEntity :: Type -> Type #

ToJSON HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep HashTagEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep HashTagEntity = D1 ('MetaData "HashTagEntity" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "HashTagEntity" 'PrefixI 'True) (S1 ('MetaSel ('Just "hashTagText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data UserEntity Source #

Instances

Instances details
Eq UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

Data UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: UserEntity -> Constr #

dataTypeOf :: UserEntity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

Generic UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep UserEntity :: Type -> Type #

ToJSON UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep UserEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep UserEntity = D1 ('MetaData "UserEntity" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "UserEntity" 'PrefixI 'True) (S1 ('MetaSel ('Just "userEntityUserId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserId) :*: (S1 ('MetaSel ('Just "userEntityUserName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserName) :*: S1 ('MetaSel ('Just "userEntityUserScreenName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data URLEntity Source #

Constructors

URLEntity 

Fields

Instances

Instances details
Eq URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

Data URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: URLEntity -> Constr #

dataTypeOf :: URLEntity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

Generic URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep URLEntity :: Type -> Type #

ToJSON URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep URLEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep URLEntity = D1 ('MetaData "URLEntity" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "URLEntity" 'PrefixI 'True) (S1 ('MetaSel ('Just "ueURL") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URIString) :*: (S1 ('MetaSel ('Just "ueExpanded") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 URIString) :*: S1 ('MetaSel ('Just "ueDisplay") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data MediaEntity Source #

Instances

Instances details
Eq MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

Data MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: MediaEntity -> Constr #

dataTypeOf :: MediaEntity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

Generic MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep MediaEntity :: Type -> Type #

ToJSON MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

type Rep MediaEntity Source # 
Instance details

Defined in Web.Twitter.Types

data MediaSize Source #

Constructors

MediaSize 

Fields

Instances

Instances details
Eq MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

Data MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: MediaSize -> Constr #

dataTypeOf :: MediaSize -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

Generic MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep MediaSize :: Type -> Type #

ToJSON MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

type Rep MediaSize Source # 
Instance details

Defined in Web.Twitter.Types

type Rep MediaSize = D1 ('MetaData "MediaSize" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "MediaSize" 'PrefixI 'True) (S1 ('MetaSel ('Just "msWidth") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "msHeight") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "msResize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data Coordinates Source #

Constructors

Coordinates 

Instances

Instances details
Eq Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

Data Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Coordinates -> Constr #

dataTypeOf :: Coordinates -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

Generic Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Coordinates :: Type -> Type #

ToJSON Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Coordinates Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Coordinates = D1 ('MetaData "Coordinates" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Coordinates" 'PrefixI 'True) (S1 ('MetaSel ('Just "coordinates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Double]) :*: S1 ('MetaSel ('Just "coordinatesType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Place Source #

This type represents a place, named locations with corresponding geo coordinates. See https://dev.twitter.com/docs/platform-objects/places.

Instances

Instances details
Eq Place Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

Data Place Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Place -> Constr #

dataTypeOf :: Place -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Place Source # 
Instance details

Defined in Web.Twitter.Types

Methods

showsPrec :: Int -> Place -> ShowS #

show :: Place -> String #

showList :: [Place] -> ShowS #

Generic Place Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Place :: Type -> Type #

Methods

from :: Place -> Rep Place x #

to :: Rep Place x -> Place #

ToJSON Place Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Place Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Place Source # 
Instance details

Defined in Web.Twitter.Types

data BoundingBox Source #

A bounding box of coordinates which encloses the place. See https://dev.twitter.com/docs/platform-objects/places#obj-boundingbox.

Instances

Instances details
Eq BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

Data BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: BoundingBox -> Constr #

dataTypeOf :: BoundingBox -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

Generic BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep BoundingBox :: Type -> Type #

ToJSON BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

type Rep BoundingBox Source # 
Instance details

Defined in Web.Twitter.Types

type Rep BoundingBox = D1 ('MetaData "BoundingBox" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "BoundingBox" 'PrefixI 'True) (S1 ('MetaSel ('Just "boundingBoxCoordinates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [[[Double]]]) :*: S1 ('MetaSel ('Just "boundingBoxType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Contributor Source #

Instances

Instances details
Eq Contributor Source # 
Instance details

Defined in Web.Twitter.Types

Data Contributor Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: Contributor -> Constr #

dataTypeOf :: Contributor -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Contributor Source # 
Instance details

Defined in Web.Twitter.Types

Generic Contributor Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep Contributor :: Type -> Type #

ToJSON Contributor Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON Contributor Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Contributor Source # 
Instance details

Defined in Web.Twitter.Types

type Rep Contributor = D1 ('MetaData "Contributor" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "Contributor" 'PrefixI 'True) (S1 ('MetaSel ('Just "contributorId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserId) :*: S1 ('MetaSel ('Just "contributorScreenName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data UploadedMedia Source #

This type is represents the API response of "/1.1/media/upload.json". See https://dev.twitter.com/docs/api/multiple-media-extended-entities.

Instances

Instances details
Eq UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

Data UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: UploadedMedia -> Constr #

dataTypeOf :: UploadedMedia -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

Generic UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep UploadedMedia :: Type -> Type #

ToJSON UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

type Rep UploadedMedia Source # 
Instance details

Defined in Web.Twitter.Types

type Rep UploadedMedia = D1 ('MetaData "UploadedMedia" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "UploadedMedia" 'PrefixI 'True) (S1 ('MetaSel ('Just "uploadedMediaId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: (S1 ('MetaSel ('Just "uploadedMediaSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer) :*: S1 ('MetaSel ('Just "uploadedMediaImage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ImageSizeType))))

data ImageSizeType Source #

Image size type. This type is included in the API response of "/1.1/media/upload.json".

Instances

Instances details
Eq ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

Data ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: ImageSizeType -> Constr #

dataTypeOf :: ImageSizeType -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

Generic ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep ImageSizeType :: Type -> Type #

ToJSON ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

type Rep ImageSizeType Source # 
Instance details

Defined in Web.Twitter.Types

type Rep ImageSizeType = D1 ('MetaData "ImageSizeType" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "ImageSizeType" 'PrefixI 'True) (S1 ('MetaSel ('Just "imageSizeTypeWidth") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Just "imageSizeTypeHeight") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "imageSizeTypeType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text))))

data DisplayTextRange Source #

unicode code point indices, identifying the inclusive start and exclusive end of the displayable content of the Tweet.

Instances

Instances details
Eq DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

Data DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

Methods

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

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

toConstr :: DisplayTextRange -> Constr #

dataTypeOf :: DisplayTextRange -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

Show DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

Generic DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

Associated Types

type Rep DisplayTextRange :: Type -> Type #

ToJSON DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

FromJSON DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

type Rep DisplayTextRange Source # 
Instance details

Defined in Web.Twitter.Types

type Rep DisplayTextRange = D1 ('MetaData "DisplayTextRange" "Web.Twitter.Types" "twitter-types-0.11.0-90zWHEClew8EZD9y3vRrZQ" 'False) (C1 ('MetaCons "DisplayTextRange" 'PrefixI 'True) (S1 ('MetaSel ('Just "displayTextRangeStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "displayTextRangeEnd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))