Skip to content

Commit

Permalink
Correct docs for R6 classes (#123)
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy authored Jan 31, 2024
1 parent af5dbe7 commit 454e194
Show file tree
Hide file tree
Showing 7 changed files with 8 additions and 23 deletions.
2 changes: 2 additions & 0 deletions R/browser.R
Original file line number Diff line number Diff line change
Expand Up @@ -2,10 +2,12 @@ globals <- new.env()

#' Browser base class
#'
#' @description
#' Base class for browsers like Chrome, Chromium, etc. Defines the interface
#' used by various browser implementations. It can represent a local browser
#' process or one running remotely.
#'
#' @details
#' The \code{initialize()} method of an implementation should set private$host
#' and private$port. If the process is local, the \code{initialize()} method
#' should also set private$process.
Expand Down
4 changes: 3 additions & 1 deletion R/chrome.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,6 @@
#' Local Chrome process
#'
#' @description
#' This is a subclass of [`Browser`] that represents a local browser. It extends
#' the [`Browser`] class with a [`processx::process`] object, which represents
#' the browser's system process.
Expand Down Expand Up @@ -231,7 +232,8 @@ launch_chrome_impl <- function(path, args, port) {

#' Remote Chrome process
#'
#'
#' @description
#' Remote Chrome process
#'
#' @export
ChromeRemote <- R6Class("ChromeRemote",
Expand Down
3 changes: 1 addition & 2 deletions R/chromote.R
Original file line number Diff line number Diff line change
@@ -1,7 +1,6 @@
#' Chromote class
#'
#' This class represents the browser as a whole.
#'
#' @description
#' A `Chromote` object represents the browser as a whole, and it can have
#' multiple _targets_, which each represent a browser tab. In the Chrome
#' DevTools Protocol, each target can have one or more debugging _sessions_ to
Expand Down
8 changes: 2 additions & 6 deletions man/Browser.Rd

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

5 changes: 0 additions & 5 deletions man/Chrome.Rd

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

2 changes: 0 additions & 2 deletions man/ChromeRemote.Rd

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

7 changes: 0 additions & 7 deletions man/Chromote.Rd

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

0 comments on commit 454e194

Please sign in to comment.