@@ -155,7 +155,7 @@ cpp_object_dummy <- function(.self, .refClassDef) {
155155}
156156
157157cpp_object_maker <- function (typeid , pointer ){
158- Class <- Rcpp ::: .classes_map [[ typeid ]]
158+ Class <- .classes_map [[ typeid ]]
159159 new( Class , .object_pointer = pointer )
160160}
161161
@@ -230,11 +230,11 @@ Module <- function( module, PACKAGE = methods::getPackageName(where), where = to
230230 .self <- .refClassDef <- NULL
231231 generator $ methods(initialize =
232232 if (cpp_hasDefaultConstructor(CLASS ))
233- function (... ) Rcpp ::: cpp_object_initializer(.self ,.refClassDef , ... )
233+ function (... ) cpp_object_initializer(.self ,.refClassDef , ... )
234234 else
235235 function (... ) {
236- if (nargs()) Rcpp ::: cpp_object_initializer(.self ,.refClassDef , ... )
237- else Rcpp ::: cpp_object_dummy(.self , .refClassDef )
236+ if (nargs()) cpp_object_initializer(.self ,.refClassDef , ... )
237+ else cpp_object_dummy(.self , .refClassDef )
238238 }
239239 )
240240 rm( .self , .refClassDef )
@@ -264,12 +264,12 @@ Module <- function( module, PACKAGE = methods::getPackageName(where), where = to
264264 } , where = where )
265265 }
266266 }
267-
267+
268268 # promoting show to S4
269269 if ( any( grepl( " show" , names(CLASS @ methods ) ) ) ){
270270 setMethod ( "show ", clname, function(object) object$show(), where = where )
271271 }
272-
272+
273273 }
274274 if (length(classes )) {
275275 module $ refClassGenerators <- generators
@@ -280,24 +280,24 @@ Module <- function( module, PACKAGE = methods::getPackageName(where), where = to
280280 clname <- as.character(CLASS )
281281 demangled_name <- sub( " ^Rcpp_" , " " , clname )
282282 .classes_map [[ CLASS @ typeid ]] <- storage [[ demangled_name ]] <- .get_Module_Class( module , demangled_name , xp )
283-
284- # exposing enums values as CLASS.VALUE
283+
284+ # exposing enums values as CLASS.VALUE
285285 # (should really be CLASS$value but I don't know how to do it)
286286 if ( length( CLASS @ enums ) ){
287287 for ( enum in CLASS @ enums ){
288288 for ( i in 1 : length(enum ) ){
289- storage [[ paste( demangled_name , " ." , names(enum )[i ], sep = " " ) ]] <- enum [i ]
289+ storage [[ paste( demangled_name , " ." , names(enum )[i ], sep = " " ) ]] <- enum [i ]
290290 }
291291 }
292292 }
293-
293+
294294 }
295295
296296 # functions
297297 functions <- .Call( Module__functions_names , xp )
298298 for ( fun in functions ){
299299 storage [[ fun ]] <- .get_Module_function( module , fun , xp )
300-
300+
301301 # register as(FROM, TO) methods
302302 converter_rx <- " ^[.]___converter___(.*)___(.*)$"
303303 if ( length( matches <- grep( converter_rx , functions ) ) ){
@@ -306,13 +306,13 @@ Module <- function( module, PACKAGE = methods::getPackageName(where), where = to
306306 from <- sub( converter_rx , " \\ 1" , fun )
307307 to <- sub( converter_rx , " \\ 2" , fun )
308308 converter <- function ( from ){}
309- body( converter ) <- substitute( { CONVERT(from ) },
309+ body( converter ) <- substitute( { CONVERT(from ) },
310310 list ( CONVERT = storage [[fun ]] )
311311 )
312312 setAs( from , to , converter , where = where )
313313 }
314314 }
315-
315+
316316 }
317317
318318 assign( " storage" , storage , envir = as.environment(module ) )
@@ -322,7 +322,7 @@ Module <- function( module, PACKAGE = methods::getPackageName(where), where = to
322322dealWith <- function ( x ) if (isTRUE(x [[1 ]])) invisible (NULL ) else x [[2 ]]
323323
324324method_wrapper <- function ( METHOD , where ){
325- noargs <- all( METHOD $ nargs == 0 )
325+ noargs <- all( METHOD $ nargs == 0 )
326326 stuff <- list (
327327 class_pointer = METHOD $ class_pointer ,
328328 pointer = METHOD $ pointer ,
@@ -335,9 +335,9 @@ method_wrapper <- function( METHOD, where ){
335335 f <- function (... ) NULL
336336 if ( noargs ){
337337 formals(f ) <- NULL
338- }
339-
340- extCall <- if ( noargs ) {
338+ }
339+
340+ extCall <- if ( noargs ) {
341341 if ( all( METHOD $ void ) ){
342342 # all methods are void, so we know we want to return invisible(NULL)
343343 substitute(
0 commit comments