Skip to content

Commit

Permalink
Add dll column to ps_shared_lib_users() output
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Oct 15, 2020
1 parent 17e3e53 commit cb18835
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 0 deletions.
2 changes: 2 additions & 0 deletions R/system.R
Original file line number Diff line number Diff line change
Expand Up @@ -180,6 +180,7 @@ ps_tty_size <- function() {
#' @param filter Character vector or `NULL`. If not NULL, then it is
#' a vector of glob expressions, used to filter the process names.
#' @return A data frame (tibble) with columns:
#' * `dll`: the file name of the dll file, without the path,
#' * `path`: path to the shared library,
#' * `pid`: process ID of the process,
#' * `name`: name of the process,
Expand Down Expand Up @@ -246,6 +247,7 @@ ps_shared_lib_users <- function(paths, user = ps_username(),

d <- data.frame(
stringsAsFactors = FALSE,
dll = basename(unlist(match)),
path = unlist(match),
pid = rep(match_pids, match_len),
name = rep(match_name, match_len),
Expand Down
1 change: 1 addition & 0 deletions man/ps_shared_lib_users.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit cb18835

Please sign in to comment.