Skip to content

Commit 8f434af

Browse files
committed
Add graphviz install instructions for macOS
1 parent f27d0e3 commit 8f434af

File tree

2 files changed

+9
-4
lines changed

2 files changed

+9
-4
lines changed

R/reexports.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -26,7 +26,7 @@ magrittr::`%<>%`
2626
#' @rdname multi-assign
2727
#' @keywords internal
2828
#' @returns The right-hand-side argument, `value`, invisibly. This called
29-
#' primarily for it's side-effect of assigning symbols in the current frame.
29+
#' primarily for its side-effect of assigning symbols in the current frame.
3030
#' @export
3131
#' @importFrom zeallot %<-%
3232
#' @usage x \%<-\% value

R/utils.R

Lines changed: 8 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -590,16 +590,17 @@ keras_array <- function(x, dtype = NULL) {
590590
#' @param show_trainable
591591
#' whether to display if a layer is trainable.
592592
#'
593-
#' @returns Nothing, called for it's side effects.
593+
#' @returns Nothing, called for it side effects.
594594
#'
595595
#' @section Raises: ValueError: if `plot(model)` is called before the model is
596-
#' built, unless a `input_shape = ` argument was supplied to
596+
#' built, unless an `input_shape = ` argument was supplied to
597597
#' `keras_model_sequential()`.
598598
#'
599599
#' @section Requirements:
600600
#' This function requires pydot and graphviz.
601+
#'
601602
#' `pydot` is by default installed by `install_keras()`, but if you installed
602-
#' keras by other means, you can install `pydot` directly with :
603+
#' Keras by other means, you can install `pydot` directly with:
603604
#' ````r
604605
#' reticulate::py_install("pydot", pip = TRUE)
605606
#' ````
@@ -611,6 +612,10 @@ keras_array <- function(x, dtype = NULL) {
611612
#' ```sh
612613
#' sudo apt install graphviz
613614
#' ```
615+
#' On macOS you can install graphviz using `brew`:
616+
#' ```sh
617+
#' brew install graphviz
618+
#' ```
614619
#' In a conda environment, you can install graphviz with:
615620
#' ```r
616621
#' reticulate::conda_install(packages = "graphviz")

0 commit comments

Comments
 (0)