| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Reddit.Types.Reddit
Documentation
data RedditF m a where Source #
Constructors
| FailWith :: APIError RedditError -> RedditF m a | |
| Nest :: RedditT m b -> (Either (APIError RedditError) b -> a) -> RedditF m a | |
| NestResuming :: RedditT m b -> (Either (APIError RedditError, Maybe (RedditT m b)) b -> a) -> RedditF m a | |
| ReceiveRoute :: Receivable b => Route -> (b -> a) -> RedditF m a | |
| RunRoute :: FromJSON b => Route -> (b -> a) -> RedditF m a | |
| WithBaseURL :: Text -> RedditT m b -> (b -> a) -> RedditF m a | |
| WithHeaders :: ([Header] -> [Header]) -> RedditT m b -> (b -> a) -> RedditF m a |
receiveRoute :: (Receivable a, Monad m) => Route -> RedditT m a Source #
data LoginDetails Source #
Constructors
| LoginDetails Modhash CookieJar |
Instances
| Show LoginDetails Source # | |
Defined in Reddit.Types.Reddit Methods showsPrec :: Int -> LoginDetails -> ShowS # show :: LoginDetails -> String # showList :: [LoginDetails] -> ShowS # | |
| Receivable LoginDetails Source # | |
Defined in Reddit.Types.Reddit Methods receive :: ErrorReceivable e => Response ByteString -> Either (APIError e) LoginDetails # | |
newtype POSTWrapped a Source #
Constructors
| POSTWrapped a |
Instances
type ShouldRateLimit = Bool Source #
data RateLimits Source #
Constructors
| RateLimits | |
Fields | |
Instances
| Eq RateLimits Source # | |
Defined in Reddit.Types.Reddit | |
| Read RateLimits Source # | |
Defined in Reddit.Types.Reddit Methods readsPrec :: Int -> ReadS RateLimits # readList :: ReadS [RateLimits] # readPrec :: ReadPrec RateLimits # readListPrec :: ReadPrec [RateLimits] # | |
| Show RateLimits Source # | |
Defined in Reddit.Types.Reddit Methods showsPrec :: Int -> RateLimits -> ShowS # show :: RateLimits -> String # showList :: [RateLimits] -> ShowS # | |
data RateLimitInfo Source #
Instances
| Eq RateLimitInfo Source # | |
Defined in Reddit.Types.Reddit Methods (==) :: RateLimitInfo -> RateLimitInfo -> Bool # (/=) :: RateLimitInfo -> RateLimitInfo -> Bool # | |
| Read RateLimitInfo Source # | |
Defined in Reddit.Types.Reddit Methods readsPrec :: Int -> ReadS RateLimitInfo # readList :: ReadS [RateLimitInfo] # | |
| Show RateLimitInfo Source # | |
Defined in Reddit.Types.Reddit Methods showsPrec :: Int -> RateLimitInfo -> ShowS # show :: RateLimitInfo -> String # showList :: [RateLimitInfo] -> ShowS # | |
data ClientParams Source #
Constructors
| ClientParams Text Text |
Instances
| Eq ClientParams Source # | |
Defined in Reddit.Types.Reddit | |
| Ord ClientParams Source # | |
Defined in Reddit.Types.Reddit Methods compare :: ClientParams -> ClientParams -> Ordering # (<) :: ClientParams -> ClientParams -> Bool # (<=) :: ClientParams -> ClientParams -> Bool # (>) :: ClientParams -> ClientParams -> Bool # (>=) :: ClientParams -> ClientParams -> Bool # max :: ClientParams -> ClientParams -> ClientParams # min :: ClientParams -> ClientParams -> ClientParams # | |
| Read ClientParams Source # | |
Defined in Reddit.Types.Reddit Methods readsPrec :: Int -> ReadS ClientParams # readList :: ReadS [ClientParams] # | |
| Show ClientParams Source # | |
Defined in Reddit.Types.Reddit Methods showsPrec :: Int -> ClientParams -> ShowS # show :: ClientParams -> String # showList :: [ClientParams] -> ShowS # | |
mainBaseURL :: Text Source #
loginBaseURL :: Text Source #
addAPIType :: Route -> Route Source #