blob: 8a8aad4ca736b8b54464a35ba008d848b411f820 [file] [log] [blame]
Marc Kupietza93a2722021-04-28 12:22:45 +02001#' Get reports from a matomo API server
2#'
3#' See matomo Reporting API Reference (\url{https://developer.matomo.org/api-reference/reporting-api}) for details.
4#'
5#' @references \url{https://developer.matomo.org/api-reference/reporting-api}
6#'
7#' @param matomoUrl base URL of your matomo instance
8#' @param siteId matomo site id or vector of site ids
9#' @param period \code{day}, \code{week}, \code{month} or \code{year}
10#' @param date date range (see \url{https://developer.matomo.org/api-reference/reporting-api})
11#' @param filter_limit defines the maximum number of rows to be returned
12#' @param removeFirst logical that determines whether the first row of each site should be removed (to account for incomplete periods)
13#' @param removeLast logical that determines whether the last row of each site should be removed (to account for incomplete periods)
14#' @param accessToken API Authentication Token - you can get this in your
15#' matomo interface under Settings -> Personal -> Settings -> API Authentication Token
16#' and pass it here, or you can make it persistent with \code{\link{persistAccessToken}}.
17#' @param getMethod API method to call – default: VisitsSummary.get
18#' @return Data frame with visits summary as returned by matomo. Note that the \code{date} column in the returned data frame refers to the first day of the respective period.
19#'
20#' @import httr
21#' @importFrom jsonlite fromJSON
22#' @importFrom dplyr mutate rowwise bind_rows select summarise n
23#' @import tibble
24#' @importFrom magrittr %>%
25#' @importFrom utils head tail
26#'
27#' @examples
28#' \dontrun{
29#' df <- matomoQuery("https://demo.matomo.org/", getMethod = "UserCountry.getCountry")
30#' }
31#'
32#' @export
33matomoQuery <- function(matomoUrl,
34 siteId,
35 period = "month",
36 date = "last16",
Marc Kupietz0ec50522022-04-09 15:53:24 +020037 filter_limit = 500,
Marc Kupietza93a2722021-04-28 12:22:45 +020038 removeFirst = FALSE,
39 removeLast = FALSE,
40 accessToken = getAccessToken(matomoUrl),
41 getMethod = "VisitsSummary.get"
42) {
43 if (is.null(accessToken) && matomoUrl != "https://demo.matomo.org/") {
44 stop(
45 paste0(
46 "You must first set an access token with:\n\npersistAccessToken(\"",
47 matomoUrl,
48 "\", <token>)\n\nYou can get the token in your matomo interface under Settings -> Personal -> Security -> Auth token\nprobably at:\n\n", matomoUrl, "index.php?module=UsersManager&action=userSecurity\n\n"
49 ),
50 call. = FALSE
51 )
52 }
53
54 httr::GET(
55 url = matomoUrl,
56 query = list(
57 module = "API",
Marc Kupietz0ec50522022-04-09 15:53:24 +020058 method = getMethod,
Marc Kupietza93a2722021-04-28 12:22:45 +020059 format = "json",
Marc Kupietza93a2722021-04-28 12:22:45 +020060 idSite = paste0(siteId, collapse = ","),
61 date = date,
62 period = period,
63 filter_limit = filter_limit,
Marc Kupietzea986d02021-04-28 15:54:23 +020064 language = "de",
Marc Kupietza93a2722021-04-28 12:22:45 +020065 token_auth = accessToken
66 )
67 ) -> res
68
69 if (status_code(res) != 200) {
70 if (json && !http_type(res) %in% c("application/json", "application/ld+json")) {
71 stop("API did not return json", call. = FALSE)
72 }
73 result <- jsonlite::fromJSON(content(res, "text", encoding = "UTF-8"))
74 if (!is.null(result$warnings)) {
75 message <- if (nrow(result$warnings) > 1)
76 sapply(result$warnings, function(warning) paste(sprintf("%s: %s", warning[1], warning[2]), sep="\n"))
77 else
78 sprintf("%s: %s", result$warnings[1], result$warnings[2])
79 warning(message, call. = FALSE)
80 }
81 }
82
83 if (!http_type(res) %in% c("application/json", "application/ld+json")) {
84 stop("API did not return json", call. = FALSE)
85 }
86
87 json <- httr::content(res, "text", encoding = "UTF-8")
Marc Kupietza93a2722021-04-28 12:22:45 +020088
Marc Kupietz0ec50522022-04-09 15:53:24 +020089 if (period=="range") {
90 df <- if (length(siteId) == 1) {
91 jsonlite::fromJSON(json) %>%
92 mutate(site_id=siteId)
93 } else {
94 bind_rows(jsonlite::fromJSON(json), .id = "site_id")
Marc Kupietza93a2722021-04-28 12:22:45 +020095 }
Marc Kupietz0ec50522022-04-09 15:53:24 +020096 } else {
97 l <- jsonlite::fromJSON(json)
98 df <- (if (length(siteId) == 1) {
99 bind_rows(l, .id=period) %>%
100 head(if(removeLast) -1 else filter_limit) %>%
101 tail(if(removeFirst) -1 else filter_limit) %>%
102 mutate(site_id=siteId)
103 } else {
104 df <- bind_rows(l[[1]], .id=period) %>%
105 head(if(removeLast) -1 else filter_limit) %>%
106 tail(if(removeFirst) -1 else filter_limit) %>%
107 mutate(site_id=siteId[1])
108 for (i in 2:length(l)) {
109 df <- bind_rows(df,
110 bind_rows(l[[i]], .id=period) %>%
111 head(if(removeLast) -1 else filter_limit) %>%
112 tail(if(removeFirst) -1 else filter_limit) %>%
113 mutate(site_id=siteId[i]))
114 }
115 df
116 })
117 }
Marc Kupietza93a2722021-04-28 12:22:45 +0200118
119 if("day" %in% colnames(df) | "month" %in% colnames(df) | "ye" %in% colnames(df)) {
120 df <- df %>%
121 mutate(date = as.Date(
122 if (period == "month")
123 paste0(month, "-01")
124 else if (period == "year")
125 paste0(year, "-01-01")
126 else if (period == "week")
127 sub(",.*", "", week)
128 else if (period == "day")
129 day
130 else
131 stop(paste0("unsupported period parameter: '", period, "'"), call. = FALSE)
Marc Kupietz0ec50522022-04-09 15:53:24 +0200132 , optional = TRUE))
Marc Kupietza93a2722021-04-28 12:22:45 +0200133 }
134 return(df)
135}
136
137utils::globalVariables(c("year", "month", "day", "week"))
138
139#' Save access token persistently to your keyring
140#'
141#' @param matomoUrl base URL of your matomo instance
142#' @param accessToken your oauth token
143#' @param id supply if you have multiple IDs, i.e. logins to your matomo instance
144#'
145#' @import keyring
146#'
147#' @export
148#'
149#' @examples
150#' persistAccessToken("https://demo.matomo.org/", "ad7609a669179c4ebca7c995342f7e09")
151#'
152persistAccessToken <- function(matomoUrl, accessToken, id="default") {
153 if (is.null(accessToken))
154 stop("It seems that you have not supplied any access token that could be persisted.", call. = FALSE)
155
156 keyring::key_set_with_value(matomoUrl, username=id, password=accessToken, keyring = NULL)
157}
158
159clearAccessToken <- function(matomoUrl, id="default") {
160 key_delete(matomoUrl, id)
161}
162
163
164
165#' get access token for matomo from keyring
166#'
167#' @param matomoUrl base URL of your matomo instance
168#' @param id supply if you have multiple IDs, i.e. logins to your matomo instance
169#'
170#' @return access token
171#' @export
172#'
173#' @import keyring
174#'
175getAccessToken <- function(matomoUrl, id="default") {
176 keyList <- tryCatch(withCallingHandlers(key_list(service = matomoUrl),
177 warning = function(w) invokeRestart("muffleWarning"),
178 error = function(e) return(NULL)),
179 error = function(e) { })
180 if (id %in% keyList)
181 key_get(matomoUrl, id)
182 else
183 NULL
184}
185
186