Skip to content

Commit

Permalink
Remove unneeded @.Data field
Browse files Browse the repository at this point in the history
  • Loading branch information
wch committed Aug 29, 2014
1 parent 6923a11 commit 11dfa3d
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/reactives.R
Original file line number Diff line number Diff line change
Expand Up @@ -445,7 +445,7 @@ reactive <- function(x, env = parent.frame(), quoted = FALSE, label = NULL,
attr(label, "srcfile") <- srcFileOfRef(srcref[[1]])
o <- Observable$new(fun, label, domain)
registerDebugHook(".func", o, "Reactive")
structure(o$getValue@.Data, observable = o, class = "reactive")
structure(o$getValue, observable = o, class = "reactive")
}

#' @export
Expand Down

0 comments on commit 11dfa3d

Please sign in to comment.