Skip to content

Commit

Permalink
remove clone method when converting R6ClassGenerators Python
Browse files Browse the repository at this point in the history
  • Loading branch information
t-kalinowski committed Mar 28, 2024
1 parent f0b1e77 commit 5b644c8
Showing 1 changed file with 5 additions and 3 deletions.
8 changes: 5 additions & 3 deletions R/py-classes.R
Original file line number Diff line number Diff line change
Expand Up @@ -155,12 +155,14 @@ function(classname,
#' @importFrom reticulate r_to_py import_builtins py_eval py_dict py_call
#' @export
r_to_py.R6ClassGenerator <- function(x, convert = TRUE) {
members <- c(x$public_fields,
x$public_methods,
lapply(x$active, active_property))
members$clone <- NULL
new_py_type(
classname = x$classname,
inherit = x$get_inherit(),
members = c(x$public_fields,
x$public_methods,
lapply(x$active, active_property)),
members = members,
private = c(x$private_fields,
x$private_methods),
parent_env = x$parent_env
Expand Down

0 comments on commit 5b644c8

Please sign in to comment.