Skip to content

Commit

Permalink
Spell check
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Oct 10, 2018
1 parent 9cd6e00 commit 3e20e5e
Show file tree
Hide file tree
Showing 13 changed files with 58 additions and 36 deletions.
30 changes: 15 additions & 15 deletions R/low-level.R
Original file line number Diff line number Diff line change
Expand Up @@ -525,7 +525,7 @@ ps_num_threads <- function(p) {

#' CPU times of the process
#'
#' All times are measued in seconds:
#' All times are measured in seconds:
#' * `user`: Amount of time that this process has been scheduled in user
#' mode.
#' * `system`: Amount of time that this process has been scheduled in
Expand Down Expand Up @@ -564,23 +564,23 @@ ps_cpu_times <- function(p) {
#'
#' A list with information about memory usage. Portable fields:
#' * `rss`: "Resident Set Size", this is the non-swapped physical memory a
#' process has used. On UNIX it matches "top"‘s RES column (see doc). On
#' process has used. On UNIX it matches "top"‘s 'RES' column (see doc). On
#' Windows this is an alias for `wset` field and it matches "Memory"
#' column of `taskmgr.exe`.
#' * `vmem`: "Virtual Memory Size", this is the total amount of virtual
#' memory used by the process. On UNIX it matches "top"‘s VIRT column
#' memory used by the process. On UNIX it matches "top"‘s 'VIRT' column
#' (see doc). On Windows this is an alias for the `pagefile` field and
#' it matches the "Working set (memory)" column of `taskmgr.exe`.
#'
#' Non-portable fields:
#' * `shared`: (Linux) memory that could be potentially shared with other
#' processes. This matches "top"‘s SHR column (see doc).
#' * `text`: (Linux): aka TRS (text resident set) the amount of memory
#' devoted to executable code. This matches "top"‘s CODE column (see
#' processes. This matches "top"‘s 'SHR' column (see doc).
#' * `text`: (Linux): aka 'TRS' (text resident set) the amount of memory
#' devoted to executable code. This matches "top"‘s 'CODE' column (see
#' doc).
#' * `data`: (Linux): aka DRS (data resident set) the amount of physical
#' * `data`: (Linux): aka 'DRS' (data resident set) the amount of physical
#' memory devoted to other than executable code. It matches "top"‘s
#' DATA column (see doc).
#' 'DATA' column (see doc).
#' * `lib`: (Linux): the memory used by shared libraries.
#' * `dirty`: (Linux): the number of dirty pages.
#' * `pfaults`: (macOS): number of page faults.
Expand Down Expand Up @@ -648,7 +648,7 @@ ps_send_signal <- function(p, sig) {

#' Suspend (stop) the process
#'
#' Suspend process execution with `SIGSTOP` pre-emptively checking
#' Suspend process execution with `SIGSTOP` preemptively checking
#' whether PID has been reused. On Windows this has the effect of
#' suspending all process threads.
#'
Expand Down Expand Up @@ -679,7 +679,7 @@ ps_suspend <- function(p) {

#' Resume (continue) a stopped process
#'
#' Resume process execution with SIGCONT pre-emptively checking
#' Resume process execution with SIGCONT preemptively checking
#' whether PID has been reused. On Windows this has the effect of resuming
#' all process threads.
#'
Expand Down Expand Up @@ -740,7 +740,7 @@ ps_terminate <- function(p) {

#' Kill a process
#'
#' Kill the current process with SIGKILL pre-emptively checking
#' Kill the current process with SIGKILL preemptively checking
#' whether PID has been reused. On Windows it uses `TerminateProcess()`.
#'
#' @param p Process handle.
Expand Down Expand Up @@ -855,7 +855,7 @@ ps_ppid_map <- function() {
)
}

#' Number of open file desciptors
#' Number of open file descriptors
#'
#' Note that in some IDEs, e.g. RStudio or R.app on macOS, the IDE itself
#' opens files from other threads, in addition to the files opened from the
Expand Down Expand Up @@ -1002,11 +1002,11 @@ ps_connections <- function(p) {

#' Interrupt a process
#'
#' Sends `SIGINT` on POSIX, and CTRL+C or CTRL+BREAK on Windows.
#' Sends `SIGINT` on POSIX, and 'CTRL+C' or 'CTRL+BREAK' on Windows.
#'
#' @param p Process handle.
#' @param ctrl_c On Windows, whether to send CTRL+C. If `FALSE`, then
#' CTRL+BREAK is sent. Ignored on non-Windows platforms.
#' @param ctrl_c On Windows, whether to send 'CTRL+C'. If `FALSE`, then
#' 'CTRL+BREAK' is sent. Ignored on non-Windows platforms.
#'
#' @family process handle functions
#' @export
Expand Down
2 changes: 1 addition & 1 deletion R/ps.R
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@ NULL
#' Process table
#'
#' @param user Username, to filter the results to matching processes.
#' @param after Start time (POSIXt), to filter the results to processes
#' @param after Start time (`POSIXt`), to filter the results to processes
#' that started after this.
#' @return Data frame (tibble), see columns below.
#'
Expand Down
4 changes: 2 additions & 2 deletions R/testthat-reporter.R
Original file line number Diff line number Diff line change
@@ -1,14 +1,14 @@

globalVariables("private")

#' testthat reporter that checks if child proceses are cleaned up in tests
#' testthat reporter that checks if child processes are cleaned up in tests
#'
#' `CleanupReporter` takes an existing testthat `Reporter` object, and
#' wraps it, so it checks for leftover child processes, at the specified
#' place, see the `proc_unit` argument below.
#'
#' Child processes can be reported via a failed expectation, cleaned up
#' silently, or cleaned up and reptorted (the default).
#' silently, or cleaned up and reported (the default).
#'
#' The constructor of the `CleanupReporter` class has options:
#' * `file`: the output file, if any, this is passed to `reporter`.
Expand Down
22 changes: 22 additions & 0 deletions inst/WORDLIST
Original file line number Diff line number Diff line change
@@ -0,0 +1,22 @@
CTRL
DRS
IDEs
macOS
pageins
pid
Pid
PID
pids
RStudio
runnable
SHR
SIGCONT
SIGKILL
signalling
testthat
tibble
TRS
UDP
uid
unparsed
VIRT
4 changes: 2 additions & 2 deletions man/CleanupReporter.Rd

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

2 changes: 1 addition & 1 deletion man/ps.Rd

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

2 changes: 1 addition & 1 deletion man/ps_cpu_times.Rd

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

6 changes: 3 additions & 3 deletions man/ps_interrupt.Rd

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

2 changes: 1 addition & 1 deletion man/ps_kill.Rd

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

14 changes: 7 additions & 7 deletions man/ps_memory_info.Rd

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

2 changes: 1 addition & 1 deletion man/ps_num_fds.Rd

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

2 changes: 1 addition & 1 deletion man/ps_resume.Rd

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

2 changes: 1 addition & 1 deletion man/ps_suspend.Rd

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

0 comments on commit 3e20e5e

Please sign in to comment.