Skip to content

Commit

Permalink
update rdoc
Browse files Browse the repository at this point in the history
  • Loading branch information
eblondel committed Dec 16, 2024
1 parent b90f431 commit 91ef359
Show file tree
Hide file tree
Showing 5 changed files with 35 additions and 24 deletions.
12 changes: 6 additions & 6 deletions R/SDMXData-methods.R
Original file line number Diff line number Diff line change
Expand Up @@ -126,10 +126,11 @@ addLabels.SDMXData <- function(data, dsd){
#' @name setDSD
#' @docType methods
#' @rdname SDMXData-method
#' @aliases setDSD,SDMXData-method
#' @aliases setDSD,SDMXData,SDMXDataStructureDefinition-method
#' @title setDSD
#' @description set the 'dsd' slot of a \code{SDMXData} object
#' @usage setDSD(obj, dsd)
#' @description set the dsd slot of a \code{SDMXData} object
#' @usage
#' setDSD(obj, dsd)
#'
#' @param obj An object deriving from class "SDMXData"
#' @param dsd An object of class "SDMXDataStructureDefinition"
Expand All @@ -140,9 +141,8 @@ addLabels.SDMXData <- function(data, dsd){
#' @author Emmanuel Blondel, \email{emmanuel.blondel1@@gmail.com}
setGeneric("setDSD", function(obj, dsd) standardGeneric("setDSD"));

#' @rdname SDMX-methods
#' @aliases setDSD,SDMXData,SDMXDataStructureDefinition-method
setMethod(f = "setDSD", signature = c("SDMXData", "SDMXDataStructureDefinition"), function(obj, dsd){
#' @rdname SDMXData-methods
setMethod(f = "setDSD", signature = c("SDMXData","SDMXDataStructureDefinition"), function(obj, dsd){
slot(obj, "dsd") <- dsd
return(obj)
})
10 changes: 7 additions & 3 deletions R/SDMXStructureType-methods.R
Original file line number Diff line number Diff line change
Expand Up @@ -79,13 +79,17 @@ type.SDMXStructureType <- function(xmlObj, namespaces, resource){

#generics
#' @export
#' @name getStructureType
#' @title getStructureType
#' @docType methods
#' @rdname SDMX-methods
#' @rdname SDMXStructureType-methods
#' @usage
#' getStructureType(obj)
#' @param obj object of class "SDMX"
setGeneric("getStructureType", function(obj) standardGeneric("getStructureType"));

#methods
#' @rdname SDMX-methods
#' @aliases getStructureType,SDMXStructureType,ANY-method
#' @rdname SDMXStructureType-methods
setMethod(f = "getStructureType", signature = "SDMXStructureType", function(obj){
return(obj@subtype)
})
Expand Down
15 changes: 2 additions & 13 deletions man/SDMX-methods.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/SDMXData-method.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

18 changes: 18 additions & 0 deletions man/SDMXStructureType-methods.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 91ef359

Please sign in to comment.