From 30a561ba9f35f4eb0e809e397f4ec99502d035d3 Mon Sep 17 00:00:00 2001 From: schochastics Date: Tue, 15 Nov 2022 21:04:17 +0100 Subject: [PATCH 1/5] added pagination fct and for following --- R/accounts.R | 9 +++++---- R/utils.R | 38 +++++++++++++++++++++++++++++--------- 2 files changed, 34 insertions(+), 13 deletions(-) diff --git a/R/accounts.R b/R/accounts.R index 7ec4bd8..a33fa0d 100644 --- a/R/accounts.R +++ b/R/accounts.R @@ -95,9 +95,10 @@ get_account_followers <- function(id,max_id,since_id,limit = 40, token = NULL, p #' get_account_following("109302436954721982") #' } #' @export -get_account_following <- function(id,max_id,since_id,limit = 40, token = NULL, parse = TRUE){ +get_account_following <- function(id,max_id,since_id,limit = 40L, token = NULL, parse = TRUE){ path <- paste0("api/v1/accounts/",id,"/following") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40)) if (!missing(max_id)) { params$max_id <- max_id } @@ -106,8 +107,8 @@ get_account_following <- function(id,max_id,since_id,limit = 40, token = NULL, p } process_request(token = token,path = path, - params = params, - parse = parse, FUN = v(parse_account)) + params = params, + parse = parse, FUN = v(parse_account),n = n,page_size = 40L) } #' Get featured tags of a user diff --git a/R/utils.R b/R/utils.R index 0566c1d..955e760 100644 --- a/R/utils.R +++ b/R/utils.R @@ -73,16 +73,35 @@ parse_header <- function(header){ #process a get request and parse output process_request <- function(token = NULL, - path, - instance = NULL, - params, - anonymous = FALSE, - parse = TRUE, - FUN = identity + path, + instance = NULL, + params, + anonymous = FALSE, + parse = TRUE, + FUN = identity, + n = 1L, + page_size=40L ){ - output <- make_get_request(token = token,path = path, - instance = instance, params = params, - anonymous = anonymous) + # if since_id is provided we page forward, otherwise we page backwards + if(!is.null(params[["since_id"]])){ + pager <- "since_id" + } else{ + pager <- "max_id" + } + pages <- ceiling(n/page_size) + output <- vector("list") + for(i in seq_len(pages)){ + tmp <- make_get_request(token = token,path = path, + instance = instance, params = params, + anonymous = anonymous) + output <- c(output,tmp) + attr(output,"headers") <- attr(tmp,"headers") + if(is.null(attr(tmp,"headers")[[pager]])){ + break + } + params[[pager]] <- attr(tmp,"headers")[[pager]] + } + if (isTRUE(parse)) { header <- attr(output,"headers") @@ -92,6 +111,7 @@ process_request <- function(token = NULL, return(output) } + ##vectorize function v <- function(FUN) { v_FUN <- function(x) { From 0c84c9f01adda81ae2a9dae93c0e1d7db9528804 Mon Sep 17 00:00:00 2001 From: schochastics Date: Tue, 15 Nov 2022 22:37:39 +0100 Subject: [PATCH 2/5] added pagination for all relevent functions and rate limit checking (#70 and #43) --- R/accounts.R | 95 ++++++++++++++++++++++++++--------- R/timelines_statuses.R | 48 +++++++++++++----- R/utils.R | 38 +++++++++++++- man/get_account_blocks.Rd | 16 +++++- man/get_account_bookmarks.Rd | 12 +++-- man/get_account_favourites.Rd | 16 +++++- man/get_account_followers.Rd | 12 +++-- man/get_account_following.Rd | 12 +++-- man/get_account_mutes.Rd | 16 +++++- man/get_timeline_hashtag.Rd | 8 ++- man/get_timeline_home.Rd | 12 ++++- man/get_timeline_public.Rd | 8 ++- 12 files changed, 236 insertions(+), 57 deletions(-) diff --git a/R/accounts.R b/R/accounts.R index a33fa0d..dbd51e4 100644 --- a/R/accounts.R +++ b/R/accounts.R @@ -65,16 +65,24 @@ get_account_statuses <- function(id,instance = NULL, token = NULL, anonymous = F #' @param max_id character, Return results older than this id #' @param since_id character, Return results newer than this id #' @param limit integer, maximum number of results to return. Defaults to 40. -#' @details this functions needs a user level auth token +#' @param retryonratelimit If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point. +#' @inheritParams auth_setup +#' @details this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. #' @return tibble or list of followers #' @examples #' \dontrun{ #' get_account_followers("109302436954721982") #' } #' @export -get_account_followers <- function(id,max_id,since_id,limit = 40, token = NULL, parse = TRUE){ +get_account_followers <- function(id,max_id,since_id, + limit = 40L, + token = NULL, + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/accounts/",id,"/followers") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -83,22 +91,29 @@ get_account_followers <- function(id,max_id,since_id,limit = 40, token = NULL, p } process_request(token = token,path = path, params = params, - parse = parse, FUN = v(parse_account)) + parse = parse, FUN = v(parse_account), + n = n, page_size = 40L, + retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get accounts a user follows #' @inheritParams get_account_statuses #' @inheritParams get_account_followers -#' @details this functions needs a user level auth token +#' @inheritParams auth_setup +#' @inherit get_account_followers details #' @return tibble or list of accounts a user follows #' @examples #' \dontrun{ #' get_account_following("109302436954721982") #' } #' @export -get_account_following <- function(id,max_id,since_id,limit = 40L, token = NULL, parse = TRUE){ +get_account_following <- function(id,max_id,since_id,limit = 40L, + token = NULL, parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/accounts/",id,"/following") n <- limit - params <- list(limit = min(limit,40)) + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -107,8 +122,10 @@ get_account_following <- function(id,max_id,since_id,limit = 40L, token = NULL, } process_request(token = token,path = path, - params = params, - parse = parse, FUN = v(parse_account),n = n,page_size = 40L) + params = params, + parse = parse, FUN = v(parse_account), + n = n,page_size = 40L, retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get featured tags of a user @@ -173,17 +190,22 @@ get_account_relationships <- function(ids,token = NULL, parse = TRUE){ #' Get bookmarks of user #' @inheritParams get_account_statuses #' @inheritParams get_account_followers +#' @inheritParams auth_setup #' @param min_id character, Return results younger than this id -#' @details this functions needs a user level auth token +#' @inherit get_account_followers details #' @return bookmarked statuses #' @examples #' \dontrun{ #' get_account_followers("109302436954721982") #' } #' @export -get_account_bookmarks <- function(max_id,since_id,min_id,limit = 40, token = NULL, parse = TRUE){ +get_account_bookmarks <- function(max_id,since_id,min_id,limit = 40L, + token = NULL, parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/bookmarks") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -196,14 +218,17 @@ get_account_bookmarks <- function(max_id,since_id,min_id,limit = 40, token = NUL process_request(token = token,path = path, params = params, - parse = parse, FUN = v(parse_status)) + parse = parse, FUN = v(parse_status),n = n, + page_size = 40L,retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get favourites of user #' @inheritParams get_account_statuses #' @inheritParams get_account_followers +#' @inheritParams auth_setup #' @param min_id character, Return results younger than this id -#' @details this functions needs a user level auth token +#' @inherit get_account_followers details #' @return tibble or list of favourited statuses #' @examples #' \dontrun{ @@ -211,9 +236,13 @@ get_account_bookmarks <- function(max_id,since_id,min_id,limit = 40, token = NUL #' get_account_favourites() #' } #' @export -get_account_favourites <- function(max_id,min_id,limit = 40, token = NULL, parse = TRUE){ +get_account_favourites <- function(max_id,min_id,limit = 40L, + token = NULL, parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/favourites") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -223,13 +252,16 @@ get_account_favourites <- function(max_id,min_id,limit = 40, token = NULL, parse process_request(token = token,path = path, params = params, - parse = parse, FUN = v(parse_status)) + parse = parse, FUN = v(parse_status),n = n, + page_size = 40L,retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get blocks of user #' @inheritParams get_account_statuses #' @inheritParams get_account_followers -#' @details this functions needs a user level auth token +#' @inheritParams auth_setup +#' @inherit get_account_followers details #' @return tibble or list of blocked users #' @examples #' \dontrun{ @@ -237,9 +269,13 @@ get_account_favourites <- function(max_id,min_id,limit = 40, token = NULL, parse #' get_account_blocks() #' } #' @export -get_account_blocks <- function(max_id,since_id,limit = 40, token = NULL, parse = TRUE){ +get_account_blocks <- function(max_id,since_id,limit = 40L, + token = NULL, parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/blocks") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -249,13 +285,16 @@ get_account_blocks <- function(max_id,since_id,limit = 40, token = NULL, parse = process_request(token = token,path = path, params = params, - parse = parse, FUN = v(parse_account)) + parse = parse, FUN = v(parse_account), n = n, + page_size = 40L,retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get mutes of user #' @inheritParams get_account_statuses #' @inheritParams get_account_followers -#' @details this functions needs a user level auth token +#' @inheritParams auth_setup +#' @inherit get_account_followers details #' @return tibble or list of muted users #' @examples #' \dontrun{ @@ -263,9 +302,13 @@ get_account_blocks <- function(max_id,since_id,limit = 40, token = NULL, parse = #' get_account_mutes() #' } #' @export -get_account_mutes <- function(max_id,since_id,limit = 40, token = NULL, parse = TRUE){ +get_account_mutes <- function(max_id,since_id,limit = 40L, + token = NULL, parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE){ path <- paste0("api/v1/mutes") - params <- list(limit = limit) + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -275,5 +318,7 @@ get_account_mutes <- function(max_id,since_id,limit = 40, token = NULL, parse = process_request(token = token,path = path, params = params, - parse = parse, FUN = v(parse_account)) + parse = parse, FUN = v(parse_account), + n = n, page_size = 40L, retryonratelimit = retryonratelimit, + verbose = verbose) } diff --git a/R/timelines_statuses.R b/R/timelines_statuses.R index 910d037..e0c341d 100644 --- a/R/timelines_statuses.R +++ b/R/timelines_statuses.R @@ -93,6 +93,8 @@ get_poll <- function(id, instance = NULL, token = NULL, anonymous = FALSE, parse #' @param since_id character, Return results newer than this id #' @param min_id character, Return results immediately newer than this id #' @param limit integer, Maximum number of results to return +#' @param retryonratelimit If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point. +#' @param verbose logical whether to display messages #' @inheritParams post_toot #' @inheritParams get_status #' @return statuses @@ -107,8 +109,12 @@ get_poll <- function(id, instance = NULL, token = NULL, anonymous = FALSE, parse #' @references #' https://docs.joinmastodon.org/methods/timelines/ get_timeline_public <- function(local = FALSE, remote = FALSE, only_media = FALSE, - max_id, since_id, min_id, limit = 20L, instance = NULL, token = NULL, anonymous = FALSE, parse = TRUE) { - params <- list(local = local, remote = remote, only_media = only_media, limit = limit) + max_id, since_id, min_id, limit = 20L, + instance = NULL, token = NULL, anonymous = FALSE, parse = TRUE, + retryonratelimit = TRUE,verbose = TRUE) { + params <- list(local = local, remote = remote, + only_media = only_media, limit = min(limit,40)) + n <- limit if (!missing(max_id)) { params$max_id <- max_id } @@ -121,7 +127,10 @@ get_timeline_public <- function(local = FALSE, remote = FALSE, only_media = FALS path = "/api/v1/timelines/public" process_request(token = token,path = path,instance = instance,params = params, - anonymous = anonymous,parse = parse,FUN = v(parse_status)) + anonymous = anonymous,parse = parse,FUN = v(parse_status), + n = n, page_size = 40L, + retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get hashtag timeline @@ -138,8 +147,10 @@ get_timeline_public <- function(local = FALSE, remote = FALSE, only_media = FALS #' } get_timeline_hashtag <- function(hashtag = "rstats", local = FALSE, only_media = FALSE, max_id, since_id, min_id, limit = 20L, instance = NULL, - token = NULL, anonymous = FALSE, parse = TRUE) { - params <- list(local = local, only_media = only_media, limit = limit) + token = NULL, anonymous = FALSE, parse = TRUE, + retryonratelimit = TRUE,verbose = TRUE) { + n <- limit + params <- list(local = local, only_media = only_media, limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -152,7 +163,9 @@ get_timeline_hashtag <- function(hashtag = "rstats", local = FALSE, only_media = path <- paste0("/api/v1/timelines/tag/", gsub("^#+", "", hashtag)) process_request(token = token,path = path,instance = instance,params = params, - anonymous = anonymous,parse = parse,FUN = v(parse_status)) + anonymous = anonymous,parse = parse,FUN = v(parse_status), + n = n, page_size = 40L, retryonratelimit = retryonratelimit, + verbose = verbose) } #' Get home and list timelines @@ -165,8 +178,10 @@ get_timeline_hashtag <- function(hashtag = "rstats", local = FALSE, only_media = #' \dontrun{ #' get_timeline_home() #' } -get_timeline_home <- function(local = FALSE, max_id, since_id, min_id, limit = 20L, token = NULL, parse = TRUE) { - params <- list(local = local, limit = limit) +get_timeline_home <- function(local = FALSE, max_id, since_id, min_id, limit = 20L, + token = NULL, parse = TRUE,retryonratelimit = TRUE,verbose = TRUE) { + n <- limit + params <- list(local = local, limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -179,7 +194,10 @@ get_timeline_home <- function(local = FALSE, max_id, since_id, min_id, limit = 2 path = "/api/v1/timelines/home" process_request(token = token,path = path,params = params, - parse = parse,FUN = v(parse_status)) + parse = parse,FUN = v(parse_status), + n = n, page_size = 40L, + retryonratelimit = retryonratelimit, + verbose = verbose) } #' @rdname get_timeline_home @@ -188,8 +206,11 @@ get_timeline_home <- function(local = FALSE, max_id, since_id, min_id, limit = 2 #' \dontrun{ #' get_timeline_list("") #' } -get_timeline_list <- function(list_id, max_id, since_id, min_id, limit = 20L, token = NULL, parse = TRUE) { - params <- list(limit = limit) +get_timeline_list <- function(list_id, max_id, since_id, min_id, + limit = 20L, token = NULL, parse = TRUE, + retryonratelimit = TRUE,verbose = TRUE) { + n <- limit + params <- list(limit = min(limit,40L)) if (!missing(max_id)) { params$max_id <- max_id } @@ -202,5 +223,8 @@ get_timeline_list <- function(list_id, max_id, since_id, min_id, limit = 20L, to path <- paste0("/api/v1/timelines/list/", list_id) process_request(token = token,path = path,params = params, - parse = parse,FUN = v(parse_status)) + parse = parse,FUN = v(parse_status), + n = n, page_size = 40L, + retryonratelimit = retryonratelimit, + verbose = verbose) } diff --git a/R/utils.R b/R/utils.R index 955e760..7ec1838 100644 --- a/R/utils.R +++ b/R/utils.R @@ -80,7 +80,9 @@ process_request <- function(token = NULL, parse = TRUE, FUN = identity, n = 1L, - page_size=40L + page_size = 40L, + retryonratelimit = TRUE, + verbose = TRUE ){ # if since_id is provided we page forward, otherwise we page backwards if(!is.null(params[["since_id"]])){ @@ -94,6 +96,17 @@ process_request <- function(token = NULL, tmp <- make_get_request(token = token,path = path, instance = instance, params = params, anonymous = anonymous) + + if(rate_limit_remaining(tmp)==0){ + if(isTRUE(retryonratelimit)){ + wait_until(attr(tmp,"headers")[["rate_reset"]],verbose) + } else{ + output <- c(output,tmp) + attr(output,"headers") <- attr(tmp,"headers") + sayif(verbose,"rate limit reached and `retryonratelimit=FALSE`. returning current results.") + break + } + } output <- c(output,tmp) attr(output,"headers") <- attr(tmp,"headers") if(is.null(attr(tmp,"headers")[[pager]])){ @@ -125,3 +138,26 @@ sayif <- function(verbose, ...) { message(...) } } + +# inspired by rtweet +wait_until <- function(until,verbose = TRUE){ + until <- as.numeric(until) + seconds <- ceiling(until - unclass(Sys.time())) + if(seconds>0){ + sayif(verbose,"Rate limit exceeded, waiting for ",seconds," seconds") + Sys.sleep(seconds) + } + return(invisible()) +} + +rate_limit_remaining <- function(object){ + if(is.null(attr(object,"headers"))){ + stop("no header information found") + } + header <- attr(object,"headers") + if(is.null(header[["rate_remaining"]])){ + stop("no rate limit information found") + } else{ + return(as.numeric(header[["rate_remaining"]])) + } +} diff --git a/man/get_account_blocks.Rd b/man/get_account_blocks.Rd index e0200ef..2d56a9a 100644 --- a/man/get_account_blocks.Rd +++ b/man/get_account_blocks.Rd @@ -4,7 +4,15 @@ \alias{get_account_blocks} \title{Get blocks of user} \usage{ -get_account_blocks(max_id, since_id, limit = 40, token = NULL, parse = TRUE) +get_account_blocks( + max_id, + since_id, + limit = 40L, + token = NULL, + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE +) } \arguments{ \item{max_id}{character, Return results older than this id} @@ -16,6 +24,10 @@ get_account_blocks(max_id, since_id, limit = 40, token = NULL, parse = TRUE) \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ tibble or list of blocked users @@ -24,7 +36,7 @@ tibble or list of blocked users Get blocks of user } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_account_bookmarks.Rd b/man/get_account_bookmarks.Rd index 6fca204..70f8e64 100644 --- a/man/get_account_bookmarks.Rd +++ b/man/get_account_bookmarks.Rd @@ -8,9 +8,11 @@ get_account_bookmarks( max_id, since_id, min_id, - limit = 40, + limit = 40L, token = NULL, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -25,6 +27,10 @@ get_account_bookmarks( \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ bookmarked statuses @@ -33,7 +39,7 @@ bookmarked statuses Get bookmarks of user } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_account_favourites.Rd b/man/get_account_favourites.Rd index 01c351f..2661aaa 100644 --- a/man/get_account_favourites.Rd +++ b/man/get_account_favourites.Rd @@ -4,7 +4,15 @@ \alias{get_account_favourites} \title{Get favourites of user} \usage{ -get_account_favourites(max_id, min_id, limit = 40, token = NULL, parse = TRUE) +get_account_favourites( + max_id, + min_id, + limit = 40L, + token = NULL, + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE +) } \arguments{ \item{max_id}{character, Return results older than this id} @@ -16,6 +24,10 @@ get_account_favourites(max_id, min_id, limit = 40, token = NULL, parse = TRUE) \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ tibble or list of favourited statuses @@ -24,7 +36,7 @@ tibble or list of favourited statuses Get favourites of user } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_account_followers.Rd b/man/get_account_followers.Rd index 683232a..cd0c665 100644 --- a/man/get_account_followers.Rd +++ b/man/get_account_followers.Rd @@ -8,9 +8,11 @@ get_account_followers( id, max_id, since_id, - limit = 40, + limit = 40L, token = NULL, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -25,6 +27,10 @@ get_account_followers( \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ tibble or list of followers @@ -33,7 +39,7 @@ tibble or list of followers Get followers of a user } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_account_following.Rd b/man/get_account_following.Rd index 7b31a82..b61c999 100644 --- a/man/get_account_following.Rd +++ b/man/get_account_following.Rd @@ -8,9 +8,11 @@ get_account_following( id, max_id, since_id, - limit = 40, + limit = 40L, token = NULL, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -25,6 +27,10 @@ get_account_following( \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ tibble or list of accounts a user follows @@ -33,7 +39,7 @@ tibble or list of accounts a user follows Get accounts a user follows } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_account_mutes.Rd b/man/get_account_mutes.Rd index 3f008b6..594aaa7 100644 --- a/man/get_account_mutes.Rd +++ b/man/get_account_mutes.Rd @@ -4,7 +4,15 @@ \alias{get_account_mutes} \title{Get mutes of user} \usage{ -get_account_mutes(max_id, since_id, limit = 40, token = NULL, parse = TRUE) +get_account_mutes( + max_id, + since_id, + limit = 40L, + token = NULL, + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE +) } \arguments{ \item{max_id}{character, Return results older than this id} @@ -16,6 +24,10 @@ get_account_mutes(max_id, since_id, limit = 40, token = NULL, parse = TRUE) \item{token}{user bearer token (read from file by default)} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ tibble or list of muted users @@ -24,7 +36,7 @@ tibble or list of muted users Get mutes of user } \details{ -this functions needs a user level auth token +this functions needs a user level auth token. If limit>40, automatic pagination is used. You may get more results than requested. } \examples{ \dontrun{ diff --git a/man/get_timeline_hashtag.Rd b/man/get_timeline_hashtag.Rd index d5ffea4..7348fff 100644 --- a/man/get_timeline_hashtag.Rd +++ b/man/get_timeline_hashtag.Rd @@ -15,7 +15,9 @@ get_timeline_hashtag( instance = NULL, token = NULL, anonymous = FALSE, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -40,6 +42,10 @@ get_timeline_hashtag( \item{anonymous}{some API calls do not need a token. Setting anonymous to TRUE allows to make an anonymous call if possible.} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ statuses diff --git a/man/get_timeline_home.Rd b/man/get_timeline_home.Rd index 9365c17..ce26011 100644 --- a/man/get_timeline_home.Rd +++ b/man/get_timeline_home.Rd @@ -12,7 +12,9 @@ get_timeline_home( min_id, limit = 20L, token = NULL, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) get_timeline_list( @@ -22,7 +24,9 @@ get_timeline_list( min_id, limit = 20L, token = NULL, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -40,6 +44,10 @@ get_timeline_list( \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} + \item{list_id}{character, Local ID of the list in the database.} } \value{ diff --git a/man/get_timeline_public.Rd b/man/get_timeline_public.Rd index 137bdb9..8eb9d7e 100644 --- a/man/get_timeline_public.Rd +++ b/man/get_timeline_public.Rd @@ -15,7 +15,9 @@ get_timeline_public( instance = NULL, token = NULL, anonymous = FALSE, - parse = TRUE + parse = TRUE, + retryonratelimit = TRUE, + verbose = TRUE ) } \arguments{ @@ -40,6 +42,10 @@ get_timeline_public( \item{anonymous}{some API calls do not need a token. Setting anonymous to TRUE allows to make an anonymous call if possible.} \item{parse}{logical, if \code{TRUE}, the default, returns a tibble. Use \code{FALSE} to return the "raw" list corresponding to the JSON returned from the Mastodon API.} + +\item{retryonratelimit}{If TRUE, and a rate limit is exhausted, will wait until it refreshes. Most Mastodon rate limits refresh every 5 minutes. If FALSE, and the rate limit is exceeded, the function will terminate early with a warning; you'll still get back all results received up to that point.} + +\item{verbose}{logical whether to display messages} } \value{ statuses From 61f01c4291d5ed8e93bcb04ee3a777e3bcbf1b13 Mon Sep 17 00:00:00 2001 From: schochastics Date: Wed, 16 Nov 2022 07:21:21 +0100 Subject: [PATCH 3/5] added new pagination status to vignette and readme --- README.Rmd | 4 +--- README.md | 9 +++++---- vignettes/rtoot.Rmd | 5 +---- 3 files changed, 7 insertions(+), 11 deletions(-) diff --git a/README.Rmd b/README.Rmd index e8e357f..4060c00 100644 --- a/README.Rmd +++ b/README.Rmd @@ -132,9 +132,7 @@ You can mark the toot as sensitive by setting `sensitive = TRUE` and add a spoil ## Pagination -Most functions only return up to 40 results. The current version of `rtoot` does not -support pagination out of the box (but it is planned for later). there is a workaround which can be found -in the [wiki](https://github.com/schochastics/rtoot/wiki/Pagination) +All relevant functions in the package support pagination of results if the `limit` parameter is larger than the default page size (which is 40 in most cases). In this case, you may get more results than requested since the pages are always fetched as a whole. If you for example request 70 records, you will get 80 back, given that many records exist. ## Code of Conduct diff --git a/README.md b/README.md index d856a9f..d175bc8 100644 --- a/README.md +++ b/README.md @@ -142,10 +142,11 @@ a spoiler text with `spoiler_text`. ## Pagination -Most functions only return up to 40 results. The current version of -`rtoot` does not support pagination out of the box (but it is planned -for later). there is a workaround which can be found in the -[wiki](https://github.com/schochastics/rtoot/wiki/Pagination) +All relevant functions in the package support pagination of results if +the `limit` parameter is larger than the default page size (which is 40 +in most cases). In this case, you may get more results than requested +since the pages are always fetched as a whole. If you for example +request 70 records, you will get 80 back, given that many records exist. ## Code of Conduct diff --git a/vignettes/rtoot.Rmd b/vignettes/rtoot.Rmd index d092670..af723b7 100644 --- a/vignettes/rtoot.Rmd +++ b/vignettes/rtoot.Rmd @@ -110,8 +110,5 @@ You can mark the toot as sensitive by setting `sensitive = TRUE` and add a spoil ## Pagination -Most functions only return up to 40 results. The current version of `rtoot` does not -support pagination out of the box (but it is planned for later). there is a workaround which can be found -in the [wiki](https://github.com/schochastics/rtoot/wiki/Pagination) on github. - +All relevant functions in the package support pagination of results if the `limit` parameter is larger than the default page size (which is 40 in most cases). In this case, you may get more results than requested since the pages are always fetched as a whole. If you for example request 70 records, you will get 80 back, given that many records exist. From d998f2f6804b50505aacb4129dd38fdcb53f09a7 Mon Sep 17 00:00:00 2001 From: chainsawriot Date: Wed, 16 Nov 2022 11:51:13 +0100 Subject: [PATCH 4/5] add unittests for `process_request` 's `n` and `page_size` arguments --- tests/fixtures/process_request_bigger.yml | 376 ++++++++++++++++++++ tests/fixtures/process_request_equal1.yml | 382 +++++++++++++++++++++ tests/fixtures/process_request_smaller.yml | 382 +++++++++++++++++++++ tests/testthat/test-pagination.R | 57 +++ 4 files changed, 1197 insertions(+) create mode 100644 tests/fixtures/process_request_bigger.yml create mode 100644 tests/fixtures/process_request_equal1.yml create mode 100644 tests/fixtures/process_request_smaller.yml create mode 100644 tests/testthat/test-pagination.R diff --git a/tests/fixtures/process_request_bigger.yml b/tests/fixtures/process_request_bigger.yml new file mode 100644 index 0000000..4d27dde --- /dev/null +++ b/tests/fixtures/process_request_bigger.yml @@ -0,0 +1,376 @@ +http_interactions: +- request: + method: get + uri: https://emacs.ch/api/v1/timelines/public?local=FALSE&remote=FALSE&only_media=FALSE&limit=10 + body: + encoding: '' + string: '' + headers: + Accept: application/json, text/xml, application/xml, */* + Authorization: Bearer <<>> + response: + status: + status_code: 200 + category: Success + reason: OK + message: 'Success: (200) OK' + headers: + cache-control: no-store + content-encoding: gzip + content-security-policy: 'base-uri ''none''; default-src ''none''; frame-ancestors + ''none''; font-src ''self'' https://emacs.ch; img-src ''self'' https: data: + blob: https://emacs.ch; style-src ''self'' https://emacs.ch ''nonce-+jtNhskbejmkJmYtnANkVw==''; + media-src ''self'' https: data: https://emacs.ch; frame-src ''self'' https:; + manifest-src ''self'' https://emacs.ch; connect-src ''self'' data: blob: https://emacs.ch + https://emacs.ch wss://emacs.ch; script-src ''self'' https://emacs.ch ''wasm-unsafe-eval''; + child-src ''self'' blob: https://emacs.ch; worker-src ''self'' blob: https://emacs.ch' + content-type: application/json; charset=utf-8 + date: Wed, 16 Nov 2022 10:32:31 GMT + etag: W/"0b054caff3aa664b847dafac06f14c45" + link: ; + rel="next", ; + rel="prev" + permissions-policy: interest-cohort=() + server: Mastodon + strict-transport-security: max-age=63072000; includeSubDomains + vary: + - Accept-Encoding + - Origin + x-cached: MISS + x-content-type-options: nosniff + x-frame-options: DENY + x-ratelimit-limit: '300' + x-ratelimit-remaining: '299' + x-ratelimit-reset: '2022-11-16T10:35:00.095191Z' + x-request-id: b14397e8-de96-4499-9109-a2011f928ee1 + x-runtime: '0.145118' + x-xss-protection: '0' + body: + encoding: '' + file: no + string: "[{\"id\":\"109353023823324523\",\"created_at\":\"2022-11-16T10:32:03.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353023773983022\",\"url\":\"https://mastodon.com.tr/@Cattie/109353023773983022\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eBen + reise vercem arkadaşlar\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353021919374795\",\"created_at\":\"2022-11-16T10:30:46.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018779322431\",\"url\":\"https://pokemon.men/@archlinux/109353018779322431\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt5 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt5/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\",\"title\":\"Arch + Linux - qgnomeplatform-qt5 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353021428178619\",\"created_at\":\"2022-11-16T10:30:45.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018665849499\",\"url\":\"https://pokemon.men/@archlinux/109353018665849499\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt6 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt6/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\",\"title\":\"Arch + Linux - qgnomeplatform-qt6 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353020672877916\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018578118374\",\"url\":\"https://pokemon.men/@archlinux/109353018578118374\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + Not understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" + \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281325\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281325\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281325\",\"title\":\"Not + understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" / + Applications \\u0026 Desktop Environments / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353019972431282\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018542942008\",\"url\":\"https://pokemon.men/@archlinux/109353018542942008\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qt6ct 0.7-2 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qt6ct/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qt6ct/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qt6ct/\",\"title\":\"Arch + Linux - qt6ct 0.7-2 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353018792568399\",\"created_at\":\"2022-11-16T10:30:42.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018487959678\",\"url\":\"https://pokemon.men/@archlinux/109353018487959678\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + SwayIDLE not working when i close my thinkpad \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281326\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281326\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281326\",\"title\":\"SwayIDLE + not working when i close my thinkpad / Applications \\u0026 Desktop Environments + / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353017283269023\",\"created_at\":\"2022-11-16T10:30:17.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://social.treehouse.systems/users/ariadne/statuses/109353016854603277\",\"url\":\"https://social.treehouse.systems/@ariadne/109353016854603277\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eanyway, + as i was saying, if you are going to buy into forms of digital casteism such + as fedified, we're not likely to be friends.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109342791058708572\",\"username\":\"ariadne\",\"acct\":\"ariadne@treehouse.systems\",\"display_name\":\"Ariadne + Conill \U0001F430\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-04-05T00:00:00.000Z\",\"note\":\"\\u003cp\\u003erabbit + enthusiast, principal software engineer, dreamer of dreams, maker of cool + shit\\u003c/p\\u003e\",\"url\":\"https://social.treehouse.systems/@ariadne\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"followers_count\":2150,\"following_count\":650,\"statuses_count\":4211,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"https://ariadne.space\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eariadne.space\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-16T08:26:11.676+00:00\"}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353013280438553\",\"created_at\":\"2022-11-16T10:29:20.891Z\",\"in_reply_to_id\":\"109352856802313372\",\"in_reply_to_account_id\":\"109346416142488063\",\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://gleasonator.com/objects/3bde51d9-3311-41fc-9c15-627c01683411\",\"url\":\"https://gleasonator.com/objects/3bde51d9-3311-41fc-9c15-627c01683411\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"Going + to afk from my laptop this afternoon and evening, write some notes and see + if I can come up with a nice way to reimplement \\u003ca class=\\\"hashtag\\\" + href=\\\"https://gleasonator.com/tag/tasky\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e#Tasky\\u003c/a\\u003e both protocol wise and + also user-end API wise. The latter point is really what matters and is what + I want to implement in a very-nice manner.\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109346416142488063\",\"username\":\"deavmi\",\"acct\":\"deavmi@gleasonator.com\",\"display_name\":\"Tristan + B. V. Kildaire \U0001F1FA\U0001F1E6\U0001F5FD\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-15T00:00:00.000Z\",\"note\":\"I’m + Tristan B. Kildaire (or deavmi on the Internet) and I’m a computer programmer. + I love tinkering around with all the bits of software that my computer runs + but typically more on the low-level sides of things. I’m really interested + in how operating systems work as a whole and their components such as kernels, + networking stacks, linking-loaders, IPC, paging, virtual memory, file-systems + and the list goes on. There’s so much to learn from understanding these complex + systems and each aspect of them never leaves me bored!\\u003cbr\\u003e\\u003cbr\\u003eYou + could call me a language enthusiast, from the design to the implementation. + I always want to know how things work and I’ve even spent time reading the + source code for some language runtimes to get a better understanding. If I + am feeling creative then I try write my own or write something in Forth! I + love building networks too - I have an interest in setting up inter-networks + with routing protocols, assigning numbers and setting up tunnels in order + to build a huge network that I can play around on. When I’m not using other + peoples’ protocols I am busy writing my own to see what I can cobble out to + itch my scratch on trying interesting concepts out.\\u003cbr\\u003e\\u003cbr\\u003eI + like a good glass of red wine and cheese. I have an avid enjoyment for music + from the 70s and the 80s and have rather interesting political views (nothing + to be alarmed of) but most importantly I like to help others learn and put + a smile on their face.\",\"url\":\"https://gleasonator.com/users/deavmi\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/346/416/142/488/063/original/a25a403144267cc4.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/346/416/142/488/063/original/a25a403144267cc4.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/346/416/142/488/063/original/467d2182afa4c0c3.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/346/416/142/488/063/original/467d2182afa4c0c3.jpg\",\"followers_count\":199,\"following_count\":538,\"statuses_count\":17,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Monero\",\"value\":\"86reDCjk99VJ8QCo73WwM1AtfweD2fp8RPPWzNK56cdS1fAfxWCwixic9QrXkHyoJSe3gMZkAkb8aW5oU4cLEFucMLX4wqP\",\"verified_at\":null},{\"name\":\"Matrix\",\"value\":\"@deavmi:envs.net\",\"verified_at\":null},{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"http://deavmi.assigned.network\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003ehttp://deavmi.assigned.network\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"BonoboNET + IRC\",\"value\":\"~deavmi\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[{\"id\":\"109346416142488063\",\"username\":\"deavmi\",\"url\":\"https://gleasonator.com/users/deavmi\",\"acct\":\"deavmi@gleasonator.com\"}],\"tags\":[{\"name\":\"tasky\",\"url\":\"https://emacs.ch/tags/tasky\"}],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353013203181531\",\"created_at\":\"2022-11-16T10:29:21.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/alastor/statuses/109353013177966488\",\"url\":\"https://mastodon.com.tr/@alastor/109353013177966488\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eAnancılık + kazanacak\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109353015952554558\",\"username\":\"alastor\",\"acct\":\"alastor@mastodon.com.tr\",\"display_name\":\"Bahadır\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eSystem + and Cyber Security Specialist\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@alastor\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/015/952/554/558/original/201c4f0bb8c370d9.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/015/952/554/558/original/201c4f0bb8c370d9.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":38,\"following_count\":18,\"statuses_count\":1969,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353009586751651\",\"created_at\":\"2022-11-16T10:28:25.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353009539610498\",\"url\":\"https://mastodon.com.tr/@Cattie/109353009539610498\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eTenkyu + chp kardeşim ışığın bol olsun\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null}]" + recorded_at: 2022-11-16 10:32:31 GMT + recorded_with: vcr/1.1.0, webmockr/0.8.2 +- request: + method: get + uri: https://emacs.ch/api/v1/timelines/public?local=FALSE&remote=FALSE&only_media=FALSE&limit=10&max_id=109353009586751651 + body: + encoding: '' + string: '' + headers: + Accept: application/json, text/xml, application/xml, */* + Authorization: Bearer <<>> + response: + status: + status_code: 200 + category: Success + reason: OK + message: 'Success: (200) OK' + headers: + cache-control: no-store + content-encoding: gzip + content-security-policy: 'base-uri ''none''; default-src ''none''; frame-ancestors + ''none''; font-src ''self'' https://emacs.ch; img-src ''self'' https: data: + blob: https://emacs.ch; style-src ''self'' https://emacs.ch ''nonce-11IgieIBH7MYcwOWfJBvzw==''; + media-src ''self'' https: data: https://emacs.ch; frame-src ''self'' https:; + manifest-src ''self'' https://emacs.ch; connect-src ''self'' data: blob: https://emacs.ch + https://emacs.ch wss://emacs.ch; script-src ''self'' https://emacs.ch ''wasm-unsafe-eval''; + child-src ''self'' blob: https://emacs.ch; worker-src ''self'' blob: https://emacs.ch' + content-type: application/json; charset=utf-8 + date: Wed, 16 Nov 2022 10:32:31 GMT + etag: W/"4ae6bafb3b478cf626ea2fd726be073d" + link: ; + rel="next", ; + rel="prev" + permissions-policy: interest-cohort=() + server: Mastodon + strict-transport-security: max-age=63072000; includeSubDomains + vary: + - Accept-Encoding + - Origin + x-cached: MISS + x-content-type-options: nosniff + x-frame-options: DENY + x-ratelimit-limit: '300' + x-ratelimit-remaining: '298' + x-ratelimit-reset: '2022-11-16T10:35:00.384965Z' + x-request-id: fab16751-65e8-4007-9cc4-5d4e6d08ee3f + x-runtime: '0.104448' + x-xss-protection: '0' + body: + encoding: '' + file: no + string: "[{\"id\":\"109353006124850537\",\"created_at\":\"2022-11-16T10:27:32.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://qoto.org/users/true_mxp/statuses/109353006019312191\",\"url\":\"https://qoto.org/@true_mxp/109353006019312191\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eGotta + love these US scholars who discover that there are other languages besides + English and who then feel the urgent need to ‘educate’ everybody about this + because they assume everybody’s like them.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336055534477653\",\"username\":\"true_mxp\",\"acct\":\"true_mxp@qoto.org\",\"display_name\":\"Michael + Piotrowski\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-13T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eAssociate + professor of digital humanities\\u2028University of Lausanne, Switzerland\\u2029Professeur + associé en humanités\\u0026nbsp;numériques\\u2028Université de Lausanne, Suisse\\u003c/p\\u003e\",\"url\":\"https://qoto.org/@true_mxp\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/055/534/477/653/original/e917a5a45bf174fb.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/055/534/477/653/original/e917a5a45bf174fb.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/055/534/477/653/original/731ff335358f95d1.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/055/534/477/653/original/731ff335358f95d1.jpeg\",\"followers_count\":129,\"following_count\":186,\"statuses_count\":50,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"OpenPGP\",\"value\":\"0x1614A044\",\"verified_at\":null},{\"name\":\"Web + site\",\"value\":\"\\u003ca href=\\\"http://dynalabs.de/mxp/\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003edynalabs.de/mxp/\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-13T12:26:09.642+00:00\"},{\"name\":\"ORCiD\",\"value\":\"\\u003ca + href=\\\"http://orcid.org/0000-0003-3307-5386\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eorcid.org/0000-0003-3307-5386\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353005144700860\",\"created_at\":\"2022-11-16T10:27:18.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353005106335986\",\"url\":\"https://mastodon.com.tr/@Cattie/109353005106335986\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eBenim + mi kız naptım ben\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353002720428682\",\"created_at\":\"2022-11-16T10:26:41.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353002678969077\",\"url\":\"https://mastodon.com.tr/@Cattie/109353002678969077\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eAksini + iddia etmedim deno karaktersizim\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109352999389247898\",\"created_at\":\"2022-11-16T10:25:51.472Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":null,\"uri\":\"https://pleroma.debian.social/objects/e7803c5c-8583-43ac-8574-46785e9f8133\",\"url\":\"https://pleroma.debian.social/objects/e7803c5c-8583-43ac-8574-46785e9f8133\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003ca + class=\\\"hashtag\\\" href=\\\"https://pleroma.debian.social/tag/sxmo\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#Sxmo\\u003c/a\\u003e + 1.12.0 has just been released! My favorite features:\\u003cbr\\u003e\\u003cbr\\u003e- + better support for oneplus 6, poco f1, pinephone pro, and devices with an + unknown profile. This should make porting new devices easier.\\u003cbr\\u003e- + modem scripts recover from failure better and handle more edge cases \\u003cbr\\u003e- + three finger gestures\\u003cbr\\u003e\\u003cbr\\u003eand a lot of minor bug + fixes. Thank you to everyone that contributed and tested this release. We + couldn't have done it without you!\\u003cbr\\u003e\\u003cbr\\u003e\\u003ca + href=\\\"https://lists.sr.ht/~mil/sxmo-announce/%3C87y1sbw6jd.fsf%40momi.ca%3E\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003ehttps://lists.sr.ht/~mil/sxmo-announce/%3C87y1sbw6jd.fsf%40momi.ca%3E\\u003c/a\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109353009807324445\",\"username\":\"anjan\",\"acct\":\"anjan@pleroma.debian.social\",\"display_name\":\"Anjan\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-16T00:00:00.000Z\",\"note\":\"Software + Freedom Advocate. I try to be helpful. Feel free to message me! \U0001F603\\u003cbr\\u003e\\u003cbr\\u003eCo-maintainer + of sxmo: \\u003ca href=\\\"https://sxmo.org\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003ehttps://sxmo.org\\u003c/a\\u003e\\u003cbr\\u003e\\u003cbr\\u003ePosts + here are my own and not my employers'.\\u003cbr\\u003e\\u003cbr\\u003e\\u003ca + class=\\\"hashtag\\\" href=\\\"https://pleroma.debian.social/tag/nobot\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#nobot\\u003c/a\\u003e\",\"url\":\"https://pleroma.debian.social/users/anjan\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/009/807/324/445/original/336d5db9a11cc941.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/009/807/324/445/original/336d5db9a11cc941.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/353/009/807/324/445/original/d52cb1d0d3ebe928.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/353/009/807/324/445/original/d52cb1d0d3ebe928.png\",\"followers_count\":212,\"following_count\":441,\"statuses_count\":2,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"http://momi.ca\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003emomi.ca\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"XMPP\",\"value\":\"\\u003ca + href=\\\"xmpp:anjan@momi.ca\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003exmpp:anjan@momi.ca\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"IRC\",\"value\":\"anjan + on \\u003ca href=\\\"http://irc.oftc.net\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003eirc.oftc.net\\u003c/a\\u003e and \\u003ca href=\\\"http://libera.chat\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003elibera.chat\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"pronouns\",\"value\":\"he/him\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"sxmo\",\"url\":\"https://emacs.ch/tags/sxmo\"}],\"emojis\":[],\"card\":{\"url\":\"https://lists.sr.ht/~mil/sxmo-announce/%3C87y1sbw6jd.fsf@momi.ca%3E\",\"title\":\"\\n + \ Sxmo 1.12.0 released — sourcehut lists\\n\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109352998275380697\",\"created_at\":\"2022-11-16T10:25:33.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109352998244030504\",\"url\":\"https://mastodon.com.tr/@Cattie/109352998244030504\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eBi + şeye benzetcem ama aylin Allah affetsin söylemiyim bu vampirlerin içinde:d\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109352996319076311\",\"created_at\":\"2022-11-16T10:25:03.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"ja\",\"uri\":\"https://mstdn.jp/users/reddit_lisp/statuses/109352996275876253\",\"url\":\"https://mstdn.jp/@reddit_lisp/109352996275876253\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://mstdn.jp/tags/Clojure\\\" class=\\\"mention hashtag\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eClojure\\u003c/span\\u003e\\u003c/a\\u003e + London Clojurians Talk: Reveal: lessons learned (by Vlad Protsenko) | \\u003ca + href=\\\"http://redd.it/ywprwg\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eredd.it/ywprwg\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109341078211257710\",\"username\":\"reddit_lisp\",\"acct\":\"reddit_lisp@mstdn.jp\",\"display_name\":\"r/lisp\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2018-04-02T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://www.reddit.com/r/lisp\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003ereddit.com/r/lisp\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://mstdn.jp/@reddit_lisp\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/078/211/257/710/original/1e5b6080f215b1b9.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/078/211/257/710/original/1e5b6080f215b1b9.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":341,\"following_count\":1,\"statuses_count\":13893,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"clojure\",\"url\":\"https://emacs.ch/tags/clojure\"}],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109352994429310440\",\"created_at\":\"2022-11-16T10:24:35.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":true,\"spoiler_text\":\"Nonsense\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodon.art/users/welshpixie/statuses/109352994407503833\",\"url\":\"https://mastodon.art/@welshpixie/109352994407503833\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eWho + else does the armpit dance after putting antiperspirant on\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336314760996915\",\"username\":\"welshpixie\",\"acct\":\"welshpixie@mastodon.art\",\"display_name\":\"WelshPixie, + Shadow Figure\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2017-10-02T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eArt, + writing, cats. She/her. 40s. Welsh but living in South Africa. BLM, trans + rights are human rights. \\u003c/p\\u003e\\u003cp\\u003eMegalomaniac tyrranical + overlord.\\u003c/p\\u003e\\u003cp\\u003e\\u003ca href=\\\"https://mastodon.art/tags/MastoAdmin\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMastoAdmin\\u003c/span\\u003e\\u003c/a\\u003e + \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.art/@Curator\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eCurator\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\\u003c/p\\u003e\\u003cp\\u003e\\u003ca + href=\\\"https://am.pirateradio.social/channels/pixiestunes/\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"ellipsis\\\"\\u003eam.pirateradio.social/channels\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e/pixiestunes/\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003ca + href=\\\"https://bookwyrm.cincodenada.com/user/WelshPixie\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"ellipsis\\\"\\u003ebookwyrm.cincodenada.com/user/\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003eWelshPixie\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003ca + href=\\\"https://peertube.functional.cafe/a/welshpixie/video-channels\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003epeertube.functional.cafe/a/wel\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003eshpixie/video-channels\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\\u003cp\\u003eHeader + image: the bottom half of a digitally drawn white mandala on black background, + featuring themes of leaves, trees and roots extending from a central floral + motif.\\u003c/p\\u003e\",\"url\":\"https://mastodon.art/@welshpixie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/314/760/996/915/original/a3e7c5a8daa47187.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/314/760/996/915/original/a3e7c5a8daa47187.jpg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/314/760/996/915/original/04ce92ac9a56d10b.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/314/760/996/915/original/04ce92ac9a56d10b.jpg\",\"followers_count\":8416,\"following_count\":1232,\"statuses_count\":29636,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"PayPal\",\"value\":\"\\u003ca + href=\\\"https://paypal.me/delsdoodles\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003epaypal.me/delsdoodles\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"http://delsdoodles.com\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003edelsdoodles.com\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"KoFi\",\"value\":\"\\u003ca + href=\\\"https://ko-fi.com/welshpixie\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eko-fi.com/welshpixie\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Book\",\"value\":\"\\u003ca + href=\\\"http://welshpixie.rocks/warden-a-gay-fantasy-romance-novella/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ewelshpixie.rocks/warden-a-gay-\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003efantasy-romance-novella/\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109352994219105523\",\"created_at\":\"2022-11-16T10:24:30.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://macaw.social/users/andypiper/statuses/109352994127186763\",\"url\":\"https://macaw.social/@andypiper/109352994127186763\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eMy + chat with \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.social/@g0g0gadget\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eg0g0gadget\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e + about \\u003ca href=\\\"https://macaw.social/tags/MicroPython\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMicroPython\\u003c/span\\u003e\\u003c/a\\u003e + is available to rewatch on YouTube \U0001F4FA \\u003ca href=\\\"https://youtu.be/G7_PKvbjQBI\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003eyoutu.be/G7_PKvbjQBI\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349611119683177\",\"username\":\"andypiper\",\"acct\":\"andypiper@macaw.social\",\"display_name\":\"Andy + Piper\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-12T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eTech + speaker, developer advocate \\u003ca href=\\\"https://macaw.social/tags/DevRel\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDevRel\\u003c/span\\u003e\\u003c/a\\u003e, + supporter, communities person. I do things with code, and tinker with gadgets + \\u003ca href=\\\"https://macaw.social/tags/MicroPython\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMicroPython\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://macaw.social/tags/MQTT\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMQTT\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://macaw.social/tags/LEGO\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLEGO\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://macaw.social/tags/BoardGames\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eBoardGames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://macaw.social/tags/DoctorWho\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDoctorWho\\u003c/span\\u003e\\u003c/a\\u003e + … and I am one-third of a weekly \\u003ca href=\\\"https://macaw.social/tags/podcast\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003epodcast\\u003c/span\\u003e\\u003c/a\\u003e + \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://botsin.space/@gamesatwork_biz\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003egamesatwork_biz\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\\u003c/p\\u003e\",\"url\":\"https://macaw.social/@andypiper\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/611/119/683/177/original/07bee7b05b811f4f.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/611/119/683/177/original/07bee7b05b811f4f.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/611/119/683/177/original/3d3f5b86eabd614c.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/611/119/683/177/original/3d3f5b86eabd614c.png\",\"followers_count\":1220,\"following_count\":962,\"statuses_count\":28,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"\U0001F5FA️ + links\",\"value\":\"\\u003ca href=\\\"https://andypiper.me\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eandypiper.me\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-15T20:22:57.804+00:00\"},{\"name\":\"\U0001F3A7 + podcast\",\"value\":\"\\u003ca href=\\\"https://gamesatwork.biz\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003egamesatwork.biz\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-15T20:22:58.697+00:00\"},{\"name\":\"\U0001F9D1\U0001F3FC‍\U0001F4BB + code\",\"value\":\"\\u003ca href=\\\"https://github.com/andypiper\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003egithub.com/andypiper\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-15T20:22:58.852+00:00\"},{\"name\":\"\U0001F464 + pronouns\",\"value\":\"he/they/them\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[{\"id\":\"109348581755492870\",\"username\":\"g0g0gadget\",\"url\":\"https://mastodon.social/@g0g0gadget\",\"acct\":\"g0g0gadget@mastodon.social\"}],\"tags\":[{\"name\":\"micropython\",\"url\":\"https://emacs.ch/tags/micropython\"}],\"emojis\":[],\"card\":{\"url\":\"https://www.youtube.com/watch?v=G7_PKvbjQBI\\u0026feature=youtu.be\",\"title\":\"MicroPython + with Andy Piper\",\"description\":\"\",\"type\":\"video\",\"author_name\":\"Laura + Langdon\",\"author_url\":\"https://www.youtube.com/channel/UCYj25iGXK0R3Nvqy2vS4P-Q\",\"provider_name\":\"YouTube\",\"provider_url\":\"https://www.youtube.com/\",\"html\":\"\\u003ciframe + width=\\\"200\\\" height=\\\"113\\\" src=\\\"https://www.youtube.com/embed/G7_PKvbjQBI?feature=oembed\\\" + frameborder=\\\"0\\\" allowfullscreen=\\\"\\\" title=\\\"MicroPython with + Andy Piper\\\"\\u003e\\u003c/iframe\\u003e\",\"width\":200,\"height\":113,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/780/original/3e5e8f64f5818205.jpg\",\"embed_url\":\"\",\"blurhash\":\"UGH:EdDPbcog^SkBoykB01-;aKV@xtofWBof\"},\"poll\":null},{\"id\":\"109352992915764141\",\"created_at\":\"2022-11-16T10:24:11.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109352992883343492\",\"url\":\"https://mastodon.com.tr/@Cattie/109352992883343492\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eYok + ama Yürümeyin Cumhuriyet Halk Partisi bey\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":940,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109352990196607705\",\"created_at\":\"2022-11-16T10:23:29.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"de\",\"uri\":\"https://social.bund.de/users/GRS/statuses/109352990098950354\",\"url\":\"https://social.bund.de/@GRS/109352990098950354\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eDie + ukrainische Aufsichtsbehörde SNRIU meldete der IAEA heute Morgen, dass das + \\u003ca href=\\\"https://social.bund.de/tags/KKW\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eKKW\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://social.bund.de/tags/Chmelnyzkyj\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eChmelnyzkyj\\u003c/span\\u003e\\u003c/a\\u003e + die Anbindung zum ukrainischen Landesnetz gestern Nachmittag, am 15.11. um + 18:35 Uhr OZ, verloren hat, nachdem das Landesnetz infolge russischen Beschusses + beschädigt wurde. Die beiden WWER-1000-Blöcke am \\u003ca href=\\\"https://social.bund.de/tags/AKW\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eAKW\\u003c/span\\u003e\\u003c/a\\u003e-Standort, + die zu dem Zeitpunkt auf Volllast liefen, würden laut Meldung zurzeit über + die \\u003ca href=\\\"https://social.bund.de/tags/Notstromdiesel\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eNotstromdiesel\\u003c/span\\u003e\\u003c/a\\u003e + versorgt. Weitere Infos: \\u003ca href=\\\"https://t1p.de/r0qyv\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003et1p.de/r0qyv\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348145087710860\",\"username\":\"GRS\",\"acct\":\"GRS@social.bund.de\",\"display_name\":\"GRS\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-15T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eForschung + \\u0026amp; Begutachtung zu (fast) allem, was strahlt: \\u003cbr\\u003eAKW-Sicherheit + I Strahlenschutz I Stilllegung I Zwischen- \\u0026amp; Endlagerung I \\u003cbr\\u003eUmwelt + \\u0026amp; Energie – non-profit \\u003c/p\\u003e\\u003cp\\u003ewww.grs.de\\u003c/p\\u003e\",\"url\":\"https://social.bund.de/@GRS\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/145/087/710/860/original/4bc77dbca1cc8515.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/145/087/710/860/original/4bc77dbca1cc8515.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/348/145/087/710/860/original/84eea50bf293dc95.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/348/145/087/710/860/original/84eea50bf293dc95.jpg\",\"followers_count\":272,\"following_count\":0,\"statuses_count\":7,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[{\"id\":\"109352990148282989\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/352/990/148/282/989/original/fbb1a98b633bfee3.jpeg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/352/990/148/282/989/small/fbb1a98b633bfee3.jpeg\",\"remote_url\":\"https://social.bund.de/system/media_attachments/files/109/352/989/816/841/132/original/2fe7714b6cfab492.jpeg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1766,\"height\":1174,\"size\":\"1766x1174\",\"aspect\":1.504258943781942},\"small\":{\"width\":588,\"height\":391,\"size\":\"588x391\",\"aspect\":1.5038363171355498}},\"description\":null,\"blurhash\":\"UqE|C}%LRjf+.TxtRkWCR-axa#RjIUWXoffk\"}],\"mentions\":[],\"tags\":[{\"name\":\"kkw\",\"url\":\"https://emacs.ch/tags/kkw\"},{\"name\":\"chmelnyzkyj\",\"url\":\"https://emacs.ch/tags/chmelnyzkyj\"},{\"name\":\"akw\",\"url\":\"https://emacs.ch/tags/akw\"},{\"name\":\"notstromdiesel\",\"url\":\"https://emacs.ch/tags/notstromdiesel\"}],\"emojis\":[],\"card\":null,\"poll\":null}]" + recorded_at: 2022-11-16 10:32:31 GMT + recorded_with: vcr/1.1.0, webmockr/0.8.2 diff --git a/tests/fixtures/process_request_equal1.yml b/tests/fixtures/process_request_equal1.yml new file mode 100644 index 0000000..9eb50f1 --- /dev/null +++ b/tests/fixtures/process_request_equal1.yml @@ -0,0 +1,382 @@ +http_interactions: +- request: + method: get + uri: https://emacs.ch/api/v1/timelines/public?local=FALSE&remote=FALSE&only_media=FALSE&limit=20 + body: + encoding: '' + string: '' + headers: + Accept: application/json, text/xml, application/xml, */* + Authorization: Bearer <<>> + response: + status: + status_code: 200 + category: Success + reason: OK + message: 'Success: (200) OK' + headers: + cache-control: no-store + content-encoding: gzip + content-security-policy: 'base-uri ''none''; default-src ''none''; frame-ancestors + ''none''; font-src ''self'' https://emacs.ch; img-src ''self'' https: data: + blob: https://emacs.ch; style-src ''self'' https://emacs.ch ''nonce-cScua05kSqyrI6gIVJAb2g==''; + media-src ''self'' https: data: https://emacs.ch; frame-src ''self'' https:; + manifest-src ''self'' https://emacs.ch; connect-src ''self'' data: blob: https://emacs.ch + https://emacs.ch wss://emacs.ch; script-src ''self'' https://emacs.ch ''wasm-unsafe-eval''; + child-src ''self'' blob: https://emacs.ch; worker-src ''self'' blob: https://emacs.ch' + content-type: application/json; charset=utf-8 + date: Wed, 16 Nov 2022 10:38:30 GMT + etag: W/"9b0211d06d4478159a17c0baa746fb9d" + link: ; + rel="next", ; + rel="prev" + permissions-policy: interest-cohort=() + server: Mastodon + strict-transport-security: max-age=63072000; includeSubDomains + vary: + - Accept-Encoding + - Origin + x-cached: MISS + x-content-type-options: nosniff + x-frame-options: DENY + x-ratelimit-limit: '300' + x-ratelimit-remaining: '296' + x-ratelimit-reset: '2022-11-16T10:40:00.590432Z' + x-request-id: 8f292b4e-6851-4b7f-84aa-7fae18a44753 + x-runtime: '0.159546' + x-xss-protection: '0' + body: + encoding: '' + file: no + string: "[{\"id\":\"109353046884731607\",\"created_at\":\"2022-11-16T10:37:32.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodon.social/users/Gargron/statuses/109353045373308291\",\"url\":\"https://mastodon.social/@Gargron/109353045373308291\",\"replies_count\":1,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eThis + arrived \\u003ca href=\\\"https://mastodon.social/tags/Lightwork\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLightwork\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109327452733932721\",\"username\":\"Gargron\",\"acct\":\"Gargron@mastodon.social\",\"display_name\":\"Eugen + \U0001F480\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2016-03-16T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eFounder, + CEO and lead developer \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.social/@Mastodon\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eMastodon\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e, + Germany.\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@Gargron\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/327/452/733/932/721/original/668273d591a86f91.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/327/452/733/932/721/original/668273d591a86f91.jpg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/327/452/733/932/721/original/62e414675da3a94b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/327/452/733/932/721/original/62e414675da3a94b.jpeg\",\"followers_count\":209100,\"following_count\":320,\"statuses_count\":72722,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Patreon\",\"value\":\"\\u003ca + href=\\\"https://www.patreon.com/mastodon\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003epatreon.com/mastodon\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353045597548813\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/045/597/548/813/original/8527579bb8795aba.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/045/597/548/813/small/8527579bb8795aba.jpg\",\"remote_url\":\"https://files.mastodon.social/media_attachments/files/109/353/035/234/108/067/original/233a2077f5ee23df.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1536,\"height\":1150,\"size\":\"1536x1150\",\"aspect\":1.3356521739130436},\"small\":{\"width\":554,\"height\":415,\"size\":\"554x415\",\"aspect\":1.3349397590361445}},\"description\":\"Devin + Townsend’s Lightwork LP with signed card\",\"blurhash\":\"UVIXa9~V8wMxR+t7RkM{8_Mx%MxuoLRjjYoe\"},{\"id\":\"109353046068842872\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/046/068/842/872/original/55e1e230a13da792.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/046/068/842/872/small/55e1e230a13da792.jpg\",\"remote_url\":\"https://files.mastodon.social/media_attachments/files/109/353/035/399/115/058/original/9e90a16a453b405f.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1536,\"height\":1152,\"size\":\"1536x1152\",\"aspect\":1.3333333333333333},\"small\":{\"width\":554,\"height\":416,\"size\":\"554x416\",\"aspect\":1.3317307692307692}},\"description\":\"Devin + Townsend’s Lightwork LP (transparent blue) in record player\",\"blurhash\":\"UqGSJpS5VsRP~oWBRjWB-Un$bcozkDogj@js\"}],\"mentions\":[],\"tags\":[{\"name\":\"lightwork\",\"url\":\"https://emacs.ch/tags/lightwork\"}],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353038313293074\",\"created_at\":\"2022-11-16T10:35:44.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodon.social/users/jelu/statuses/109353038275386342\",\"url\":\"https://mastodon.social/@jelu/109353038275386342\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://mastodon.social/tags/ripeatlas\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eripeatlas\\u003c/span\\u003e\\u003c/a\\u003e + (\\u003ca href=\\\"https://mastodon.social/tags/go\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ego\\u003c/span\\u003e\\u003c/a\\u003e + bindings) v0.1.1 released!\\u003cbr\\u003e- `traceroute/reply`: Fix `Err()`: + return empty string if `Err` is not a `string`\\u003cbr\\u003e^JL\\u003cbr\\u003e\\u003ca + href=\\\"https://mastodon.social/tags/DNS\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDNS\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Ping\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePing\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Traceroute\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eTraceroute\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/HTTP\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eHTTP\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Measurements\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMeasurements\\u003c/span\\u003e\\u003c/a\\u003e + by RIPE Atlas \\u003ca href=\\\"https://mastodon.social/tags/OpenSource\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eOpenSource\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003ca + href=\\\"https://github.com/DNS-OARC/ripeatlas/releases/tag/v0.1.1\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"ellipsis\\\"\\u003egithub.com/DNS-OARC/ripeatlas/\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ereleases/tag/v0.1.1\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348131931956742\",\"username\":\"jelu\",\"acct\":\"jelu@mastodon.social\",\"display_name\":\"Jerry + Lundström\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-10-29T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCoding + / Gaming / Music / Beer!\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@jelu\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/131/931/956/742/original/ba6603a51038370a.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/131/931/956/742/original/ba6603a51038370a.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/348/131/931/956/742/original/00e007110ecf0072.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/348/131/931/956/742/original/00e007110ecf0072.jpg\",\"followers_count\":27,\"following_count\":43,\"statuses_count\":11,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"ripeatlas\",\"url\":\"https://emacs.ch/tags/ripeatlas\"},{\"name\":\"go\",\"url\":\"https://emacs.ch/tags/go\"},{\"name\":\"dns\",\"url\":\"https://emacs.ch/tags/dns\"},{\"name\":\"ping\",\"url\":\"https://emacs.ch/tags/ping\"},{\"name\":\"traceroute\",\"url\":\"https://emacs.ch/tags/traceroute\"},{\"name\":\"http\",\"url\":\"https://emacs.ch/tags/http\"},{\"name\":\"measurements\",\"url\":\"https://emacs.ch/tags/measurements\"},{\"name\":\"opensource\",\"url\":\"https://emacs.ch/tags/opensource\"}],\"emojis\":[],\"card\":{\"url\":\"https://github.com/DNS-OARC/ripeatlas/releases/tag/v0.1.1\",\"title\":\"Release + Release 0.1.1 · DNS-OARC/ripeatlas\",\"description\":\"traceroute/reply: Fix + #28: Err(): return empty string if Err is not a string\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"GitHub\",\"provider_url\":\"\",\"html\":\"\",\"width\":400,\"height\":200,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/809/original/0b95004250379cf4.png\",\"embed_url\":\"\",\"blurhash\":\"UNSF^dbEM{t7-ToyWBt6EgWCf6R*~VWCt7Rj\"},\"poll\":null},{\"id\":\"109353035142068366\",\"created_at\":\"2022-11-16T10:34:55.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353035098734150\",\"url\":\"https://mastodon.com.tr/@Cattie/109353035098734150\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHerkesin + seçimi üslubu sevdiği sevmediği güldüğü gülmediği farklı cehepe bey biz buna + çeşitlilik diyoruz\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353033475454529\",\"created_at\":\"2022-11-16T10:10:32.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"de\",\"uri\":\"https://squeet.me/objects/962c3e10-ae34314d-0ac480194faada7b\",\"url\":\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"Die + Corona-Infektionszahlen sind in China so hoch wie seit April nicht mehr. Aber + die Regierung hat jüngst Lockerungen angekündigt. Nach Jahren der Null-Covid-Politik + sorgt das für Unsicherheit. Von Eva Lamby-Schmitt. \\u003cbr\\u003e\\u003ca + href=\\\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003eCoronavirus + in China: Lockerungen verunsichern Bevölkerung\\u003c/a\\u003e\\u003cbr\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109325413942496685\",\"username\":\"tagesschau\",\"acct\":\"tagesschau@squeet.me\",\"display_name\":\"Tagesschau + (inoffiziell)\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-11T00:00:00.000Z\",\"note\":\"Dies + ist ein Bot, der den RSS-Feed der Tagesschau zur Verfügung stellt. Er wird + nicht von der Tagesschau betrieben. Rückfragen bitte an heluecht@pirati.ca\",\"url\":\"https://squeet.me/profile/tagesschau\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/325/413/942/496/685/original/7b630c66f86595c1.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/325/413/942/496/685/original/7b630c66f86595c1.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":36448,\"following_count\":0,\"statuses_count\":13223,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":{\"url\":\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\",\"title\":\"Coronavirus + in China: Lockerungen verunsichern Bevölkerung\",\"description\":\"Die Corona-Infektionszahlen + sind in China so hoch wie seit April nicht mehr. Aber die Regierung hat jüngst + Lockerungen angekündigt. Nach Jahren der Null-Covid-Politik sorgt das für + Unsicherheit. \\u003cem\\u003eVon Eva Lamby-Schmitt.\\u003c/em\\u003e\",\"type\":\"link\",\"author_name\":\"tagesschau\",\"author_url\":\"\",\"provider_name\":\"tagesschau.de\",\"provider_url\":\"\",\"html\":\"\",\"width\":400,\"height\":225,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/808/original/1a903ba9cb61f062.jpg\",\"embed_url\":\"\",\"blurhash\":\"UOKwOa01xa-oR4xuM{R*-;t7xtM|WBM|NGt7\"},\"poll\":null},{\"id\":\"109353033468623404\",\"created_at\":\"2022-11-16T10:34:26.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://botsin.space/users/owncast/statuses/109353033182428590\",\"url\":\"https://botsin.space/@owncast/109353033182428590\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eRP + S3 has just started streaming on their \\u003ca href=\\\"https://botsin.space/tags/owncast\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e + server! Check them out at:\\u003cbr\\u003e\\u003ca href=\\\"http://s3.ro-players.de:8181\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003es3.ro-players.de:8181\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e. \\u003c/p\\u003e\\u003cp\\u003eEvent + mit Creative Commons Musik. Mapping, Gaming.\\u003c/p\\u003e\\u003cp\\u003e\\u003ca + href=\\\"https://botsin.space/tags/videogames\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003evideogames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/music\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emusic\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/tech\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003etech\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/streaming\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003estreaming\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/owncast\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/classic\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eclassic\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/games\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/techno\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003etechno\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/Gaming\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eGaming\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/radio\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eradio\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/video\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003evideo\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/event\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eevent\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/creativecommons\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ecreativecommons\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/mapping\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emapping\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/game\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egame\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/musik\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emusik\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/spiele\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003espiele\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/gta\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egta\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/fivem\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003efivem\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/rp\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003erp\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/halflife2\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ehalflife2\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/ccradio\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eccradio\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/cc\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ecc\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/oldgames\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eoldgames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/classicgames\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eclassicgames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/VideoGame\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eVideoGame\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109324881524464671\",\"username\":\"owncast\",\"acct\":\"owncast@botsin.space\",\"display_name\":\"Owncast\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2020-12-13T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eThe + self-hosted live streaming solution.\\u003cbr\\u003e\\u003ca href=\\\"https://owncast.online\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003eowncast.online\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\\u003cp\\u003eThis + is an unattended bot account. See \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca + href=\\\"https://fosstodon.org/@owncast\\\" class=\\\"u-url mention\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e + for the project's fediverse account.\\u003c/p\\u003e\\u003cp\\u003eThe sharing + of a public Owncast server instance does not imply endorsement or support + of its content.\\u003c/p\\u003e\",\"url\":\"https://botsin.space/@owncast\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/324/881/524/464/671/original/3cb7a427c625c5e8.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/324/881/524/464/671/original/3cb7a427c625c5e8.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/324/881/524/464/671/original/7474552dcfe993ae.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/324/881/524/464/671/original/7474552dcfe993ae.png\",\"followers_count\":553,\"following_count\":2,\"statuses_count\":6578,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Github\",\"value\":\"\\u003ca + href=\\\"https://github.com/owncast/owncast\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003egithub.com/owncast/owncast\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"The + Directory\",\"value\":\"\\u003ca href=\\\"https://directory.owncast.online\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003edirectory.owncast.online\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Documentation\",\"value\":\"\\u003ca + href=\\\"https://owncast.online\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eowncast.online\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353033427359443\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/033/427/359/443/original/4eeff8ab4f23a1cc.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/033/427/359/443/small/4eeff8ab4f23a1cc.jpg\",\"remote_url\":\"https://files.botsin.space/media_attachments/files/109/353/033/170/246/817/original/faf6cd64d4509382.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1200,\"height\":720,\"size\":\"1200x720\",\"aspect\":1.6666666666666667},\"small\":{\"width\":620,\"height\":372,\"size\":\"620x372\",\"aspect\":1.6666666666666667}},\"description\":null,\"blurhash\":\"UREyiY?W-=xcNBN5ITM{_2RjRkxW_4actPog\"}],\"mentions\":[],\"tags\":[{\"name\":\"owncast\",\"url\":\"https://emacs.ch/tags/owncast\"},{\"name\":\"videogames\",\"url\":\"https://emacs.ch/tags/videogames\"},{\"name\":\"music\",\"url\":\"https://emacs.ch/tags/music\"},{\"name\":\"tech\",\"url\":\"https://emacs.ch/tags/tech\"},{\"name\":\"streaming\",\"url\":\"https://emacs.ch/tags/streaming\"},{\"name\":\"classic\",\"url\":\"https://emacs.ch/tags/classic\"},{\"name\":\"games\",\"url\":\"https://emacs.ch/tags/games\"},{\"name\":\"techno\",\"url\":\"https://emacs.ch/tags/techno\"},{\"name\":\"gaming\",\"url\":\"https://emacs.ch/tags/gaming\"},{\"name\":\"radio\",\"url\":\"https://emacs.ch/tags/radio\"},{\"name\":\"video\",\"url\":\"https://emacs.ch/tags/video\"},{\"name\":\"event\",\"url\":\"https://emacs.ch/tags/event\"},{\"name\":\"creativecommons\",\"url\":\"https://emacs.ch/tags/creativecommons\"},{\"name\":\"mapping\",\"url\":\"https://emacs.ch/tags/mapping\"},{\"name\":\"game\",\"url\":\"https://emacs.ch/tags/game\"},{\"name\":\"musik\",\"url\":\"https://emacs.ch/tags/musik\"},{\"name\":\"spiele\",\"url\":\"https://emacs.ch/tags/spiele\"},{\"name\":\"gta\",\"url\":\"https://emacs.ch/tags/gta\"},{\"name\":\"fivem\",\"url\":\"https://emacs.ch/tags/fivem\"},{\"name\":\"rp\",\"url\":\"https://emacs.ch/tags/rp\"},{\"name\":\"halflife2\",\"url\":\"https://emacs.ch/tags/halflife2\"},{\"name\":\"ccradio\",\"url\":\"https://emacs.ch/tags/ccradio\"},{\"name\":\"cc\",\"url\":\"https://emacs.ch/tags/cc\"},{\"name\":\"oldgames\",\"url\":\"https://emacs.ch/tags/oldgames\"},{\"name\":\"classicgames\",\"url\":\"https://emacs.ch/tags/classicgames\"},{\"name\":\"videogame\",\"url\":\"https://emacs.ch/tags/videogame\"}],\"emojis\":[],\"card\":{\"url\":\"http://s3.ro-players.de/\",\"title\":\"RP + S3\",\"description\":\"Event mit Creative Commons Musik. Mapping, Gaming.\",\"type\":\"video\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"RP + S3\",\"provider_url\":\"\",\"html\":\"\\u003ciframe src=\\\"http://s3.ro-players.de/embed/video\\\" + width=\\\"560\\\" height=\\\"315\\\" allowtransparency=\\\"true\\\" scrolling=\\\"no\\\" + frameborder=\\\"0\\\"\\u003e\\u003c/iframe\\u003e\",\"width\":560,\"height\":315,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353033317890847\",\"created_at\":\"2022-11-16T10:34:27.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://octodon.social/users/kensanata/statuses/109353033232345716\",\"url\":\"https://octodon.social/@kensanata/109353033232345716\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eRead + like nobody is tracking, toot like nobody is listening. \U0001F973​\U0001F3BA​\U0001F4A8\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336764765459931\",\"username\":\"kensanata\",\"acct\":\"kensanata@octodon.social\",\"display_name\":\"Alex + Schroeder\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2017-04-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://octodon.social/tags/Biology\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eBiology\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Plants\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePlants\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Birds\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eBirds\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Photography\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePhotography\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Switzerland\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSwitzerland\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Emacs\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eEmacs\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Wiki\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eWiki\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Gemini\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eGemini\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Programming\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eProgramming\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Tea\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eTea\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Drawing\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDrawing\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Music\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMusic\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003cspan + class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://tabletop.social/@kensanata\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003ekensanata\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e + is my RPG alt.\\u003cbr\\u003eLanguages: gsw de en fr pt.\\u003cbr\\u003eMy + toots expire. He/him.\\u003c/p\\u003e\",\"url\":\"https://octodon.social/@kensanata\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/764/765/459/931/original/e17aaa9449bfb012.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/764/765/459/931/original/e17aaa9449bfb012.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/764/765/459/931/original/0a4e9e13fae0c699.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/764/765/459/931/original/0a4e9e13fae0c699.jpg\",\"followers_count\":727,\"following_count\":440,\"statuses_count\":4837,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Blog\",\"value\":\"\\u003cspan + class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://botsin.space/@alexschroeder\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003ealexschroeder@botsin.space\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\",\"verified_at\":null},{\"name\":\"Contact\",\"value\":\"\\u003ca + href=\\\"https://alexschroeder.ch/wiki/Contact\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003ealexschroeder.ch/wiki/Contact\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"OpenPGP\",\"value\":\"DF9446EB7B7846387CCC018BC78CA29BACECFEAE\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353028671710573\",\"created_at\":\"2022-11-16T10:33:13.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://botsin.space/users/bitartbot/statuses/109353028384437104\",\"url\":\"https://botsin.space/@bitartbot/109353028384437104\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003ef(x,y) + = (~(((y * y) * (x + y)) | ((-x) + (-x)))) % 5\\u003c/p\\u003e\\u003cp\\u003eExtent: + 256x256 (scaled x2)\\u003c/p\\u003e\\u003cp\\u003e\\\"Onebit\\\" colouring + scheme.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109341048737344890\",\"username\":\"bitartbot\",\"acct\":\"bitartbot@botsin.space\",\"display_name\":\"Bit + Art Bot\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2021-08-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eThis + is a bot which produces procedural art by plotting an integer function taking + the current coordinates and producing an integer result. The function is + procedurally created using random numbers and appears in the status text.\\u003c/p\\u003e\\u003cp\\u003eCoordinates + are coloured either by where the value appears within the range of results + (the \\\"gradient\\\" scheme) or simply by whether it is the most common result + (white) or not (black) (the \\\"onebit\\\" scheme.)\\u003c/p\\u003e\\u003cp\\u003eThe + code does not resort to evaluating a string.\\u003c/p\\u003e\",\"url\":\"https://botsin.space/@bitartbot\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/048/737/344/890/original/fc6c3eadaf0c53e6.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/048/737/344/890/original/fc6c3eadaf0c53e6.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/341/048/737/344/890/original/9715f84636333583.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/341/048/737/344/890/original/9715f84636333583.png\",\"followers_count\":786,\"following_count\":0,\"statuses_count\":9129,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Made + by\",\"value\":\"\\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.technology/@suetanvil\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003esuetanvil@mastodon.technology\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\",\"verified_at\":null},{\"name\":\"Inspiration:\",\"value\":\"\\u003ca + href=\\\"https://www.metafilter.com/192164/Patterns\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003emetafilter.com/192164/Patterns\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Renderer + sources:\",\"value\":\"\\u003ca href=\\\"https://gitlab.com/suetanvil/bitart\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003egitlab.com/suetanvil/bitart\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353028630468414\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/028/630/468/414/original/f7a22e45f8c27067.png\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/028/630/468/414/small/f7a22e45f8c27067.png\",\"remote_url\":\"https://files.botsin.space/media_attachments/files/109/353/028/359/748/116/original/31934c7efdd9edd4.png\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":512,\"height\":512,\"size\":\"512x512\",\"aspect\":1.0},\"small\":{\"width\":480,\"height\":480,\"size\":\"480x480\",\"aspect\":1.0}},\"description\":null,\"blurhash\":\"U2P6~x004n4nt7RjofayayRjoft7ofayayay\"}],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353028503027694\",\"created_at\":\"2022-11-16T10:33:15.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"de\",\"uri\":\"https://mastodon.social/users/NoNameCharakter/statuses/109353028505126280\",\"url\":\"https://mastodon.social/@NoNameCharakter/109353028505126280\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHaben + wir uns hier denn nun alle langsam wieder gegenseitig eingesammelt?\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349642500652857\",\"username\":\"NoNameCharakter\",\"acct\":\"NoNameCharakter@mastodon.social\",\"display_name\":\"NPC\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-04-14T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eGeowissenschaftler + und Völkerrechtler.\\u003c/p\\u003e\\u003cp\\u003e\\u003ca href=\\\"https://mastodon.social/tags/Redakteur\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eRedakteur\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/SensitivityReader\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSensitivityReader\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/Jewish\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eJewish\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/Vegan\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eVegan\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/StoppAntisemitism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eStoppAntisemitism\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/SayNoToRacism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSayNoToRacism\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/NoSexism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eNoSexism\\u003c/span\\u003e\\u003c/a\\u003e, + ☝️ \\u003ca href=\\\"https://mastodon.social/tags/SayYesToHumor\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSayYesToHumor\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@NoNameCharakter\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/642/500/652/857/original/8f86e27d74367fed.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/642/500/652/857/original/8f86e27d74367fed.jpg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/642/500/652/857/original/6164cfbbb8d3b598.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/642/500/652/857/original/6164cfbbb8d3b598.jpg\",\"followers_count\":604,\"following_count\":536,\"statuses_count\":218,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026914655726\",\"created_at\":\"2022-11-16T10:32:50.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353026886721792\",\"url\":\"https://mastodon.com.tr/@Cattie/109353026886721792\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eDhjshlxl\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026425504315\",\"created_at\":\"2022-11-16T10:32:40.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodonapp.uk/users/historydefined/statuses/109353026238409546\",\"url\":\"https://mastodonapp.uk/@historydefined/109353026238409546\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eA + Peruvian woman and her baby in the Andes, 1930s.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336620553894480\",\"username\":\"historydefined\",\"acct\":\"historydefined@mastodonapp.uk\",\"display_name\":\"History + Defined\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eLearn + Weird Things About History\\u003c/p\\u003e\",\"url\":\"https://mastodonapp.uk/@historydefined\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"followers_count\":3337,\"following_count\":1,\"statuses_count\":428,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[{\"id\":\"109353026403117432\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/026/403/117/432/original/dc2facfb822ca472.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/026/403/117/432/small/dc2facfb822ca472.jpg\",\"remote_url\":\"https://files.mastodonapp.uk/media_attachments/files/109/353/026/117/105/293/original/7de9ddf27e0ea650.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":594,\"height\":594,\"size\":\"594x594\",\"aspect\":1.0},\"small\":{\"width\":480,\"height\":480,\"size\":\"480x480\",\"aspect\":1.0}},\"description\":null,\"blurhash\":\"UoHx$$-;j[ay~qt7ofay%MRjayj[t7WBj[fQ\"}],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026024817513\",\"created_at\":\"2022-11-16T10:32:35.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodonapp.uk/users/historydefined/statuses/109353025880748267\",\"url\":\"https://mastodonapp.uk/@historydefined/109353025880748267\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHow + the UK tried to use rats as a weapon during WW2 \\u003ca href=\\\"https://www.youtube.com/watch?v=NXLgUQDV-pw\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003eyoutube.com/watch?v=NXLgUQDV-p\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ew\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336620553894480\",\"username\":\"historydefined\",\"acct\":\"historydefined@mastodonapp.uk\",\"display_name\":\"History + Defined\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eLearn + Weird Things About History\\u003c/p\\u003e\",\"url\":\"https://mastodonapp.uk/@historydefined\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"followers_count\":3337,\"following_count\":1,\"statuses_count\":428,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":{\"url\":\"https://www.youtube.com/watch?v=NXLgUQDV-pw\",\"title\":\"How + the UK tried to use rats as a weapon during WW2\",\"description\":\"\",\"type\":\"video\",\"author_name\":\"History + Defined\",\"author_url\":\"https://www.youtube.com/channel/UCeTZhWcGeZYeMNMMPRyB1gA\",\"provider_name\":\"YouTube\",\"provider_url\":\"https://www.youtube.com/\",\"html\":\"\\u003ciframe + width=\\\"200\\\" height=\\\"113\\\" src=\\\"https://www.youtube.com/embed/NXLgUQDV-pw?feature=oembed\\\" + frameborder=\\\"0\\\" allowfullscreen=\\\"\\\" title=\\\"How the UK tried + to use rats as a weapon during WW2\\\"\\u003e\\u003c/iframe\\u003e\",\"width\":200,\"height\":113,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/806/original/3e027b06ce9fea9c.jpg\",\"embed_url\":\"\",\"blurhash\":\"UKD,4G9F%Mof%7IUjuofxmt7IUj[9F%MRjWB\"},\"poll\":null},{\"id\":\"109353023823324523\",\"created_at\":\"2022-11-16T10:32:03.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353023773983022\",\"url\":\"https://mastodon.com.tr/@Cattie/109353023773983022\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eBen + reise vercem arkadaşlar\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353022096915396\",\"created_at\":\"2022-11-16T10:31:37.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://pony.social/users/astrosnail/statuses/109353022101653957\",\"url\":\"https://pony.social/@astrosnail/109353022101653957\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003ei'm + upset that the toot button got changed to publish\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109353037645854694\",\"username\":\"astrosnail\",\"acct\":\"astrosnail@pony.social\",\"display_name\":\"erry\",\"locked\":true,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-01-28T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eEnby, + clueless and confused, trying to make more friends than is healthy for it.\\u003cbr\\u003eNot + aroace but it's weird and hard to describe.\\u003cbr\\u003eLearning about + accessibility, listening to music, longing for a change of body.\\u003cbr\\u003eCan + go on about maths all day.\\u003cbr\\u003eSend follow req.\\u003cbr\\u003eI + like to think aloud when nobody's listening.\\u003c/p\\u003e\",\"url\":\"https://pony.social/@astrosnail\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/037/645/854/694/original/cfb607af4399bd38.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/037/645/854/694/original/cfb607af4399bd38.jpg\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":21,\"following_count\":49,\"statuses_count\":247,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Pronouns\",\"value\":\"it/its\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353021919374795\",\"created_at\":\"2022-11-16T10:30:46.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018779322431\",\"url\":\"https://pokemon.men/@archlinux/109353018779322431\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt5 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt5/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\",\"title\":\"Arch + Linux - qgnomeplatform-qt5 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353021428178619\",\"created_at\":\"2022-11-16T10:30:45.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018665849499\",\"url\":\"https://pokemon.men/@archlinux/109353018665849499\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt6 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt6/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\",\"title\":\"Arch + Linux - qgnomeplatform-qt6 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353020672877916\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018578118374\",\"url\":\"https://pokemon.men/@archlinux/109353018578118374\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + Not understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" + \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281325\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281325\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281325\",\"title\":\"Not + understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" / + Applications \\u0026 Desktop Environments / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353019972431282\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018542942008\",\"url\":\"https://pokemon.men/@archlinux/109353018542942008\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qt6ct 0.7-2 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qt6ct/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qt6ct/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qt6ct/\",\"title\":\"Arch + Linux - qt6ct 0.7-2 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353018792568399\",\"created_at\":\"2022-11-16T10:30:42.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018487959678\",\"url\":\"https://pokemon.men/@archlinux/109353018487959678\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + SwayIDLE not working when i close my thinkpad \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281326\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281326\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281326\",\"title\":\"SwayIDLE + not working when i close my thinkpad / Applications \\u0026 Desktop Environments + / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353017283269023\",\"created_at\":\"2022-11-16T10:30:17.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://social.treehouse.systems/users/ariadne/statuses/109353016854603277\",\"url\":\"https://social.treehouse.systems/@ariadne/109353016854603277\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eanyway, + as i was saying, if you are going to buy into forms of digital casteism such + as fedified, we're not likely to be friends.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109342791058708572\",\"username\":\"ariadne\",\"acct\":\"ariadne@treehouse.systems\",\"display_name\":\"Ariadne + Conill \U0001F430\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-04-05T00:00:00.000Z\",\"note\":\"\\u003cp\\u003erabbit + enthusiast, principal software engineer, dreamer of dreams, maker of cool + shit\\u003c/p\\u003e\",\"url\":\"https://social.treehouse.systems/@ariadne\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"followers_count\":2150,\"following_count\":650,\"statuses_count\":4213,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"https://ariadne.space\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eariadne.space\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-16T08:26:11.676+00:00\"}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353016542495914\",\"created_at\":\"2022-11-16T10:30:12.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://fosstodon.org/users/RandomizeHandles/statuses/109353016504673479\",\"url\":\"https://fosstodon.org/@RandomizeHandles/109353016504673479\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eEveryone + that makes proprietary software should go to the GNUlag\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109352849863103675\",\"username\":\"RandomizeHandles\",\"acct\":\"RandomizeHandles@fosstodon.org\",\"display_name\":\"RH + on :linux:\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-08-23T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eInterested + in: Privacy, Linux, Music, Ethical hacking, Hardware, FOSS\\u003c/p\\u003e\",\"url\":\"https://fosstodon.org/@RandomizeHandles\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/352/849/863/103/675/original/162099387b83978d.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/352/849/863/103/675/original/162099387b83978d.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/352/849/863/103/675/original/d5a5b0470ff7fa3e.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/352/849/863/103/675/original/d5a5b0470ff7fa3e.jpg\",\"followers_count\":13,\"following_count\":61,\"statuses_count\":96,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"linux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/000/077/original/047107ff8d739fe3.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/000/077/static/047107ff8d739fe3.png\",\"visible_in_picker\":true}],\"fields\":[{\"name\":\"Languages\",\"value\":\"English, + Dutch and learning Spanish\",\"verified_at\":null},{\"name\":\"Music\",\"value\":\"\\u003ca + href=\\\"https://last.fm/hotsauwz\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003elast.fm/hotsauwz\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Favorite + vidyagame and artist\",\"value\":\"Persona 3, MF DOOM\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null}]" + recorded_at: 2022-11-16 10:38:31 GMT + recorded_with: vcr/1.1.0, webmockr/0.8.2 diff --git a/tests/fixtures/process_request_smaller.yml b/tests/fixtures/process_request_smaller.yml new file mode 100644 index 0000000..14f45c2 --- /dev/null +++ b/tests/fixtures/process_request_smaller.yml @@ -0,0 +1,382 @@ +http_interactions: +- request: + method: get + uri: https://emacs.ch/api/v1/timelines/public?local=FALSE&remote=FALSE&only_media=FALSE&limit=20 + body: + encoding: '' + string: '' + headers: + Accept: application/json, text/xml, application/xml, */* + Authorization: Bearer <<>> + response: + status: + status_code: 200 + category: Success + reason: OK + message: 'Success: (200) OK' + headers: + cache-control: no-store + content-encoding: gzip + content-security-policy: 'base-uri ''none''; default-src ''none''; frame-ancestors + ''none''; font-src ''self'' https://emacs.ch; img-src ''self'' https: data: + blob: https://emacs.ch; style-src ''self'' https://emacs.ch ''nonce-RnnMg56keOTu9yN1unf5pg==''; + media-src ''self'' https: data: https://emacs.ch; frame-src ''self'' https:; + manifest-src ''self'' https://emacs.ch; connect-src ''self'' data: blob: https://emacs.ch + https://emacs.ch wss://emacs.ch; script-src ''self'' https://emacs.ch ''wasm-unsafe-eval''; + child-src ''self'' blob: https://emacs.ch; worker-src ''self'' blob: https://emacs.ch' + content-type: application/json; charset=utf-8 + date: Wed, 16 Nov 2022 10:38:30 GMT + etag: W/"9b0211d06d4478159a17c0baa746fb9d" + link: ; + rel="next", ; + rel="prev" + permissions-policy: interest-cohort=() + server: Mastodon + strict-transport-security: max-age=63072000; includeSubDomains + vary: + - Accept-Encoding + - Origin + x-cached: MISS + x-content-type-options: nosniff + x-frame-options: DENY + x-ratelimit-limit: '300' + x-ratelimit-remaining: '297' + x-ratelimit-reset: '2022-11-16T10:40:00.965882Z' + x-request-id: 59b19718-a7ec-4ed9-a2e5-3d338df457fd + x-runtime: '0.182950' + x-xss-protection: '0' + body: + encoding: '' + file: no + string: "[{\"id\":\"109353046884731607\",\"created_at\":\"2022-11-16T10:37:32.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodon.social/users/Gargron/statuses/109353045373308291\",\"url\":\"https://mastodon.social/@Gargron/109353045373308291\",\"replies_count\":1,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eThis + arrived \\u003ca href=\\\"https://mastodon.social/tags/Lightwork\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLightwork\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109327452733932721\",\"username\":\"Gargron\",\"acct\":\"Gargron@mastodon.social\",\"display_name\":\"Eugen + \U0001F480\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2016-03-16T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eFounder, + CEO and lead developer \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.social/@Mastodon\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eMastodon\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e, + Germany.\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@Gargron\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/327/452/733/932/721/original/668273d591a86f91.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/327/452/733/932/721/original/668273d591a86f91.jpg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/327/452/733/932/721/original/62e414675da3a94b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/327/452/733/932/721/original/62e414675da3a94b.jpeg\",\"followers_count\":209100,\"following_count\":320,\"statuses_count\":72722,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Patreon\",\"value\":\"\\u003ca + href=\\\"https://www.patreon.com/mastodon\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003epatreon.com/mastodon\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353045597548813\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/045/597/548/813/original/8527579bb8795aba.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/045/597/548/813/small/8527579bb8795aba.jpg\",\"remote_url\":\"https://files.mastodon.social/media_attachments/files/109/353/035/234/108/067/original/233a2077f5ee23df.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1536,\"height\":1150,\"size\":\"1536x1150\",\"aspect\":1.3356521739130436},\"small\":{\"width\":554,\"height\":415,\"size\":\"554x415\",\"aspect\":1.3349397590361445}},\"description\":\"Devin + Townsend’s Lightwork LP with signed card\",\"blurhash\":\"UVIXa9~V8wMxR+t7RkM{8_Mx%MxuoLRjjYoe\"},{\"id\":\"109353046068842872\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/046/068/842/872/original/55e1e230a13da792.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/046/068/842/872/small/55e1e230a13da792.jpg\",\"remote_url\":\"https://files.mastodon.social/media_attachments/files/109/353/035/399/115/058/original/9e90a16a453b405f.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1536,\"height\":1152,\"size\":\"1536x1152\",\"aspect\":1.3333333333333333},\"small\":{\"width\":554,\"height\":416,\"size\":\"554x416\",\"aspect\":1.3317307692307692}},\"description\":\"Devin + Townsend’s Lightwork LP (transparent blue) in record player\",\"blurhash\":\"UqGSJpS5VsRP~oWBRjWB-Un$bcozkDogj@js\"}],\"mentions\":[],\"tags\":[{\"name\":\"lightwork\",\"url\":\"https://emacs.ch/tags/lightwork\"}],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353038313293074\",\"created_at\":\"2022-11-16T10:35:44.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodon.social/users/jelu/statuses/109353038275386342\",\"url\":\"https://mastodon.social/@jelu/109353038275386342\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://mastodon.social/tags/ripeatlas\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eripeatlas\\u003c/span\\u003e\\u003c/a\\u003e + (\\u003ca href=\\\"https://mastodon.social/tags/go\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ego\\u003c/span\\u003e\\u003c/a\\u003e + bindings) v0.1.1 released!\\u003cbr\\u003e- `traceroute/reply`: Fix `Err()`: + return empty string if `Err` is not a `string`\\u003cbr\\u003e^JL\\u003cbr\\u003e\\u003ca + href=\\\"https://mastodon.social/tags/DNS\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDNS\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Ping\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePing\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Traceroute\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eTraceroute\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/HTTP\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eHTTP\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://mastodon.social/tags/Measurements\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMeasurements\\u003c/span\\u003e\\u003c/a\\u003e + by RIPE Atlas \\u003ca href=\\\"https://mastodon.social/tags/OpenSource\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eOpenSource\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003ca + href=\\\"https://github.com/DNS-OARC/ripeatlas/releases/tag/v0.1.1\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"ellipsis\\\"\\u003egithub.com/DNS-OARC/ripeatlas/\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ereleases/tag/v0.1.1\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348131931956742\",\"username\":\"jelu\",\"acct\":\"jelu@mastodon.social\",\"display_name\":\"Jerry + Lundström\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-10-29T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCoding + / Gaming / Music / Beer!\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@jelu\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/131/931/956/742/original/ba6603a51038370a.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/131/931/956/742/original/ba6603a51038370a.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/348/131/931/956/742/original/00e007110ecf0072.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/348/131/931/956/742/original/00e007110ecf0072.jpg\",\"followers_count\":27,\"following_count\":43,\"statuses_count\":11,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"ripeatlas\",\"url\":\"https://emacs.ch/tags/ripeatlas\"},{\"name\":\"go\",\"url\":\"https://emacs.ch/tags/go\"},{\"name\":\"dns\",\"url\":\"https://emacs.ch/tags/dns\"},{\"name\":\"ping\",\"url\":\"https://emacs.ch/tags/ping\"},{\"name\":\"traceroute\",\"url\":\"https://emacs.ch/tags/traceroute\"},{\"name\":\"http\",\"url\":\"https://emacs.ch/tags/http\"},{\"name\":\"measurements\",\"url\":\"https://emacs.ch/tags/measurements\"},{\"name\":\"opensource\",\"url\":\"https://emacs.ch/tags/opensource\"}],\"emojis\":[],\"card\":{\"url\":\"https://github.com/DNS-OARC/ripeatlas/releases/tag/v0.1.1\",\"title\":\"Release + Release 0.1.1 · DNS-OARC/ripeatlas\",\"description\":\"traceroute/reply: Fix + #28: Err(): return empty string if Err is not a string\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"GitHub\",\"provider_url\":\"\",\"html\":\"\",\"width\":400,\"height\":200,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/809/original/0b95004250379cf4.png\",\"embed_url\":\"\",\"blurhash\":\"UNSF^dbEM{t7-ToyWBt6EgWCf6R*~VWCt7Rj\"},\"poll\":null},{\"id\":\"109353035142068366\",\"created_at\":\"2022-11-16T10:34:55.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353035098734150\",\"url\":\"https://mastodon.com.tr/@Cattie/109353035098734150\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHerkesin + seçimi üslubu sevdiği sevmediği güldüğü gülmediği farklı cehepe bey biz buna + çeşitlilik diyoruz\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353033475454529\",\"created_at\":\"2022-11-16T10:10:32.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"de\",\"uri\":\"https://squeet.me/objects/962c3e10-ae34314d-0ac480194faada7b\",\"url\":\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"Die + Corona-Infektionszahlen sind in China so hoch wie seit April nicht mehr. Aber + die Regierung hat jüngst Lockerungen angekündigt. Nach Jahren der Null-Covid-Politik + sorgt das für Unsicherheit. Von Eva Lamby-Schmitt. \\u003cbr\\u003e\\u003ca + href=\\\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003eCoronavirus + in China: Lockerungen verunsichern Bevölkerung\\u003c/a\\u003e\\u003cbr\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109325413942496685\",\"username\":\"tagesschau\",\"acct\":\"tagesschau@squeet.me\",\"display_name\":\"Tagesschau + (inoffiziell)\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-11T00:00:00.000Z\",\"note\":\"Dies + ist ein Bot, der den RSS-Feed der Tagesschau zur Verfügung stellt. Er wird + nicht von der Tagesschau betrieben. Rückfragen bitte an heluecht@pirati.ca\",\"url\":\"https://squeet.me/profile/tagesschau\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/325/413/942/496/685/original/7b630c66f86595c1.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/325/413/942/496/685/original/7b630c66f86595c1.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":36448,\"following_count\":0,\"statuses_count\":13223,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":{\"url\":\"https://www.tagesschau.de/ausland/asien/null-covid-chaos-china-101.html\",\"title\":\"Coronavirus + in China: Lockerungen verunsichern Bevölkerung\",\"description\":\"Die Corona-Infektionszahlen + sind in China so hoch wie seit April nicht mehr. Aber die Regierung hat jüngst + Lockerungen angekündigt. Nach Jahren der Null-Covid-Politik sorgt das für + Unsicherheit. \\u003cem\\u003eVon Eva Lamby-Schmitt.\\u003c/em\\u003e\",\"type\":\"link\",\"author_name\":\"tagesschau\",\"author_url\":\"\",\"provider_name\":\"tagesschau.de\",\"provider_url\":\"\",\"html\":\"\",\"width\":400,\"height\":225,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/808/original/1a903ba9cb61f062.jpg\",\"embed_url\":\"\",\"blurhash\":\"UOKwOa01xa-oR4xuM{R*-;t7xtM|WBM|NGt7\"},\"poll\":null},{\"id\":\"109353033468623404\",\"created_at\":\"2022-11-16T10:34:26.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://botsin.space/users/owncast/statuses/109353033182428590\",\"url\":\"https://botsin.space/@owncast/109353033182428590\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eRP + S3 has just started streaming on their \\u003ca href=\\\"https://botsin.space/tags/owncast\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e + server! Check them out at:\\u003cbr\\u003e\\u003ca href=\\\"http://s3.ro-players.de:8181\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttp://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003es3.ro-players.de:8181\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e. \\u003c/p\\u003e\\u003cp\\u003eEvent + mit Creative Commons Musik. Mapping, Gaming.\\u003c/p\\u003e\\u003cp\\u003e\\u003ca + href=\\\"https://botsin.space/tags/videogames\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003evideogames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/music\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emusic\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/tech\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003etech\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/streaming\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003estreaming\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/owncast\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/classic\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eclassic\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/games\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/techno\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003etechno\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/Gaming\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eGaming\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/radio\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eradio\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/video\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003evideo\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/event\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eevent\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/creativecommons\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ecreativecommons\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/mapping\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emapping\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/game\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egame\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/musik\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003emusik\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/spiele\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003espiele\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/gta\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003egta\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/fivem\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003efivem\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/rp\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003erp\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/halflife2\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ehalflife2\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/ccradio\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eccradio\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/cc\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ecc\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/oldgames\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eoldgames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/classicgames\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eclassicgames\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://botsin.space/tags/VideoGame\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eVideoGame\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109324881524464671\",\"username\":\"owncast\",\"acct\":\"owncast@botsin.space\",\"display_name\":\"Owncast\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2020-12-13T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eThe + self-hosted live streaming solution.\\u003cbr\\u003e\\u003ca href=\\\"https://owncast.online\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003eowncast.online\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\\u003cp\\u003eThis + is an unattended bot account. See \\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca + href=\\\"https://fosstodon.org/@owncast\\\" class=\\\"u-url mention\\\" rel=\\\"nofollow + noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003eowncast\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e + for the project's fediverse account.\\u003c/p\\u003e\\u003cp\\u003eThe sharing + of a public Owncast server instance does not imply endorsement or support + of its content.\\u003c/p\\u003e\",\"url\":\"https://botsin.space/@owncast\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/324/881/524/464/671/original/3cb7a427c625c5e8.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/324/881/524/464/671/original/3cb7a427c625c5e8.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/324/881/524/464/671/original/7474552dcfe993ae.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/324/881/524/464/671/original/7474552dcfe993ae.png\",\"followers_count\":553,\"following_count\":2,\"statuses_count\":6578,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Github\",\"value\":\"\\u003ca + href=\\\"https://github.com/owncast/owncast\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003egithub.com/owncast/owncast\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"The + Directory\",\"value\":\"\\u003ca href=\\\"https://directory.owncast.online\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003edirectory.owncast.online\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Documentation\",\"value\":\"\\u003ca + href=\\\"https://owncast.online\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eowncast.online\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353033427359443\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/033/427/359/443/original/4eeff8ab4f23a1cc.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/033/427/359/443/small/4eeff8ab4f23a1cc.jpg\",\"remote_url\":\"https://files.botsin.space/media_attachments/files/109/353/033/170/246/817/original/faf6cd64d4509382.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":1200,\"height\":720,\"size\":\"1200x720\",\"aspect\":1.6666666666666667},\"small\":{\"width\":620,\"height\":372,\"size\":\"620x372\",\"aspect\":1.6666666666666667}},\"description\":null,\"blurhash\":\"UREyiY?W-=xcNBN5ITM{_2RjRkxW_4actPog\"}],\"mentions\":[],\"tags\":[{\"name\":\"owncast\",\"url\":\"https://emacs.ch/tags/owncast\"},{\"name\":\"videogames\",\"url\":\"https://emacs.ch/tags/videogames\"},{\"name\":\"music\",\"url\":\"https://emacs.ch/tags/music\"},{\"name\":\"tech\",\"url\":\"https://emacs.ch/tags/tech\"},{\"name\":\"streaming\",\"url\":\"https://emacs.ch/tags/streaming\"},{\"name\":\"classic\",\"url\":\"https://emacs.ch/tags/classic\"},{\"name\":\"games\",\"url\":\"https://emacs.ch/tags/games\"},{\"name\":\"techno\",\"url\":\"https://emacs.ch/tags/techno\"},{\"name\":\"gaming\",\"url\":\"https://emacs.ch/tags/gaming\"},{\"name\":\"radio\",\"url\":\"https://emacs.ch/tags/radio\"},{\"name\":\"video\",\"url\":\"https://emacs.ch/tags/video\"},{\"name\":\"event\",\"url\":\"https://emacs.ch/tags/event\"},{\"name\":\"creativecommons\",\"url\":\"https://emacs.ch/tags/creativecommons\"},{\"name\":\"mapping\",\"url\":\"https://emacs.ch/tags/mapping\"},{\"name\":\"game\",\"url\":\"https://emacs.ch/tags/game\"},{\"name\":\"musik\",\"url\":\"https://emacs.ch/tags/musik\"},{\"name\":\"spiele\",\"url\":\"https://emacs.ch/tags/spiele\"},{\"name\":\"gta\",\"url\":\"https://emacs.ch/tags/gta\"},{\"name\":\"fivem\",\"url\":\"https://emacs.ch/tags/fivem\"},{\"name\":\"rp\",\"url\":\"https://emacs.ch/tags/rp\"},{\"name\":\"halflife2\",\"url\":\"https://emacs.ch/tags/halflife2\"},{\"name\":\"ccradio\",\"url\":\"https://emacs.ch/tags/ccradio\"},{\"name\":\"cc\",\"url\":\"https://emacs.ch/tags/cc\"},{\"name\":\"oldgames\",\"url\":\"https://emacs.ch/tags/oldgames\"},{\"name\":\"classicgames\",\"url\":\"https://emacs.ch/tags/classicgames\"},{\"name\":\"videogame\",\"url\":\"https://emacs.ch/tags/videogame\"}],\"emojis\":[],\"card\":{\"url\":\"http://s3.ro-players.de/\",\"title\":\"RP + S3\",\"description\":\"Event mit Creative Commons Musik. Mapping, Gaming.\",\"type\":\"video\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"RP + S3\",\"provider_url\":\"\",\"html\":\"\\u003ciframe src=\\\"http://s3.ro-players.de/embed/video\\\" + width=\\\"560\\\" height=\\\"315\\\" allowtransparency=\\\"true\\\" scrolling=\\\"no\\\" + frameborder=\\\"0\\\"\\u003e\\u003c/iframe\\u003e\",\"width\":560,\"height\":315,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353033317890847\",\"created_at\":\"2022-11-16T10:34:27.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://octodon.social/users/kensanata/statuses/109353033232345716\",\"url\":\"https://octodon.social/@kensanata/109353033232345716\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eRead + like nobody is tracking, toot like nobody is listening. \U0001F973​\U0001F3BA​\U0001F4A8\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336764765459931\",\"username\":\"kensanata\",\"acct\":\"kensanata@octodon.social\",\"display_name\":\"Alex + Schroeder\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2017-04-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://octodon.social/tags/Biology\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eBiology\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Plants\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePlants\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Birds\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eBirds\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Photography\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003ePhotography\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Switzerland\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSwitzerland\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Emacs\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eEmacs\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Wiki\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eWiki\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Gemini\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eGemini\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Programming\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eProgramming\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Tea\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eTea\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Drawing\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eDrawing\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://octodon.social/tags/Music\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eMusic\\u003c/span\\u003e\\u003c/a\\u003e\\u003cbr\\u003e\\u003cspan + class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://tabletop.social/@kensanata\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003ekensanata\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e + is my RPG alt.\\u003cbr\\u003eLanguages: gsw de en fr pt.\\u003cbr\\u003eMy + toots expire. He/him.\\u003c/p\\u003e\",\"url\":\"https://octodon.social/@kensanata\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/764/765/459/931/original/e17aaa9449bfb012.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/764/765/459/931/original/e17aaa9449bfb012.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/764/765/459/931/original/0a4e9e13fae0c699.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/764/765/459/931/original/0a4e9e13fae0c699.jpg\",\"followers_count\":727,\"following_count\":440,\"statuses_count\":4837,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Blog\",\"value\":\"\\u003cspan + class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://botsin.space/@alexschroeder\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003ealexschroeder@botsin.space\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\",\"verified_at\":null},{\"name\":\"Contact\",\"value\":\"\\u003ca + href=\\\"https://alexschroeder.ch/wiki/Contact\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003ealexschroeder.ch/wiki/Contact\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"OpenPGP\",\"value\":\"DF9446EB7B7846387CCC018BC78CA29BACECFEAE\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353028671710573\",\"created_at\":\"2022-11-16T10:33:13.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://botsin.space/users/bitartbot/statuses/109353028384437104\",\"url\":\"https://botsin.space/@bitartbot/109353028384437104\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003ef(x,y) + = (~(((y * y) * (x + y)) | ((-x) + (-x)))) % 5\\u003c/p\\u003e\\u003cp\\u003eExtent: + 256x256 (scaled x2)\\u003c/p\\u003e\\u003cp\\u003e\\\"Onebit\\\" colouring + scheme.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109341048737344890\",\"username\":\"bitartbot\",\"acct\":\"bitartbot@botsin.space\",\"display_name\":\"Bit + Art Bot\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2021-08-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eThis + is a bot which produces procedural art by plotting an integer function taking + the current coordinates and producing an integer result. The function is + procedurally created using random numbers and appears in the status text.\\u003c/p\\u003e\\u003cp\\u003eCoordinates + are coloured either by where the value appears within the range of results + (the \\\"gradient\\\" scheme) or simply by whether it is the most common result + (white) or not (black) (the \\\"onebit\\\" scheme.)\\u003c/p\\u003e\\u003cp\\u003eThe + code does not resort to evaluating a string.\\u003c/p\\u003e\",\"url\":\"https://botsin.space/@bitartbot\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/048/737/344/890/original/fc6c3eadaf0c53e6.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/341/048/737/344/890/original/fc6c3eadaf0c53e6.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/341/048/737/344/890/original/9715f84636333583.png\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/341/048/737/344/890/original/9715f84636333583.png\",\"followers_count\":786,\"following_count\":0,\"statuses_count\":9129,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Made + by\",\"value\":\"\\u003cspan class=\\\"h-card\\\"\\u003e\\u003ca href=\\\"https://mastodon.technology/@suetanvil\\\" + class=\\\"u-url mention\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e@\\u003cspan\\u003esuetanvil@mastodon.technology\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/span\\u003e\",\"verified_at\":null},{\"name\":\"Inspiration:\",\"value\":\"\\u003ca + href=\\\"https://www.metafilter.com/192164/Patterns\\\" rel=\\\"nofollow noopener + noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003emetafilter.com/192164/Patterns\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Renderer + sources:\",\"value\":\"\\u003ca href=\\\"https://gitlab.com/suetanvil/bitart\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"\\\"\\u003egitlab.com/suetanvil/bitart\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null}]},\"media_attachments\":[{\"id\":\"109353028630468414\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/028/630/468/414/original/f7a22e45f8c27067.png\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/028/630/468/414/small/f7a22e45f8c27067.png\",\"remote_url\":\"https://files.botsin.space/media_attachments/files/109/353/028/359/748/116/original/31934c7efdd9edd4.png\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":512,\"height\":512,\"size\":\"512x512\",\"aspect\":1.0},\"small\":{\"width\":480,\"height\":480,\"size\":\"480x480\",\"aspect\":1.0}},\"description\":null,\"blurhash\":\"U2P6~x004n4nt7RjofayayRjoft7ofayayay\"}],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353028503027694\",\"created_at\":\"2022-11-16T10:33:15.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"de\",\"uri\":\"https://mastodon.social/users/NoNameCharakter/statuses/109353028505126280\",\"url\":\"https://mastodon.social/@NoNameCharakter/109353028505126280\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHaben + wir uns hier denn nun alle langsam wieder gegenseitig eingesammelt?\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349642500652857\",\"username\":\"NoNameCharakter\",\"acct\":\"NoNameCharakter@mastodon.social\",\"display_name\":\"NPC\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-04-14T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eGeowissenschaftler + und Völkerrechtler.\\u003c/p\\u003e\\u003cp\\u003e\\u003ca href=\\\"https://mastodon.social/tags/Redakteur\\\" + class=\\\"mention hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eRedakteur\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/SensitivityReader\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSensitivityReader\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/Jewish\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eJewish\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/Vegan\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eVegan\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/StoppAntisemitism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eStoppAntisemitism\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/SayNoToRacism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSayNoToRacism\\u003c/span\\u003e\\u003c/a\\u003e, + \\u003ca href=\\\"https://mastodon.social/tags/NoSexism\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eNoSexism\\u003c/span\\u003e\\u003c/a\\u003e, + ☝️ \\u003ca href=\\\"https://mastodon.social/tags/SayYesToHumor\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eSayYesToHumor\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://mastodon.social/@NoNameCharakter\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/642/500/652/857/original/8f86e27d74367fed.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/642/500/652/857/original/8f86e27d74367fed.jpg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/642/500/652/857/original/6164cfbbb8d3b598.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/642/500/652/857/original/6164cfbbb8d3b598.jpg\",\"followers_count\":604,\"following_count\":536,\"statuses_count\":218,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026914655726\",\"created_at\":\"2022-11-16T10:32:50.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353026886721792\",\"url\":\"https://mastodon.com.tr/@Cattie/109353026886721792\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eDhjshlxl\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026425504315\",\"created_at\":\"2022-11-16T10:32:40.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodonapp.uk/users/historydefined/statuses/109353026238409546\",\"url\":\"https://mastodonapp.uk/@historydefined/109353026238409546\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eA + Peruvian woman and her baby in the Andes, 1930s.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336620553894480\",\"username\":\"historydefined\",\"acct\":\"historydefined@mastodonapp.uk\",\"display_name\":\"History + Defined\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eLearn + Weird Things About History\\u003c/p\\u003e\",\"url\":\"https://mastodonapp.uk/@historydefined\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"followers_count\":3337,\"following_count\":1,\"statuses_count\":428,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[{\"id\":\"109353026403117432\",\"type\":\"image\",\"url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/026/403/117/432/original/dc2facfb822ca472.jpg\",\"preview_url\":\"https://emacs.ch/system/cache/media_attachments/files/109/353/026/403/117/432/small/dc2facfb822ca472.jpg\",\"remote_url\":\"https://files.mastodonapp.uk/media_attachments/files/109/353/026/117/105/293/original/7de9ddf27e0ea650.jpg\",\"preview_remote_url\":null,\"text_url\":null,\"meta\":{\"original\":{\"width\":594,\"height\":594,\"size\":\"594x594\",\"aspect\":1.0},\"small\":{\"width\":480,\"height\":480,\"size\":\"480x480\",\"aspect\":1.0}},\"description\":null,\"blurhash\":\"UoHx$$-;j[ay~qt7ofay%MRjayj[t7WBj[fQ\"}],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353026024817513\",\"created_at\":\"2022-11-16T10:32:35.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://mastodonapp.uk/users/historydefined/statuses/109353025880748267\",\"url\":\"https://mastodonapp.uk/@historydefined/109353025880748267\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eHow + the UK tried to use rats as a weapon during WW2 \\u003ca href=\\\"https://www.youtube.com/watch?v=NXLgUQDV-pw\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://www.\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003eyoutube.com/watch?v=NXLgUQDV-p\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ew\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109336620553894480\",\"username\":\"historydefined\",\"acct\":\"historydefined@mastodonapp.uk\",\"display_name\":\"History + Defined\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-11-04T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eLearn + Weird Things About History\\u003c/p\\u003e\",\"url\":\"https://mastodonapp.uk/@historydefined\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/336/620/553/894/480/original/311d5d98d9d48f74.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/336/620/553/894/480/original/f2977625d5d4a64b.jpeg\",\"followers_count\":3337,\"following_count\":1,\"statuses_count\":428,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":{\"url\":\"https://www.youtube.com/watch?v=NXLgUQDV-pw\",\"title\":\"How + the UK tried to use rats as a weapon during WW2\",\"description\":\"\",\"type\":\"video\",\"author_name\":\"History + Defined\",\"author_url\":\"https://www.youtube.com/channel/UCeTZhWcGeZYeMNMMPRyB1gA\",\"provider_name\":\"YouTube\",\"provider_url\":\"https://www.youtube.com/\",\"html\":\"\\u003ciframe + width=\\\"200\\\" height=\\\"113\\\" src=\\\"https://www.youtube.com/embed/NXLgUQDV-pw?feature=oembed\\\" + frameborder=\\\"0\\\" allowfullscreen=\\\"\\\" title=\\\"How the UK tried + to use rats as a weapon during WW2\\\"\\u003e\\u003c/iframe\\u003e\",\"width\":200,\"height\":113,\"image\":\"https://emacs.ch/system/cache/preview_cards/images/000/008/806/original/3e027b06ce9fea9c.jpg\",\"embed_url\":\"\",\"blurhash\":\"UKD,4G9F%Mof%7IUjuofxmt7IUj[9F%MRjWB\"},\"poll\":null},{\"id\":\"109353023823324523\",\"created_at\":\"2022-11-16T10:32:03.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"tr\",\"uri\":\"https://mastodon.com.tr/users/Cattie/statuses/109353023773983022\",\"url\":\"https://mastodon.com.tr/@Cattie/109353023773983022\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eBen + reise vercem arkadaşlar\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109349133596628366\",\"username\":\"Cattie\",\"acct\":\"Cattie@mastodon.com.tr\",\"display_name\":\"\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-11-07T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eCenazem + mi var ışıl ışılsınız?\\u003c/p\\u003e\",\"url\":\"https://mastodon.com.tr/@Cattie\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/349/133/596/628/366/original/136cf1a1599184c1.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/349/133/596/628/366/original/ba76f3c5015c3e58.jpeg\",\"followers_count\":53,\"following_count\":22,\"statuses_count\":942,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353022096915396\",\"created_at\":\"2022-11-16T10:31:37.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://pony.social/users/astrosnail/statuses/109353022101653957\",\"url\":\"https://pony.social/@astrosnail/109353022101653957\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003ei'm + upset that the toot button got changed to publish\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109353037645854694\",\"username\":\"astrosnail\",\"acct\":\"astrosnail@pony.social\",\"display_name\":\"erry\",\"locked\":true,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-01-28T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eEnby, + clueless and confused, trying to make more friends than is healthy for it.\\u003cbr\\u003eNot + aroace but it's weird and hard to describe.\\u003cbr\\u003eLearning about + accessibility, listening to music, longing for a change of body.\\u003cbr\\u003eCan + go on about maths all day.\\u003cbr\\u003eSend follow req.\\u003cbr\\u003eI + like to think aloud when nobody's listening.\\u003c/p\\u003e\",\"url\":\"https://pony.social/@astrosnail\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/037/645/854/694/original/cfb607af4399bd38.jpg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/353/037/645/854/694/original/cfb607af4399bd38.jpg\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":21,\"following_count\":49,\"statuses_count\":247,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Pronouns\",\"value\":\"it/its\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353021919374795\",\"created_at\":\"2022-11-16T10:30:46.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018779322431\",\"url\":\"https://pokemon.men/@archlinux/109353018779322431\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt5 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt5/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt5/\",\"title\":\"Arch + Linux - qgnomeplatform-qt5 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353021428178619\",\"created_at\":\"2022-11-16T10:30:45.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018665849499\",\"url\":\"https://pokemon.men/@archlinux/109353018665849499\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qgnomeplatform-qt6 0.9.0-5 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qgnomeplatform-qt6/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qgnomeplatform-qt6/\",\"title\":\"Arch + Linux - qgnomeplatform-qt6 0.9.0-5 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353020672877916\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018578118374\",\"url\":\"https://pokemon.men/@archlinux/109353018578118374\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + Not understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" + \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281325\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281325\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281325\",\"title\":\"Not + understanding mime types: \\\"xdg-open index.html\\\" opens \\\"Atom\\\" / + Applications \\u0026 Desktop Environments / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353019972431282\",\"created_at\":\"2022-11-16T10:30:43.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018542942008\",\"url\":\"https://pokemon.men/@archlinux/109353018542942008\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinuxPackageUpdate\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinuxPackageUpdate\\u003c/span\\u003e\\u003c/a\\u003e + qt6ct 0.7-2 x86_64 \\u003ca href=\\\"https://archlinux.org/packages/community/x86_64/qt6ct/\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003earchlinux.org/packages/communi\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ety/x86_64/qt6ct/\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention + hashtag\\\" rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"},{\"name\":\"archlinuxpackageupdate\",\"url\":\"https://emacs.ch/tags/archlinuxpackageupdate\"}],\"emojis\":[],\"card\":{\"url\":\"https://archlinux.org/packages/community/x86_64/qt6ct/\",\"title\":\"Arch + Linux - qt6ct 0.7-2 (x86_64)\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353018792568399\",\"created_at\":\"2022-11-16T10:30:42.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"zh\",\"uri\":\"https://pokemon.men/users/archlinux/statuses/109353018487959678\",\"url\":\"https://pokemon.men/@archlinux/109353018487959678\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + SwayIDLE not working when i close my thinkpad \\u003ca href=\\\"https://bbs.archlinux.org/viewtopic.php?id=281326\\u0026amp;action=new\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan class=\\\"ellipsis\\\"\\u003ebbs.archlinux.org/viewtopic.ph\\u003c/span\\u003e\\u003cspan + class=\\\"invisible\\\"\\u003ep?id=281326\\u0026amp;action=new\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109348158936750762\",\"username\":\"archlinux\",\"acct\":\"archlinux@pokemon.men\",\"display_name\":\"ArchLinux + :archlinux:\",\"locked\":false,\"bot\":true,\"discoverable\":true,\"group\":false,\"created_at\":\"2019-05-06T00:00:00.000Z\",\"note\":\"\\u003cp\\u003e\\u003ca + href=\\\"https://pokemon.men/tags/ArchLinux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eArchLinux\\u003c/span\\u003e\\u003c/a\\u003e + \\u003ca href=\\\"https://pokemon.men/tags/Linux\\\" class=\\\"mention hashtag\\\" + rel=\\\"nofollow noopener noreferrer\\\" target=\\\"_blank\\\"\\u003e#\\u003cspan\\u003eLinux\\u003c/span\\u003e\\u003c/a\\u003e\\u003c/p\\u003e\",\"url\":\"https://pokemon.men/@archlinux\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/348/158/936/750/762/original/7a09d1ab458203bf.png\",\"header\":\"https://emacs.ch/headers/original/missing.png\",\"header_static\":\"https://emacs.ch/headers/original/missing.png\",\"followers_count\":1526,\"following_count\":3,\"statuses_count\":98493,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"archlinux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/original/c4124186005dbc48.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/002/998/static/c4124186005dbc48.png\",\"visible_in_picker\":true}],\"fields\":[]},\"media_attachments\":[],\"mentions\":[],\"tags\":[{\"name\":\"linux\",\"url\":\"https://emacs.ch/tags/linux\"},{\"name\":\"archlinux\",\"url\":\"https://emacs.ch/tags/archlinux\"}],\"emojis\":[],\"card\":{\"url\":\"https://bbs.archlinux.org/viewtopic.php?id=281326\",\"title\":\"SwayIDLE + not working when i close my thinkpad / Applications \\u0026 Desktop Environments + / Arch Linux Forums\",\"description\":\"\",\"type\":\"link\",\"author_name\":\"\",\"author_url\":\"\",\"provider_name\":\"\",\"provider_url\":\"\",\"html\":\"\",\"width\":0,\"height\":0,\"image\":null,\"embed_url\":\"\",\"blurhash\":null},\"poll\":null},{\"id\":\"109353017283269023\",\"created_at\":\"2022-11-16T10:30:17.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://social.treehouse.systems/users/ariadne/statuses/109353016854603277\",\"url\":\"https://social.treehouse.systems/@ariadne/109353016854603277\",\"replies_count\":0,\"reblogs_count\":0,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eanyway, + as i was saying, if you are going to buy into forms of digital casteism such + as fedified, we're not likely to be friends.\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109342791058708572\",\"username\":\"ariadne\",\"acct\":\"ariadne@treehouse.systems\",\"display_name\":\"Ariadne + Conill \U0001F430\",\"locked\":false,\"bot\":false,\"discoverable\":false,\"group\":false,\"created_at\":\"2022-04-05T00:00:00.000Z\",\"note\":\"\\u003cp\\u003erabbit + enthusiast, principal software engineer, dreamer of dreams, maker of cool + shit\\u003c/p\\u003e\",\"url\":\"https://social.treehouse.systems/@ariadne\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/342/791/058/708/572/original/5d3f03ccb5885b15.png\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/342/791/058/708/572/original/9123d342910ec7f7.jpg\",\"followers_count\":2150,\"following_count\":650,\"statuses_count\":4213,\"last_status_at\":\"2022-11-16\",\"emojis\":[],\"fields\":[{\"name\":\"Website\",\"value\":\"\\u003ca + href=\\\"https://ariadne.space\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003eariadne.space\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":\"2022-11-16T08:26:11.676+00:00\"}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null},{\"id\":\"109353016542495914\",\"created_at\":\"2022-11-16T10:30:12.000Z\",\"in_reply_to_id\":null,\"in_reply_to_account_id\":null,\"sensitive\":false,\"spoiler_text\":\"\",\"visibility\":\"public\",\"language\":\"en\",\"uri\":\"https://fosstodon.org/users/RandomizeHandles/statuses/109353016504673479\",\"url\":\"https://fosstodon.org/@RandomizeHandles/109353016504673479\",\"replies_count\":0,\"reblogs_count\":1,\"favourites_count\":0,\"edited_at\":null,\"favourited\":false,\"reblogged\":false,\"muted\":false,\"bookmarked\":false,\"content\":\"\\u003cp\\u003eEveryone + that makes proprietary software should go to the GNUlag\\u003c/p\\u003e\",\"filtered\":[],\"reblog\":null,\"account\":{\"id\":\"109352849863103675\",\"username\":\"RandomizeHandles\",\"acct\":\"RandomizeHandles@fosstodon.org\",\"display_name\":\"RH + on :linux:\",\"locked\":false,\"bot\":false,\"discoverable\":true,\"group\":false,\"created_at\":\"2022-08-23T00:00:00.000Z\",\"note\":\"\\u003cp\\u003eInterested + in: Privacy, Linux, Music, Ethical hacking, Hardware, FOSS\\u003c/p\\u003e\",\"url\":\"https://fosstodon.org/@RandomizeHandles\",\"avatar\":\"https://emacs.ch/system/cache/accounts/avatars/109/352/849/863/103/675/original/162099387b83978d.jpeg\",\"avatar_static\":\"https://emacs.ch/system/cache/accounts/avatars/109/352/849/863/103/675/original/162099387b83978d.jpeg\",\"header\":\"https://emacs.ch/system/cache/accounts/headers/109/352/849/863/103/675/original/d5a5b0470ff7fa3e.jpg\",\"header_static\":\"https://emacs.ch/system/cache/accounts/headers/109/352/849/863/103/675/original/d5a5b0470ff7fa3e.jpg\",\"followers_count\":13,\"following_count\":61,\"statuses_count\":96,\"last_status_at\":\"2022-11-16\",\"emojis\":[{\"shortcode\":\"linux\",\"url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/000/077/original/047107ff8d739fe3.png\",\"static_url\":\"https://emacs.ch/system/cache/custom_emojis/images/000/000/077/static/047107ff8d739fe3.png\",\"visible_in_picker\":true}],\"fields\":[{\"name\":\"Languages\",\"value\":\"English, + Dutch and learning Spanish\",\"verified_at\":null},{\"name\":\"Music\",\"value\":\"\\u003ca + href=\\\"https://last.fm/hotsauwz\\\" rel=\\\"nofollow noopener noreferrer\\\" + target=\\\"_blank\\\"\\u003e\\u003cspan class=\\\"invisible\\\"\\u003ehttps://\\u003c/span\\u003e\\u003cspan + class=\\\"\\\"\\u003elast.fm/hotsauwz\\u003c/span\\u003e\\u003cspan class=\\\"invisible\\\"\\u003e\\u003c/span\\u003e\\u003c/a\\u003e\",\"verified_at\":null},{\"name\":\"Favorite + vidyagame and artist\",\"value\":\"Persona 3, MF DOOM\",\"verified_at\":null}]},\"media_attachments\":[],\"mentions\":[],\"tags\":[],\"emojis\":[],\"card\":null,\"poll\":null}]" + recorded_at: 2022-11-16 10:38:30 GMT + recorded_with: vcr/1.1.0, webmockr/0.8.2 diff --git a/tests/testthat/test-pagination.R b/tests/testthat/test-pagination.R new file mode 100644 index 0000000..3b10284 --- /dev/null +++ b/tests/testthat/test-pagination.R @@ -0,0 +1,57 @@ +## process_request will only emit messages when rate limit is reached. +## can't test here + +fake_token <- rtoot:::get_token_from_envvar("RTOOT_DEFAULT_TOKEN", check_stop = FALSE) +fake_token$type <- "user" +fake_token$instance <- "emacs.ch" + +test_that("process_request: n > page_size", { + path = "/api/v1/timelines/public" + n <- 20 + page_size <- 10 + params <- list(local = FALSE, remote = FALSE, only_media = FALSE, limit = page_size) + vcr::use_cassette("process_request_bigger", { + x <- process_request(token = fake_token, params = params, path = path, page_size = page_size, + n = n, verbose = FALSE, FUN = v(parse_status)) + }) + expect_true(nrow(x) >= n) +}) + +test_that("process_request: n < page_size", { + path = "/api/v1/timelines/public" + n <- 10 + page_size <- 20 + params <- list(local = FALSE, remote = FALSE, only_media = FALSE, limit = page_size) + vcr::use_cassette("process_request_smaller", { + x <- process_request(token = fake_token, params = params, path = path, page_size = page_size, + n = n, verbose = FALSE, FUN = v(parse_status)) + }) + expect_true(nrow(x) >= n) +}) + +test_that("process_request: n == page_size, and page_size is lower than API limit", { + path = "/api/v1/timelines/public" + n <- 20 + page_size <- 20 + params <- list(local = FALSE, remote = FALSE, only_media = FALSE, limit = page_size) + vcr::use_cassette("process_request_equal1", { + x <- process_request(token = fake_token, params = params, path = path, page_size = page_size, + n = n, verbose = FALSE, FUN = v(parse_status)) + }) + expect_true(nrow(x) == n) +}) + +## This has been controlled by the applying functions. +## e.g. params <- list(limit = min(limit,40L)) + +## test_that("process_request: n == page_size, and page_size is higher than API limit", { +## path = "/api/v1/timelines/public" +## n <- 50 +## page_size <- 50 +## params <- list(local = FALSE, remote = FALSE, only_media = FALSE, limit = page_size) +## vcr::use_cassette("process_request_equal2", { +## x <- process_request(token = fake_token, params = params, path = path, page_size = page_size, +## n = n, verbose = FALSE, FUN = v(parse_status)) +## }) +## expect_true(nrow(x) == n) +## }) From 6678df4c1c5a559ead92b12cb369864120a5bdaa Mon Sep 17 00:00:00 2001 From: chainsawriot Date: Wed, 16 Nov 2022 11:58:01 +0100 Subject: [PATCH 5/5] make `wait_until` testable --- R/utils.R | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/R/utils.R b/R/utils.R index 7ec1838..9a68ba2 100644 --- a/R/utils.R +++ b/R/utils.R @@ -140,9 +140,9 @@ sayif <- function(verbose, ...) { } # inspired by rtweet -wait_until <- function(until,verbose = TRUE){ +wait_until <- function(until, from = Sys.time(), verbose = TRUE){ until <- as.numeric(until) - seconds <- ceiling(until - unclass(Sys.time())) + seconds <- ceiling(until - unclass(from)) if(seconds>0){ sayif(verbose,"Rate limit exceeded, waiting for ",seconds," seconds") Sys.sleep(seconds)