Skip to content

Commit

Permalink
Merge pull request #268 from IndrajeetPatil/rm_unneeded_arg
Browse files Browse the repository at this point in the history
  • Loading branch information
wch authored Oct 27, 2022
2 parents 87d5e45 + f716a95 commit 23421ec
Showing 1 changed file with 4 additions and 6 deletions.
10 changes: 4 additions & 6 deletions R/new.R
Original file line number Diff line number Diff line change
Expand Up @@ -91,12 +91,10 @@ generator_funs$new <- function(...) {
if (portable) {
# Set up the superclass objects
super_struct <- create_super_env(inherit, public_bind_env,
private_bind_env, portable = TRUE,
cloneable = cloneable)
private_bind_env, portable = TRUE)
} else {
# Set up the superclass objects
super_struct <- create_super_env(inherit, public_bind_env, portable = FALSE,
cloneable = cloneable)
super_struct <- create_super_env(inherit, public_bind_env, portable = FALSE)
}

enclos_env$super <- super_struct$bind_env
Expand Down Expand Up @@ -201,7 +199,7 @@ encapsulate({
# recursing early on in the function, and then fill the methods downward by
# doing the work for each level and passing the needed information down.
create_super_env <- function(inherit, public_bind_env, private_bind_env = NULL,
portable = TRUE, cloneable = TRUE) {
portable = TRUE) {
public_methods <- inherit$public_methods
private_methods <- inherit$private_methods
active <- inherit$active
Expand Down Expand Up @@ -247,7 +245,7 @@ encapsulate({
inherit_inherit <- inherit$get_inherit()
if (!is.null(inherit_inherit)) {
super_struct <- create_super_env(inherit_inherit, public_bind_env,
private_bind_env, portable, cloneable)
private_bind_env, portable)
super_enclos_env$super <- super_struct$bind_env

# Merge this level's methods over the superclass methods
Expand Down

0 comments on commit 23421ec

Please sign in to comment.