#' Get all ACHAccounts.
#'
#' This function returns a dataframe of all ACHAccounts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All ACHAccounts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllACHAccounts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnACHAccountID = F, returnAccountType = F, returnAccountTypeCode = F, returnACHAccountNumber = F, returnClass = F, returnClassCode = F, returnCompanyEntryDescription = F, returnCreatedTime = F, returnIsActive = F, returnIsEmployeeChildSupportACH = F, returnIsEmployeeNetPayrollACH = F, returnIsStateDisbursementUnit = F, returnIsVendorAccountsPayableACH = F, returnModifiedTime = F, returnNameID = F, returnPrenoteDate = F, returnReceivingCompany = F, returnRoutingNumber = F, returnStateIDSDU = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "ACHAccount", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ACHAccount
#'
#' This function returns fields for an ACHAccount.
#'
#' @param ACHAccountID The id of the ACHAccount.\cr Run \code{\link{getAllACHAccounts}} for a list of ACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the ACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getACHAccount <- function(ACHAccountID, EntityID = 1, returnACHAccountID = F, returnAccountType = F, returnAccountTypeCode = F, returnACHAccountNumber = F, returnClass = F, returnClassCode = F, returnCompanyEntryDescription = F, returnCreatedTime = F, returnIsActive = F, returnIsEmployeeChildSupportACH = F, returnIsEmployeeNetPayrollACH = F, returnIsStateDisbursementUnit = F, returnIsVendorAccountsPayableACH = F, returnModifiedTime = F, returnNameID = F, returnPrenoteDate = F, returnReceivingCompany = F, returnRoutingNumber = F, returnStateIDSDU = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "ACHAccount", ACHAccountID, searchFields, EntityID)
}
#' Modify a specific ACHAccount
#'
#' This function modifies fields for an ACHAccount.
#'
#' @param ACHAccountID The id of the ACHAccount to be modified.\cr Run \code{\link{getAllACHAccounts}} for a list of ACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified ACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyACHAccount <- function(ACHAccountID, EntityID = 1, setAccountType = NULL, setAccountTypeCode = NULL, setACHAccountNumber = NULL, setClass = NULL, setClassCode = NULL, setCompanyEntryDescription = NULL, setIsActive = NULL, setIsStateDisbursementUnit = NULL, setNameID = NULL, setPrenoteDate = NULL, setReceivingCompany = NULL, setRoutingNumber = NULL, setStateIDSDU = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "ACHAccount", ACHAccountID, names(functionParams), functionParams, EntityID)
}
#' Create new ACHAccount.
#'
#' This function creates a new ACHAccount.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created ACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createACHAccount <- function(EntityID = 1, setAccountType = NULL, setAccountTypeCode = NULL, setACHAccountNumber = NULL, setClass = NULL, setClassCode = NULL, setCompanyEntryDescription = NULL, setIsActive = NULL, setIsStateDisbursementUnit = NULL, setNameID = NULL, setPrenoteDate = NULL, setReceivingCompany = NULL, setRoutingNumber = NULL, setStateIDSDU = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "ACHAccount", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ACHAccount
#'
#' This function deletes an ACHAccount.
#'
#' @param ACHAccountID The id of the ACHAccount.\cr Run \code{\link{getAllACHAccounts}} for a list of ACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted ACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteACHAccount <- function(ACHAccountID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "ACHAccount", ACHAccountID, EntityID)
}
#' Get all Addresses.
#'
#' This function returns a dataframe of all Addresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Addresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAddressID = F, returnAddressLine2 = F, returnAddressRangeNumericStreetNumber = F, returnAddressRangeNumericStreetNumberIsOdd = F, returnAddressSecondaryUnitID = F, returnAddressType = F, returnAddressTypeCode = F, returnCountyID = F, returnCreatedTime = F, returnFormattedFullAddress = F, returnFreeformAddress = F, returnFullAddress = F, returnGeoID = F, returnInternationalAddress1 = F, returnInternationalAddress2 = F, returnInternationalAddress3 = F, returnInternationalAddress4 = F, returnIsLoadedLatitudeLongitude = F, returnLatitude = F, returnLatitudeLongitudeConfidence = F, returnLongitude = F, returnModifiedTime = F, returnPOBox = F, returnPrintableHTMLAddress = F, returnSecondaryUnitNumber = F, returnStreetID = F, returnStreetNumber = F, returnStreetNumberAndName = F, returnStreetNumberAndNameIncludeSecondaryUnit = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCodeAddOn = F, returnZipCodeWithAddon = F, returnZipCodeWithAddonNoHyphen = F, returnZipID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Address", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Address
#'
#' This function returns fields for an Address.
#'
#' @param AddressID The id of the Address.\cr Run \code{\link{getAllAddresses}} for a list of Addresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Address.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAddress <- function(AddressID, EntityID = 1, returnAddressID = F, returnAddressLine2 = F, returnAddressRangeNumericStreetNumber = F, returnAddressRangeNumericStreetNumberIsOdd = F, returnAddressSecondaryUnitID = F, returnAddressType = F, returnAddressTypeCode = F, returnCountyID = F, returnCreatedTime = F, returnFormattedFullAddress = F, returnFreeformAddress = F, returnFullAddress = F, returnGeoID = F, returnInternationalAddress1 = F, returnInternationalAddress2 = F, returnInternationalAddress3 = F, returnInternationalAddress4 = F, returnIsLoadedLatitudeLongitude = F, returnLatitude = F, returnLatitudeLongitudeConfidence = F, returnLongitude = F, returnModifiedTime = F, returnPOBox = F, returnPrintableHTMLAddress = F, returnSecondaryUnitNumber = F, returnStreetID = F, returnStreetNumber = F, returnStreetNumberAndName = F, returnStreetNumberAndNameIncludeSecondaryUnit = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCodeAddOn = F, returnZipCodeWithAddon = F, returnZipCodeWithAddonNoHyphen = F, returnZipID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Address", AddressID, searchFields, EntityID)
}
#' Modify a specific Address
#'
#' This function modifies fields for an Address.
#'
#' @param AddressID The id of the Address to be modified.\cr Run \code{\link{getAllAddresses}} for a list of Address.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Address.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAddress <- function(AddressID, EntityID = 1, setAddressLine2 = NULL, setAddressRangeNumericStreetNumber = NULL, setAddressSecondaryUnitID = NULL, setAddressType = NULL, setAddressTypeCode = NULL, setCountyID = NULL, setFreeformAddress = NULL, setFullAddress = NULL, setGeoID = NULL, setInternationalAddress1 = NULL, setInternationalAddress2 = NULL, setInternationalAddress3 = NULL, setInternationalAddress4 = NULL, setIsLoadedLatitudeLongitude = NULL, setLatitude = NULL, setLatitudeLongitudeConfidence = NULL, setLongitude = NULL, setPOBox = NULL, setSecondaryUnitNumber = NULL, setStreetID = NULL, setStreetNumber = NULL, setZipCodeAddOn = NULL, setZipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Address", AddressID, names(functionParams), functionParams, EntityID)
}
#' Create new Address.
#'
#' This function creates a new Address.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Address.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAddress <- function(EntityID = 1, setAddressLine2 = NULL, setAddressRangeNumericStreetNumber = NULL, setAddressSecondaryUnitID = NULL, setAddressType = NULL, setAddressTypeCode = NULL, setCountyID = NULL, setFreeformAddress = NULL, setFullAddress = NULL, setGeoID = NULL, setInternationalAddress1 = NULL, setInternationalAddress2 = NULL, setInternationalAddress3 = NULL, setInternationalAddress4 = NULL, setIsLoadedLatitudeLongitude = NULL, setLatitude = NULL, setLatitudeLongitudeConfidence = NULL, setLongitude = NULL, setPOBox = NULL, setSecondaryUnitNumber = NULL, setStreetID = NULL, setStreetNumber = NULL, setZipCodeAddOn = NULL, setZipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Address", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Address
#'
#' This function deletes an Address.
#'
#' @param AddressID The id of the Address.\cr Run \code{\link{getAllAddresses}} for a list of Addresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Address.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAddress <- function(AddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Address", AddressID, EntityID)
}
#' Get all AddressRangeDefaults.
#'
#' This function returns a dataframe of all AddressRangeDefaults in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All AddressRangeDefaults in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAddressRangeDefaults <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAddressRangeDefaultID = F, returnAddressRangeDefaultIDClonedFrom = F, returnAddressRangeDefaultIDClonedTo = F, returnCity = F, returnCreatedTime = F, returnDefaultSchools = F, returnDistrictID = F, returnFullAddressRange = F, returnIsManual = F, returnModifiedTime = F, returnSchoolPathID = F, returnSchoolYearID = F, returnStateAbbreviation = F, returnStreetDirection = F, returnStreetName = F, returnStreetNumberHigh = F, returnStreetNumberLow = F, returnStreetSide = F, returnStreetSideCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F, returnZipCodeAddOn = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "AddressRangeDefault", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AddressRangeDefault
#'
#' This function returns fields for an AddressRangeDefault.
#'
#' @param AddressRangeDefaultID The id of the AddressRangeDefault.\cr Run \code{\link{getAllAddressRangeDefaults}} for a list of AddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the AddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAddressRangeDefault <- function(AddressRangeDefaultID, EntityID = 1, returnAddressRangeDefaultID = F, returnAddressRangeDefaultIDClonedFrom = F, returnAddressRangeDefaultIDClonedTo = F, returnCity = F, returnCreatedTime = F, returnDefaultSchools = F, returnDistrictID = F, returnFullAddressRange = F, returnIsManual = F, returnModifiedTime = F, returnSchoolPathID = F, returnSchoolYearID = F, returnStateAbbreviation = F, returnStreetDirection = F, returnStreetName = F, returnStreetNumberHigh = F, returnStreetNumberLow = F, returnStreetSide = F, returnStreetSideCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F, returnZipCodeAddOn = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "AddressRangeDefault", AddressRangeDefaultID, searchFields, EntityID)
}
#' Modify a specific AddressRangeDefault
#'
#' This function modifies fields for an AddressRangeDefault.
#'
#' @param AddressRangeDefaultID The id of the AddressRangeDefault to be modified.\cr Run \code{\link{getAllAddressRangeDefaults}} for a list of AddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified AddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAddressRangeDefault <- function(AddressRangeDefaultID, EntityID = 1, setAddressRangeDefaultIDClonedFrom = NULL, setCity = NULL, setDistrictID = NULL, setIsManual = NULL, setSchoolPathID = NULL, setSchoolYearID = NULL, setStateAbbreviation = NULL, setStreetDirection = NULL, setStreetName = NULL, setStreetNumberHigh = NULL, setStreetNumberLow = NULL, setStreetSide = NULL, setStreetSideCode = NULL, setZipCode = NULL, setZipCodeAddOn = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "AddressRangeDefault", AddressRangeDefaultID, names(functionParams), functionParams, EntityID)
}
#' Create new AddressRangeDefault.
#'
#' This function creates a new AddressRangeDefault.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created AddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAddressRangeDefault <- function(EntityID = 1, setAddressRangeDefaultIDClonedFrom = NULL, setCity = NULL, setDistrictID = NULL, setIsManual = NULL, setSchoolPathID = NULL, setSchoolYearID = NULL, setStateAbbreviation = NULL, setStreetDirection = NULL, setStreetName = NULL, setStreetNumberHigh = NULL, setStreetNumberLow = NULL, setStreetSide = NULL, setStreetSideCode = NULL, setZipCode = NULL, setZipCodeAddOn = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "AddressRangeDefault", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AddressRangeDefault
#'
#' This function deletes an AddressRangeDefault.
#'
#' @param AddressRangeDefaultID The id of the AddressRangeDefault.\cr Run \code{\link{getAllAddressRangeDefaults}} for a list of AddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted AddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAddressRangeDefault <- function(AddressRangeDefaultID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "AddressRangeDefault", AddressRangeDefaultID, EntityID)
}
#' Get all AddressRangeDefaultAddresses.
#'
#' This function returns a dataframe of all AddressRangeDefaultAddresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All AddressRangeDefaultAddresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAddressRangeDefaultAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAddressRangeDefaultAddressID = F, returnAddressID = F, returnAddressRangeDefaultID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "AddressRangeDefaultAddress", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AddressRangeDefaultAddress
#'
#' This function returns fields for an AddressRangeDefaultAddress.
#'
#' @param AddressRangeDefaultAddressID The id of the AddressRangeDefaultAddress.\cr Run \code{\link{getAllAddressRangeDefaultAddresses}} for a list of AddressRangeDefaultAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the AddressRangeDefaultAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAddressRangeDefaultAddress <- function(AddressRangeDefaultAddressID, EntityID = 1, returnAddressRangeDefaultAddressID = F, returnAddressID = F, returnAddressRangeDefaultID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "AddressRangeDefaultAddress", AddressRangeDefaultAddressID, searchFields, EntityID)
}
#' Modify a specific AddressRangeDefaultAddress
#'
#' This function modifies fields for an AddressRangeDefaultAddress.
#'
#' @param AddressRangeDefaultAddressID The id of the AddressRangeDefaultAddress to be modified.\cr Run \code{\link{getAllAddressRangeDefaultAddresses}} for a list of AddressRangeDefaultAddress.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified AddressRangeDefaultAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAddressRangeDefaultAddress <- function(AddressRangeDefaultAddressID, EntityID = 1, setAddressID = NULL, setAddressRangeDefaultID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "AddressRangeDefaultAddress", AddressRangeDefaultAddressID, names(functionParams), functionParams, EntityID)
}
#' Create new AddressRangeDefaultAddress.
#'
#' This function creates a new AddressRangeDefaultAddress.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created AddressRangeDefaultAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAddressRangeDefaultAddress <- function(EntityID = 1, setAddressID = NULL, setAddressRangeDefaultID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "AddressRangeDefaultAddress", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AddressRangeDefaultAddress
#'
#' This function deletes an AddressRangeDefaultAddress.
#'
#' @param AddressRangeDefaultAddressID The id of the AddressRangeDefaultAddress.\cr Run \code{\link{getAllAddressRangeDefaultAddresses}} for a list of AddressRangeDefaultAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted AddressRangeDefaultAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAddressRangeDefaultAddress <- function(AddressRangeDefaultAddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "AddressRangeDefaultAddress", AddressRangeDefaultAddressID, EntityID)
}
#' Get all AddressRangeImportSchools.
#'
#' This function returns a dataframe of all AddressRangeImportSchools in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All AddressRangeImportSchools in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAddressRangeImportSchools <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAddressRangeImportSchoolID = F, returnAddressRangeImportSchoolIDClonedFrom = F, returnAddressRangeImportSchoolIDClonedTo = F, returnCreatedTime = F, returnDescription = F, returnImportSchoolCode = F, returnModifiedTime = F, returnSchoolID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "AddressRangeImportSchool", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AddressRangeImportSchool
#'
#' This function returns fields for an AddressRangeImportSchool.
#'
#' @param AddressRangeImportSchoolID The id of the AddressRangeImportSchool.\cr Run \code{\link{getAllAddressRangeImportSchools}} for a list of AddressRangeImportSchools.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the AddressRangeImportSchool.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAddressRangeImportSchool <- function(AddressRangeImportSchoolID, EntityID = 1, returnAddressRangeImportSchoolID = F, returnAddressRangeImportSchoolIDClonedFrom = F, returnAddressRangeImportSchoolIDClonedTo = F, returnCreatedTime = F, returnDescription = F, returnImportSchoolCode = F, returnModifiedTime = F, returnSchoolID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "AddressRangeImportSchool", AddressRangeImportSchoolID, searchFields, EntityID)
}
#' Modify a specific AddressRangeImportSchool
#'
#' This function modifies fields for an AddressRangeImportSchool.
#'
#' @param AddressRangeImportSchoolID The id of the AddressRangeImportSchool to be modified.\cr Run \code{\link{getAllAddressRangeImportSchools}} for a list of AddressRangeImportSchools.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified AddressRangeImportSchool.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAddressRangeImportSchool <- function(AddressRangeImportSchoolID, EntityID = 1, setAddressRangeImportSchoolIDClonedFrom = NULL, setDescription = NULL, setImportSchoolCode = NULL, setSchoolID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "AddressRangeImportSchool", AddressRangeImportSchoolID, names(functionParams), functionParams, EntityID)
}
#' Create new AddressRangeImportSchool.
#'
#' This function creates a new AddressRangeImportSchool.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created AddressRangeImportSchool.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAddressRangeImportSchool <- function(EntityID = 1, setAddressRangeImportSchoolIDClonedFrom = NULL, setDescription = NULL, setImportSchoolCode = NULL, setSchoolID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "AddressRangeImportSchool", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AddressRangeImportSchool
#'
#' This function deletes an AddressRangeImportSchool.
#'
#' @param AddressRangeImportSchoolID The id of the AddressRangeImportSchool.\cr Run \code{\link{getAllAddressRangeImportSchools}} for a list of AddressRangeImportSchools.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted AddressRangeImportSchool.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAddressRangeImportSchool <- function(AddressRangeImportSchoolID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "AddressRangeImportSchool", AddressRangeImportSchoolID, EntityID)
}
#' Get all AddressSecondaryUnits.
#'
#' This function returns a dataframe of all AddressSecondaryUnits in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All AddressSecondaryUnits in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAddressSecondaryUnits <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAddressSecondaryUnitID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRequiresNumber = F, returnSkywardHash = F, returnSkywardID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "AddressSecondaryUnit", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AddressSecondaryUnit
#'
#' This function returns fields for an AddressSecondaryUnit.
#'
#' @param AddressSecondaryUnitID The id of the AddressSecondaryUnit.\cr Run \code{\link{getAllAddressSecondaryUnits}} for a list of AddressSecondaryUnits.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the AddressSecondaryUnit.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAddressSecondaryUnit <- function(AddressSecondaryUnitID, EntityID = 1, returnAddressSecondaryUnitID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRequiresNumber = F, returnSkywardHash = F, returnSkywardID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "AddressSecondaryUnit", AddressSecondaryUnitID, searchFields, EntityID)
}
#' Modify a specific AddressSecondaryUnit
#'
#' This function modifies fields for an AddressSecondaryUnit.
#'
#' @param AddressSecondaryUnitID The id of the AddressSecondaryUnit to be modified.\cr Run \code{\link{getAllAddressSecondaryUnits}} for a list of AddressSecondaryUnits.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified AddressSecondaryUnit.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAddressSecondaryUnit <- function(AddressSecondaryUnitID, EntityID = 1, setCode = NULL, setDescription = NULL, setRequiresNumber = NULL, setSkywardHash = NULL, setSkywardID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "AddressSecondaryUnit", AddressSecondaryUnitID, names(functionParams), functionParams, EntityID)
}
#' Create new AddressSecondaryUnit.
#'
#' This function creates a new AddressSecondaryUnit.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created AddressSecondaryUnit.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAddressSecondaryUnit <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setRequiresNumber = NULL, setSkywardHash = NULL, setSkywardID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "AddressSecondaryUnit", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AddressSecondaryUnit
#'
#' This function deletes an AddressSecondaryUnit.
#'
#' @param AddressSecondaryUnitID The id of the AddressSecondaryUnit.\cr Run \code{\link{getAllAddressSecondaryUnits}} for a list of AddressSecondaryUnits.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted AddressSecondaryUnit.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAddressSecondaryUnit <- function(AddressSecondaryUnitID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "AddressSecondaryUnit", AddressSecondaryUnitID, EntityID)
}
#' Get all Certifications.
#'
#' This function returns a dataframe of all Certifications in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Certifications in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertifications <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationID = F, returnCertificationNumber = F, returnCertificationThirdPartyImportID = F, returnCertificationTypeID = F, returnComment = F, returnCreatedTime = F, returnExpirationDate = F, returnInstitutionID = F, returnIssueDate = F, returnModifiedTime = F, returnNameID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Certification", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Certification
#'
#' This function returns fields for a Certification.
#'
#' @param CertificationID The id of the Certification.\cr Run \code{\link{getAllCertifications}} for a list of Certifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Certification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertification <- function(CertificationID, EntityID = 1, returnCertificationID = F, returnCertificationNumber = F, returnCertificationThirdPartyImportID = F, returnCertificationTypeID = F, returnComment = F, returnCreatedTime = F, returnExpirationDate = F, returnInstitutionID = F, returnIssueDate = F, returnModifiedTime = F, returnNameID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Certification", CertificationID, searchFields, EntityID)
}
#' Modify a specific Certification
#'
#' This function modifies fields for a Certification.
#'
#' @param CertificationID The id of the Certification to be modified.\cr Run \code{\link{getAllCertifications}} for a list of Certifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Certification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertification <- function(CertificationID, EntityID = 1, setCertificationNumber = NULL, setCertificationThirdPartyImportID = NULL, setCertificationTypeID = NULL, setComment = NULL, setExpirationDate = NULL, setInstitutionID = NULL, setIssueDate = NULL, setNameID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Certification", CertificationID, names(functionParams), functionParams, EntityID)
}
#' Create new Certification.
#'
#' This function creates a new Certification.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Certification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertification <- function(EntityID = 1, setCertificationNumber = NULL, setCertificationThirdPartyImportID = NULL, setCertificationTypeID = NULL, setComment = NULL, setExpirationDate = NULL, setInstitutionID = NULL, setIssueDate = NULL, setNameID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Certification", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Certification
#'
#' This function deletes a Certification.
#'
#' @param CertificationID The id of the Certification.\cr Run \code{\link{getAllCertifications}} for a list of Certifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Certification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertification <- function(CertificationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Certification", CertificationID, EntityID)
}
#' Get all CertificationCompetencies.
#'
#' This function returns a dataframe of all CertificationCompetencies in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationCompetencies in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationCompetencies <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationCompetencyID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationCompetency", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationCompetency
#'
#' This function returns fields for a CertificationCompetency.
#'
#' @param CertificationCompetencyID The id of the CertificationCompetency.\cr Run \code{\link{getAllCertificationCompetencies}} for a list of CertificationCompetencies.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationCompetency <- function(CertificationCompetencyID, EntityID = 1, returnCertificationCompetencyID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationCompetency", CertificationCompetencyID, searchFields, EntityID)
}
#' Modify a specific CertificationCompetency
#'
#' This function modifies fields for a CertificationCompetency.
#'
#' @param CertificationCompetencyID The id of the CertificationCompetency to be modified.\cr Run \code{\link{getAllCertificationCompetencies}} for a list of CertificationCompetencys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationCompetency <- function(CertificationCompetencyID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationCompetency", CertificationCompetencyID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationCompetency.
#'
#' This function creates a new CertificationCompetency.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationCompetency <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationCompetency", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationCompetency
#'
#' This function deletes a CertificationCompetency.
#'
#' @param CertificationCompetencyID The id of the CertificationCompetency.\cr Run \code{\link{getAllCertificationCompetencies}} for a list of CertificationCompetencies.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationCompetency <- function(CertificationCompetencyID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationCompetency", CertificationCompetencyID, EntityID)
}
#' Get all CertificationDelimitedFileFormats.
#'
#' This function returns a dataframe of all CertificationDelimitedFileFormats in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationDelimitedFileFormats in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationDelimitedFileFormats <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationDelimitedFileFormatID = F, returnCertificationCompetencyColumnNumber = F, returnCertificationDetailExpirationDateColumnNumber = F, returnCertificationDetailIssueDateColumnNumber = F, returnCertificationLevelColumnNumber = F, returnCertificationNumberColumnNumber = F, returnCertificationSubjectColumnNumber = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeColumnNumber = F, returnCommentColumnNumber = F, returnCreatedTime = F, returnDelimiterCharacter = F, returnDelimiterType = F, returnDelimiterTypeCode = F, returnEmployeeColumnNumber = F, returnExpirationDateColumnNumber = F, returnHighCertificationGradeColumnNumber = F, returnHighlyQualifiedColumnNumber = F, returnInstitutionNameColumnNumber = F, returnIssueDateColumnNumber = F, returnLowCertificationGradeColumnNumber = F, returnModifiedTime = F, returnNumberOfHeaderRows = F, returnSkywardHash = F, returnSkywardID = F, returnStateColumnNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationDelimitedFileFormat", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationDelimitedFileFormat
#'
#' This function returns fields for a CertificationDelimitedFileFormat.
#'
#' @param CertificationDelimitedFileFormatID The id of the CertificationDelimitedFileFormat.\cr Run \code{\link{getAllCertificationDelimitedFileFormats}} for a list of CertificationDelimitedFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationDelimitedFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationDelimitedFileFormat <- function(CertificationDelimitedFileFormatID, EntityID = 1, returnCertificationDelimitedFileFormatID = F, returnCertificationCompetencyColumnNumber = F, returnCertificationDetailExpirationDateColumnNumber = F, returnCertificationDetailIssueDateColumnNumber = F, returnCertificationLevelColumnNumber = F, returnCertificationNumberColumnNumber = F, returnCertificationSubjectColumnNumber = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeColumnNumber = F, returnCommentColumnNumber = F, returnCreatedTime = F, returnDelimiterCharacter = F, returnDelimiterType = F, returnDelimiterTypeCode = F, returnEmployeeColumnNumber = F, returnExpirationDateColumnNumber = F, returnHighCertificationGradeColumnNumber = F, returnHighlyQualifiedColumnNumber = F, returnInstitutionNameColumnNumber = F, returnIssueDateColumnNumber = F, returnLowCertificationGradeColumnNumber = F, returnModifiedTime = F, returnNumberOfHeaderRows = F, returnSkywardHash = F, returnSkywardID = F, returnStateColumnNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationDelimitedFileFormat", CertificationDelimitedFileFormatID, searchFields, EntityID)
}
#' Modify a specific CertificationDelimitedFileFormat
#'
#' This function modifies fields for a CertificationDelimitedFileFormat.
#'
#' @param CertificationDelimitedFileFormatID The id of the CertificationDelimitedFileFormat to be modified.\cr Run \code{\link{getAllCertificationDelimitedFileFormats}} for a list of CertificationDelimitedFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationDelimitedFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationDelimitedFileFormat <- function(CertificationDelimitedFileFormatID, EntityID = 1, setCertificationCompetencyColumnNumber = NULL, setCertificationDetailExpirationDateColumnNumber = NULL, setCertificationDetailIssueDateColumnNumber = NULL, setCertificationLevelColumnNumber = NULL, setCertificationNumberColumnNumber = NULL, setCertificationSubjectColumnNumber = NULL, setCertificationThirdPartyFormatID = NULL, setCertificationTypeColumnNumber = NULL, setCommentColumnNumber = NULL, setDelimiterCharacter = NULL, setDelimiterType = NULL, setDelimiterTypeCode = NULL, setEmployeeColumnNumber = NULL, setExpirationDateColumnNumber = NULL, setHighCertificationGradeColumnNumber = NULL, setHighlyQualifiedColumnNumber = NULL, setInstitutionNameColumnNumber = NULL, setIssueDateColumnNumber = NULL, setLowCertificationGradeColumnNumber = NULL, setNumberOfHeaderRows = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateColumnNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationDelimitedFileFormat", CertificationDelimitedFileFormatID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationDelimitedFileFormat.
#'
#' This function creates a new CertificationDelimitedFileFormat.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationDelimitedFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationDelimitedFileFormat <- function(EntityID = 1, setCertificationCompetencyColumnNumber = NULL, setCertificationDetailExpirationDateColumnNumber = NULL, setCertificationDetailIssueDateColumnNumber = NULL, setCertificationLevelColumnNumber = NULL, setCertificationNumberColumnNumber = NULL, setCertificationSubjectColumnNumber = NULL, setCertificationThirdPartyFormatID = NULL, setCertificationTypeColumnNumber = NULL, setCommentColumnNumber = NULL, setDelimiterCharacter = NULL, setDelimiterType = NULL, setDelimiterTypeCode = NULL, setEmployeeColumnNumber = NULL, setExpirationDateColumnNumber = NULL, setHighCertificationGradeColumnNumber = NULL, setHighlyQualifiedColumnNumber = NULL, setInstitutionNameColumnNumber = NULL, setIssueDateColumnNumber = NULL, setLowCertificationGradeColumnNumber = NULL, setNumberOfHeaderRows = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateColumnNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationDelimitedFileFormat", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationDelimitedFileFormat
#'
#' This function deletes a CertificationDelimitedFileFormat.
#'
#' @param CertificationDelimitedFileFormatID The id of the CertificationDelimitedFileFormat.\cr Run \code{\link{getAllCertificationDelimitedFileFormats}} for a list of CertificationDelimitedFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationDelimitedFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationDelimitedFileFormat <- function(CertificationDelimitedFileFormatID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationDelimitedFileFormat", CertificationDelimitedFileFormatID, EntityID)
}
#' Get all CertificationDetails.
#'
#' This function returns a dataframe of all CertificationDetails in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationDetails in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationDetails <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationDetailID = F, returnCertificationCompetencyID = F, returnCertificationGradeIDHigh = F, returnCertificationGradeIDLow = F, returnCertificationID = F, returnCertificationLevelID = F, returnCertificationSubjectID = F, returnCertificationThirdPartyImportID = F, returnCreatedTime = F, returnExpirationDate = F, returnIsHighlyQualified = F, returnIssueDate = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationDetail", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationDetail
#'
#' This function returns fields for a CertificationDetail.
#'
#' @param CertificationDetailID The id of the CertificationDetail.\cr Run \code{\link{getAllCertificationDetails}} for a list of CertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationDetail <- function(CertificationDetailID, EntityID = 1, returnCertificationDetailID = F, returnCertificationCompetencyID = F, returnCertificationGradeIDHigh = F, returnCertificationGradeIDLow = F, returnCertificationID = F, returnCertificationLevelID = F, returnCertificationSubjectID = F, returnCertificationThirdPartyImportID = F, returnCreatedTime = F, returnExpirationDate = F, returnIsHighlyQualified = F, returnIssueDate = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationDetail", CertificationDetailID, searchFields, EntityID)
}
#' Modify a specific CertificationDetail
#'
#' This function modifies fields for a CertificationDetail.
#'
#' @param CertificationDetailID The id of the CertificationDetail to be modified.\cr Run \code{\link{getAllCertificationDetails}} for a list of CertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationDetail <- function(CertificationDetailID, EntityID = 1, setCertificationCompetencyID = NULL, setCertificationGradeIDHigh = NULL, setCertificationGradeIDLow = NULL, setCertificationID = NULL, setCertificationLevelID = NULL, setCertificationSubjectID = NULL, setCertificationThirdPartyImportID = NULL, setExpirationDate = NULL, setIsHighlyQualified = NULL, setIssueDate = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationDetail", CertificationDetailID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationDetail.
#'
#' This function creates a new CertificationDetail.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationDetail <- function(EntityID = 1, setCertificationCompetencyID = NULL, setCertificationGradeIDHigh = NULL, setCertificationGradeIDLow = NULL, setCertificationID = NULL, setCertificationLevelID = NULL, setCertificationSubjectID = NULL, setCertificationThirdPartyImportID = NULL, setExpirationDate = NULL, setIsHighlyQualified = NULL, setIssueDate = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationDetail", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationDetail
#'
#' This function deletes a CertificationDetail.
#'
#' @param CertificationDetailID The id of the CertificationDetail.\cr Run \code{\link{getAllCertificationDetails}} for a list of CertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationDetail <- function(CertificationDetailID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationDetail", CertificationDetailID, EntityID)
}
#' Get all CertificationFixedLengthFileFormats.
#'
#' This function returns a dataframe of all CertificationFixedLengthFileFormats in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationFixedLengthFileFormats in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationFixedLengthFileFormats <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationFixedLengthFileFormatID = F, returnCertificationCompetencyLength = F, returnCertificationCompetencyStartPosition = F, returnCertificationDetailExpirationDateLength = F, returnCertificationDetailExpirationDateStartPosition = F, returnCertificationDetailIssueDateLength = F, returnCertificationDetailIssueDateStartPosition = F, returnCertificationLevelLength = F, returnCertificationLevelStartPosition = F, returnCertificationNumberLength = F, returnCertificationNumberStartPosition = F, returnCertificationSubjectLength = F, returnCertificationSubjectStartPosition = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeLength = F, returnCertificationTypeStartPosition = F, returnCommentLength = F, returnCommentStartPosition = F, returnCreatedTime = F, returnEmployeeLength = F, returnEmployeeStartPosition = F, returnExpirationDateLength = F, returnExpirationDateStartPosition = F, returnHighCertificationGradeLength = F, returnHighCertificationGradeStartPosition = F, returnHighlyQualifiedLength = F, returnHighlyQualifiedStartPosition = F, returnInstitutionNameLength = F, returnInstitutionNameStartPosition = F, returnIssueDateLength = F, returnIssueDateStartPosition = F, returnLowCertificationGradeLength = F, returnLowCertificationGradeStartPosition = F, returnModifiedTime = F, returnNumberOfHeaderRows = F, returnSkywardHash = F, returnSkywardID = F, returnStateLength = F, returnStateStartPosition = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationFixedLengthFileFormat", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationFixedLengthFileFormat
#'
#' This function returns fields for a CertificationFixedLengthFileFormat.
#'
#' @param CertificationFixedLengthFileFormatID The id of the CertificationFixedLengthFileFormat.\cr Run \code{\link{getAllCertificationFixedLengthFileFormats}} for a list of CertificationFixedLengthFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationFixedLengthFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationFixedLengthFileFormat <- function(CertificationFixedLengthFileFormatID, EntityID = 1, returnCertificationFixedLengthFileFormatID = F, returnCertificationCompetencyLength = F, returnCertificationCompetencyStartPosition = F, returnCertificationDetailExpirationDateLength = F, returnCertificationDetailExpirationDateStartPosition = F, returnCertificationDetailIssueDateLength = F, returnCertificationDetailIssueDateStartPosition = F, returnCertificationLevelLength = F, returnCertificationLevelStartPosition = F, returnCertificationNumberLength = F, returnCertificationNumberStartPosition = F, returnCertificationSubjectLength = F, returnCertificationSubjectStartPosition = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeLength = F, returnCertificationTypeStartPosition = F, returnCommentLength = F, returnCommentStartPosition = F, returnCreatedTime = F, returnEmployeeLength = F, returnEmployeeStartPosition = F, returnExpirationDateLength = F, returnExpirationDateStartPosition = F, returnHighCertificationGradeLength = F, returnHighCertificationGradeStartPosition = F, returnHighlyQualifiedLength = F, returnHighlyQualifiedStartPosition = F, returnInstitutionNameLength = F, returnInstitutionNameStartPosition = F, returnIssueDateLength = F, returnIssueDateStartPosition = F, returnLowCertificationGradeLength = F, returnLowCertificationGradeStartPosition = F, returnModifiedTime = F, returnNumberOfHeaderRows = F, returnSkywardHash = F, returnSkywardID = F, returnStateLength = F, returnStateStartPosition = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationFixedLengthFileFormat", CertificationFixedLengthFileFormatID, searchFields, EntityID)
}
#' Modify a specific CertificationFixedLengthFileFormat
#'
#' This function modifies fields for a CertificationFixedLengthFileFormat.
#'
#' @param CertificationFixedLengthFileFormatID The id of the CertificationFixedLengthFileFormat to be modified.\cr Run \code{\link{getAllCertificationFixedLengthFileFormats}} for a list of CertificationFixedLengthFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationFixedLengthFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationFixedLengthFileFormat <- function(CertificationFixedLengthFileFormatID, EntityID = 1, setCertificationCompetencyLength = NULL, setCertificationCompetencyStartPosition = NULL, setCertificationDetailExpirationDateLength = NULL, setCertificationDetailExpirationDateStartPosition = NULL, setCertificationDetailIssueDateLength = NULL, setCertificationDetailIssueDateStartPosition = NULL, setCertificationLevelLength = NULL, setCertificationLevelStartPosition = NULL, setCertificationNumberLength = NULL, setCertificationNumberStartPosition = NULL, setCertificationSubjectLength = NULL, setCertificationSubjectStartPosition = NULL, setCertificationThirdPartyFormatID = NULL, setCertificationTypeLength = NULL, setCertificationTypeStartPosition = NULL, setCommentLength = NULL, setCommentStartPosition = NULL, setEmployeeLength = NULL, setEmployeeStartPosition = NULL, setExpirationDateLength = NULL, setExpirationDateStartPosition = NULL, setHighCertificationGradeLength = NULL, setHighCertificationGradeStartPosition = NULL, setHighlyQualifiedLength = NULL, setHighlyQualifiedStartPosition = NULL, setInstitutionNameLength = NULL, setInstitutionNameStartPosition = NULL, setIssueDateLength = NULL, setIssueDateStartPosition = NULL, setLowCertificationGradeLength = NULL, setLowCertificationGradeStartPosition = NULL, setNumberOfHeaderRows = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateLength = NULL, setStateStartPosition = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationFixedLengthFileFormat", CertificationFixedLengthFileFormatID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationFixedLengthFileFormat.
#'
#' This function creates a new CertificationFixedLengthFileFormat.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationFixedLengthFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationFixedLengthFileFormat <- function(EntityID = 1, setCertificationCompetencyLength = NULL, setCertificationCompetencyStartPosition = NULL, setCertificationDetailExpirationDateLength = NULL, setCertificationDetailExpirationDateStartPosition = NULL, setCertificationDetailIssueDateLength = NULL, setCertificationDetailIssueDateStartPosition = NULL, setCertificationLevelLength = NULL, setCertificationLevelStartPosition = NULL, setCertificationNumberLength = NULL, setCertificationNumberStartPosition = NULL, setCertificationSubjectLength = NULL, setCertificationSubjectStartPosition = NULL, setCertificationThirdPartyFormatID = NULL, setCertificationTypeLength = NULL, setCertificationTypeStartPosition = NULL, setCommentLength = NULL, setCommentStartPosition = NULL, setEmployeeLength = NULL, setEmployeeStartPosition = NULL, setExpirationDateLength = NULL, setExpirationDateStartPosition = NULL, setHighCertificationGradeLength = NULL, setHighCertificationGradeStartPosition = NULL, setHighlyQualifiedLength = NULL, setHighlyQualifiedStartPosition = NULL, setInstitutionNameLength = NULL, setInstitutionNameStartPosition = NULL, setIssueDateLength = NULL, setIssueDateStartPosition = NULL, setLowCertificationGradeLength = NULL, setLowCertificationGradeStartPosition = NULL, setNumberOfHeaderRows = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateLength = NULL, setStateStartPosition = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationFixedLengthFileFormat", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationFixedLengthFileFormat
#'
#' This function deletes a CertificationFixedLengthFileFormat.
#'
#' @param CertificationFixedLengthFileFormatID The id of the CertificationFixedLengthFileFormat.\cr Run \code{\link{getAllCertificationFixedLengthFileFormats}} for a list of CertificationFixedLengthFileFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationFixedLengthFileFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationFixedLengthFileFormat <- function(CertificationFixedLengthFileFormatID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationFixedLengthFileFormat", CertificationFixedLengthFileFormatID, EntityID)
}
#' Get all CertificationGrades.
#'
#' This function returns a dataframe of all CertificationGrades in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationGrades in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationGrades <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationGradeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationGrade", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationGrade
#'
#' This function returns fields for a CertificationGrade.
#'
#' @param CertificationGradeID The id of the CertificationGrade.\cr Run \code{\link{getAllCertificationGrades}} for a list of CertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationGrade <- function(CertificationGradeID, EntityID = 1, returnCertificationGradeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationGrade", CertificationGradeID, searchFields, EntityID)
}
#' Modify a specific CertificationGrade
#'
#' This function modifies fields for a CertificationGrade.
#'
#' @param CertificationGradeID The id of the CertificationGrade to be modified.\cr Run \code{\link{getAllCertificationGrades}} for a list of CertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationGrade <- function(CertificationGradeID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationGrade", CertificationGradeID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationGrade.
#'
#' This function creates a new CertificationGrade.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationGrade <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationGrade", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationGrade
#'
#' This function deletes a CertificationGrade.
#'
#' @param CertificationGradeID The id of the CertificationGrade.\cr Run \code{\link{getAllCertificationGrades}} for a list of CertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationGrade <- function(CertificationGradeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationGrade", CertificationGradeID, EntityID)
}
#' Get all CertificationLevels.
#'
#' This function returns a dataframe of all CertificationLevels in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationLevels in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationLevels <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationLevelID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationLevel", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationLevel
#'
#' This function returns fields for a CertificationLevel.
#'
#' @param CertificationLevelID The id of the CertificationLevel.\cr Run \code{\link{getAllCertificationLevels}} for a list of CertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationLevel <- function(CertificationLevelID, EntityID = 1, returnCertificationLevelID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationLevel", CertificationLevelID, searchFields, EntityID)
}
#' Modify a specific CertificationLevel
#'
#' This function modifies fields for a CertificationLevel.
#'
#' @param CertificationLevelID The id of the CertificationLevel to be modified.\cr Run \code{\link{getAllCertificationLevels}} for a list of CertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationLevel <- function(CertificationLevelID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationLevel", CertificationLevelID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationLevel.
#'
#' This function creates a new CertificationLevel.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationLevel <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationLevel", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationLevel
#'
#' This function deletes a CertificationLevel.
#'
#' @param CertificationLevelID The id of the CertificationLevel.\cr Run \code{\link{getAllCertificationLevels}} for a list of CertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationLevel <- function(CertificationLevelID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationLevel", CertificationLevelID, EntityID)
}
#' Get all CertificationSubjects.
#'
#' This function returns a dataframe of all CertificationSubjects in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationSubjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationSubjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationSubjectID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationSubject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationSubject
#'
#' This function returns fields for a CertificationSubject.
#'
#' @param CertificationSubjectID The id of the CertificationSubject.\cr Run \code{\link{getAllCertificationSubjects}} for a list of CertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationSubject <- function(CertificationSubjectID, EntityID = 1, returnCertificationSubjectID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationSubject", CertificationSubjectID, searchFields, EntityID)
}
#' Modify a specific CertificationSubject
#'
#' This function modifies fields for a CertificationSubject.
#'
#' @param CertificationSubjectID The id of the CertificationSubject to be modified.\cr Run \code{\link{getAllCertificationSubjects}} for a list of CertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationSubject <- function(CertificationSubjectID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationSubject", CertificationSubjectID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationSubject.
#'
#' This function creates a new CertificationSubject.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationSubject <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationSubject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationSubject
#'
#' This function deletes a CertificationSubject.
#'
#' @param CertificationSubjectID The id of the CertificationSubject.\cr Run \code{\link{getAllCertificationSubjects}} for a list of CertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationSubject <- function(CertificationSubjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationSubject", CertificationSubjectID, EntityID)
}
#' Get all CertificationThirdPartyFormats.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormats in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormats in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormats <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDateFormat = F, returnDateFormatCode = F, returnDescription = F, returnDistrictID = F, returnImportType = F, returnImportTypeCode = F, returnIsSystemLoaded = F, returnModifiedTime = F, returnNameIdentification = F, returnNameIdentificationCode = F, returnSkywardHash = F, returnSkywardID = F, returnSkywardIDClonedFrom = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormat", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormat
#'
#' This function returns fields for a CertificationThirdPartyFormat.
#'
#' @param CertificationThirdPartyFormatID The id of the CertificationThirdPartyFormat.\cr Run \code{\link{getAllCertificationThirdPartyFormats}} for a list of CertificationThirdPartyFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormat <- function(CertificationThirdPartyFormatID, EntityID = 1, returnCertificationThirdPartyFormatID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDateFormat = F, returnDateFormatCode = F, returnDescription = F, returnDistrictID = F, returnImportType = F, returnImportTypeCode = F, returnIsSystemLoaded = F, returnModifiedTime = F, returnNameIdentification = F, returnNameIdentificationCode = F, returnSkywardHash = F, returnSkywardID = F, returnSkywardIDClonedFrom = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormat", CertificationThirdPartyFormatID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormat
#'
#' This function modifies fields for a CertificationThirdPartyFormat.
#'
#' @param CertificationThirdPartyFormatID The id of the CertificationThirdPartyFormat to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormats}} for a list of CertificationThirdPartyFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormat <- function(CertificationThirdPartyFormatID, EntityID = 1, setCode = NULL, setDateFormat = NULL, setDateFormatCode = NULL, setDescription = NULL, setDistrictID = NULL, setImportType = NULL, setImportTypeCode = NULL, setNameIdentification = NULL, setNameIdentificationCode = NULL, setSkywardHash = NULL, setSkywardID = NULL, setSkywardIDClonedFrom = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormat", CertificationThirdPartyFormatID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormat.
#'
#' This function creates a new CertificationThirdPartyFormat.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormat <- function(EntityID = 1, setCode = NULL, setDateFormat = NULL, setDateFormatCode = NULL, setDescription = NULL, setDistrictID = NULL, setImportType = NULL, setImportTypeCode = NULL, setNameIdentification = NULL, setNameIdentificationCode = NULL, setSkywardHash = NULL, setSkywardID = NULL, setSkywardIDClonedFrom = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormat", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormat
#'
#' This function deletes a CertificationThirdPartyFormat.
#'
#' @param CertificationThirdPartyFormatID The id of the CertificationThirdPartyFormat.\cr Run \code{\link{getAllCertificationThirdPartyFormats}} for a list of CertificationThirdPartyFormats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormat <- function(CertificationThirdPartyFormatID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormat", CertificationThirdPartyFormatID, EntityID)
}
#' Get all CertificationThirdPartyFormatCertificationCompetencies.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatCertificationCompetencies in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatCertificationCompetencies in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatCertificationCompetencies <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatCertificationCompetencyID = F, returnCertificationCompetencyID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatCertificationCompetency", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatCertificationCompetency
#'
#' This function returns fields for a CertificationThirdPartyFormatCertificationCompetency.
#'
#' @param CertificationThirdPartyFormatCertificationCompetencyID The id of the CertificationThirdPartyFormatCertificationCompetency.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationCompetencies}} for a list of CertificationThirdPartyFormatCertificationCompetencies.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatCertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatCertificationCompetency <- function(CertificationThirdPartyFormatCertificationCompetencyID, EntityID = 1, returnCertificationThirdPartyFormatCertificationCompetencyID = F, returnCertificationCompetencyID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatCertificationCompetency", CertificationThirdPartyFormatCertificationCompetencyID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatCertificationCompetency
#'
#' This function modifies fields for a CertificationThirdPartyFormatCertificationCompetency.
#'
#' @param CertificationThirdPartyFormatCertificationCompetencyID The id of the CertificationThirdPartyFormatCertificationCompetency to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationCompetencies}} for a list of CertificationThirdPartyFormatCertificationCompetencys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatCertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatCertificationCompetency <- function(CertificationThirdPartyFormatCertificationCompetencyID, EntityID = 1, setCertificationCompetencyID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatCertificationCompetency", CertificationThirdPartyFormatCertificationCompetencyID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatCertificationCompetency.
#'
#' This function creates a new CertificationThirdPartyFormatCertificationCompetency.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatCertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatCertificationCompetency <- function(EntityID = 1, setCertificationCompetencyID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatCertificationCompetency", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatCertificationCompetency
#'
#' This function deletes a CertificationThirdPartyFormatCertificationCompetency.
#'
#' @param CertificationThirdPartyFormatCertificationCompetencyID The id of the CertificationThirdPartyFormatCertificationCompetency.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationCompetencies}} for a list of CertificationThirdPartyFormatCertificationCompetencies.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatCertificationCompetency.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatCertificationCompetency <- function(CertificationThirdPartyFormatCertificationCompetencyID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatCertificationCompetency", CertificationThirdPartyFormatCertificationCompetencyID, EntityID)
}
#' Get all CertificationThirdPartyFormatCertificationGrades.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatCertificationGrades in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatCertificationGrades in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatCertificationGrades <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatCertificationGradeID = F, returnCertificationGradeID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatCertificationGrade", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatCertificationGrade
#'
#' This function returns fields for a CertificationThirdPartyFormatCertificationGrade.
#'
#' @param CertificationThirdPartyFormatCertificationGradeID The id of the CertificationThirdPartyFormatCertificationGrade.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationGrades}} for a list of CertificationThirdPartyFormatCertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatCertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatCertificationGrade <- function(CertificationThirdPartyFormatCertificationGradeID, EntityID = 1, returnCertificationThirdPartyFormatCertificationGradeID = F, returnCertificationGradeID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatCertificationGrade", CertificationThirdPartyFormatCertificationGradeID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatCertificationGrade
#'
#' This function modifies fields for a CertificationThirdPartyFormatCertificationGrade.
#'
#' @param CertificationThirdPartyFormatCertificationGradeID The id of the CertificationThirdPartyFormatCertificationGrade to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationGrades}} for a list of CertificationThirdPartyFormatCertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatCertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatCertificationGrade <- function(CertificationThirdPartyFormatCertificationGradeID, EntityID = 1, setCertificationGradeID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatCertificationGrade", CertificationThirdPartyFormatCertificationGradeID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatCertificationGrade.
#'
#' This function creates a new CertificationThirdPartyFormatCertificationGrade.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatCertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatCertificationGrade <- function(EntityID = 1, setCertificationGradeID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatCertificationGrade", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatCertificationGrade
#'
#' This function deletes a CertificationThirdPartyFormatCertificationGrade.
#'
#' @param CertificationThirdPartyFormatCertificationGradeID The id of the CertificationThirdPartyFormatCertificationGrade.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationGrades}} for a list of CertificationThirdPartyFormatCertificationGrades.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatCertificationGrade.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatCertificationGrade <- function(CertificationThirdPartyFormatCertificationGradeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatCertificationGrade", CertificationThirdPartyFormatCertificationGradeID, EntityID)
}
#' Get all CertificationThirdPartyFormatCertificationLevels.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatCertificationLevels in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatCertificationLevels in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatCertificationLevels <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatCertificationLevelID = F, returnCertificationLevelID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatCertificationLevel", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatCertificationLevel
#'
#' This function returns fields for a CertificationThirdPartyFormatCertificationLevel.
#'
#' @param CertificationThirdPartyFormatCertificationLevelID The id of the CertificationThirdPartyFormatCertificationLevel.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationLevels}} for a list of CertificationThirdPartyFormatCertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatCertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatCertificationLevel <- function(CertificationThirdPartyFormatCertificationLevelID, EntityID = 1, returnCertificationThirdPartyFormatCertificationLevelID = F, returnCertificationLevelID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatCertificationLevel", CertificationThirdPartyFormatCertificationLevelID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatCertificationLevel
#'
#' This function modifies fields for a CertificationThirdPartyFormatCertificationLevel.
#'
#' @param CertificationThirdPartyFormatCertificationLevelID The id of the CertificationThirdPartyFormatCertificationLevel to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationLevels}} for a list of CertificationThirdPartyFormatCertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatCertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatCertificationLevel <- function(CertificationThirdPartyFormatCertificationLevelID, EntityID = 1, setCertificationLevelID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatCertificationLevel", CertificationThirdPartyFormatCertificationLevelID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatCertificationLevel.
#'
#' This function creates a new CertificationThirdPartyFormatCertificationLevel.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatCertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatCertificationLevel <- function(EntityID = 1, setCertificationLevelID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatCertificationLevel", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatCertificationLevel
#'
#' This function deletes a CertificationThirdPartyFormatCertificationLevel.
#'
#' @param CertificationThirdPartyFormatCertificationLevelID The id of the CertificationThirdPartyFormatCertificationLevel.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationLevels}} for a list of CertificationThirdPartyFormatCertificationLevels.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatCertificationLevel.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatCertificationLevel <- function(CertificationThirdPartyFormatCertificationLevelID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatCertificationLevel", CertificationThirdPartyFormatCertificationLevelID, EntityID)
}
#' Get all CertificationThirdPartyFormatCertificationSubjects.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatCertificationSubjects in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatCertificationSubjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatCertificationSubjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatCertificationSubjectID = F, returnCertificationSubjectID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatCertificationSubject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatCertificationSubject
#'
#' This function returns fields for a CertificationThirdPartyFormatCertificationSubject.
#'
#' @param CertificationThirdPartyFormatCertificationSubjectID The id of the CertificationThirdPartyFormatCertificationSubject.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationSubjects}} for a list of CertificationThirdPartyFormatCertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatCertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatCertificationSubject <- function(CertificationThirdPartyFormatCertificationSubjectID, EntityID = 1, returnCertificationThirdPartyFormatCertificationSubjectID = F, returnCertificationSubjectID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatCertificationSubject", CertificationThirdPartyFormatCertificationSubjectID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatCertificationSubject
#'
#' This function modifies fields for a CertificationThirdPartyFormatCertificationSubject.
#'
#' @param CertificationThirdPartyFormatCertificationSubjectID The id of the CertificationThirdPartyFormatCertificationSubject to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationSubjects}} for a list of CertificationThirdPartyFormatCertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatCertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatCertificationSubject <- function(CertificationThirdPartyFormatCertificationSubjectID, EntityID = 1, setCertificationSubjectID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatCertificationSubject", CertificationThirdPartyFormatCertificationSubjectID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatCertificationSubject.
#'
#' This function creates a new CertificationThirdPartyFormatCertificationSubject.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatCertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatCertificationSubject <- function(EntityID = 1, setCertificationSubjectID = NULL, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatCertificationSubject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatCertificationSubject
#'
#' This function deletes a CertificationThirdPartyFormatCertificationSubject.
#'
#' @param CertificationThirdPartyFormatCertificationSubjectID The id of the CertificationThirdPartyFormatCertificationSubject.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationSubjects}} for a list of CertificationThirdPartyFormatCertificationSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatCertificationSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatCertificationSubject <- function(CertificationThirdPartyFormatCertificationSubjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatCertificationSubject", CertificationThirdPartyFormatCertificationSubjectID, EntityID)
}
#' Get all CertificationThirdPartyFormatCertificationTypes.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatCertificationTypes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatCertificationTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatCertificationTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatCertificationTypeID = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatCertificationType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatCertificationType
#'
#' This function returns fields for a CertificationThirdPartyFormatCertificationType.
#'
#' @param CertificationThirdPartyFormatCertificationTypeID The id of the CertificationThirdPartyFormatCertificationType.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationTypes}} for a list of CertificationThirdPartyFormatCertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatCertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatCertificationType <- function(CertificationThirdPartyFormatCertificationTypeID, EntityID = 1, returnCertificationThirdPartyFormatCertificationTypeID = F, returnCertificationThirdPartyFormatID = F, returnCertificationTypeID = F, returnCreatedTime = F, returnImportValue = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatCertificationType", CertificationThirdPartyFormatCertificationTypeID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatCertificationType
#'
#' This function modifies fields for a CertificationThirdPartyFormatCertificationType.
#'
#' @param CertificationThirdPartyFormatCertificationTypeID The id of the CertificationThirdPartyFormatCertificationType to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationTypes}} for a list of CertificationThirdPartyFormatCertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatCertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatCertificationType <- function(CertificationThirdPartyFormatCertificationTypeID, EntityID = 1, setCertificationThirdPartyFormatID = NULL, setCertificationTypeID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatCertificationType", CertificationThirdPartyFormatCertificationTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatCertificationType.
#'
#' This function creates a new CertificationThirdPartyFormatCertificationType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatCertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatCertificationType <- function(EntityID = 1, setCertificationThirdPartyFormatID = NULL, setCertificationTypeID = NULL, setImportValue = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatCertificationType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatCertificationType
#'
#' This function deletes a CertificationThirdPartyFormatCertificationType.
#'
#' @param CertificationThirdPartyFormatCertificationTypeID The id of the CertificationThirdPartyFormatCertificationType.\cr Run \code{\link{getAllCertificationThirdPartyFormatCertificationTypes}} for a list of CertificationThirdPartyFormatCertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatCertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatCertificationType <- function(CertificationThirdPartyFormatCertificationTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatCertificationType", CertificationThirdPartyFormatCertificationTypeID, EntityID)
}
#' Get all CertificationThirdPartyFormatInstitutions.
#'
#' This function returns a dataframe of all CertificationThirdPartyFormatInstitutions in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyFormatInstitutions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyFormatInstitutions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyFormatInstitutionID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnInstitutionID = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyFormatInstitution", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyFormatInstitution
#'
#' This function returns fields for a CertificationThirdPartyFormatInstitution.
#'
#' @param CertificationThirdPartyFormatInstitutionID The id of the CertificationThirdPartyFormatInstitution.\cr Run \code{\link{getAllCertificationThirdPartyFormatInstitutions}} for a list of CertificationThirdPartyFormatInstitutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyFormatInstitution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyFormatInstitution <- function(CertificationThirdPartyFormatInstitutionID, EntityID = 1, returnCertificationThirdPartyFormatInstitutionID = F, returnCertificationThirdPartyFormatID = F, returnCreatedTime = F, returnImportValue = F, returnInstitutionID = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyFormatInstitution", CertificationThirdPartyFormatInstitutionID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyFormatInstitution
#'
#' This function modifies fields for a CertificationThirdPartyFormatInstitution.
#'
#' @param CertificationThirdPartyFormatInstitutionID The id of the CertificationThirdPartyFormatInstitution to be modified.\cr Run \code{\link{getAllCertificationThirdPartyFormatInstitutions}} for a list of CertificationThirdPartyFormatInstitutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyFormatInstitution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyFormatInstitution <- function(CertificationThirdPartyFormatInstitutionID, EntityID = 1, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL, setInstitutionID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyFormatInstitution", CertificationThirdPartyFormatInstitutionID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyFormatInstitution.
#'
#' This function creates a new CertificationThirdPartyFormatInstitution.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyFormatInstitution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyFormatInstitution <- function(EntityID = 1, setCertificationThirdPartyFormatID = NULL, setImportValue = NULL, setInstitutionID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyFormatInstitution", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyFormatInstitution
#'
#' This function deletes a CertificationThirdPartyFormatInstitution.
#'
#' @param CertificationThirdPartyFormatInstitutionID The id of the CertificationThirdPartyFormatInstitution.\cr Run \code{\link{getAllCertificationThirdPartyFormatInstitutions}} for a list of CertificationThirdPartyFormatInstitutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyFormatInstitution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyFormatInstitution <- function(CertificationThirdPartyFormatInstitutionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyFormatInstitution", CertificationThirdPartyFormatInstitutionID, EntityID)
}
#' Get all CertificationThirdPartyImports.
#'
#' This function returns a dataframe of all CertificationThirdPartyImports in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationThirdPartyImports in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationThirdPartyImports <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationThirdPartyImportID = F, returnCreatedTime = F, returnImportTime = F, returnMediaID = F, returnMediaIDFailedResult = F, returnModifiedTime = F, returnThirdPartyFormatID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationThirdPartyImport", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationThirdPartyImport
#'
#' This function returns fields for a CertificationThirdPartyImport.
#'
#' @param CertificationThirdPartyImportID The id of the CertificationThirdPartyImport.\cr Run \code{\link{getAllCertificationThirdPartyImports}} for a list of CertificationThirdPartyImports.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationThirdPartyImport.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationThirdPartyImport <- function(CertificationThirdPartyImportID, EntityID = 1, returnCertificationThirdPartyImportID = F, returnCreatedTime = F, returnImportTime = F, returnMediaID = F, returnMediaIDFailedResult = F, returnModifiedTime = F, returnThirdPartyFormatID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationThirdPartyImport", CertificationThirdPartyImportID, searchFields, EntityID)
}
#' Modify a specific CertificationThirdPartyImport
#'
#' This function modifies fields for a CertificationThirdPartyImport.
#'
#' @param CertificationThirdPartyImportID The id of the CertificationThirdPartyImport to be modified.\cr Run \code{\link{getAllCertificationThirdPartyImports}} for a list of CertificationThirdPartyImports.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationThirdPartyImport.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationThirdPartyImport <- function(CertificationThirdPartyImportID, EntityID = 1, setImportTime = NULL, setMediaID = NULL, setMediaIDFailedResult = NULL, setThirdPartyFormatID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationThirdPartyImport", CertificationThirdPartyImportID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationThirdPartyImport.
#'
#' This function creates a new CertificationThirdPartyImport.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationThirdPartyImport.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationThirdPartyImport <- function(EntityID = 1, setImportTime = NULL, setMediaID = NULL, setMediaIDFailedResult = NULL, setThirdPartyFormatID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationThirdPartyImport", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationThirdPartyImport
#'
#' This function deletes a CertificationThirdPartyImport.
#'
#' @param CertificationThirdPartyImportID The id of the CertificationThirdPartyImport.\cr Run \code{\link{getAllCertificationThirdPartyImports}} for a list of CertificationThirdPartyImports.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationThirdPartyImport.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationThirdPartyImport <- function(CertificationThirdPartyImportID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationThirdPartyImport", CertificationThirdPartyImportID, EntityID)
}
#' Get all CertificationTypes.
#'
#' This function returns a dataframe of all CertificationTypes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All CertificationTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCertificationTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCertificationTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnIsCRDCCertified = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "CertificationType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CertificationType
#'
#' This function returns fields for a CertificationType.
#'
#' @param CertificationTypeID The id of the CertificationType.\cr Run \code{\link{getAllCertificationTypes}} for a list of CertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the CertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCertificationType <- function(CertificationTypeID, EntityID = 1, returnCertificationTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnIsCRDCCertified = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "CertificationType", CertificationTypeID, searchFields, EntityID)
}
#' Modify a specific CertificationType
#'
#' This function modifies fields for a CertificationType.
#'
#' @param CertificationTypeID The id of the CertificationType to be modified.\cr Run \code{\link{getAllCertificationTypes}} for a list of CertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified CertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCertificationType <- function(CertificationTypeID, EntityID = 1, setCode = NULL, setDescription = NULL, setIsCRDCCertified = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "CertificationType", CertificationTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new CertificationType.
#'
#' This function creates a new CertificationType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created CertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCertificationType <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setIsCRDCCertified = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "CertificationType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CertificationType
#'
#' This function deletes a CertificationType.
#'
#' @param CertificationTypeID The id of the CertificationType.\cr Run \code{\link{getAllCertificationTypes}} for a list of CertificationTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted CertificationType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCertificationType <- function(CertificationTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "CertificationType", CertificationTypeID, EntityID)
}
#' Get all ConfigDistricts.
#'
#' This function returns a dataframe of all ConfigDistricts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All ConfigDistricts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigDistricts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigDistrictID = F, returnCreatedTime = F, returnDistrictID = F, returnEnforceAddressRangeDefaults = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "ConfigDistrict", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigDistrict
#'
#' This function returns fields for a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigDistrict <- function(ConfigDistrictID, EntityID = 1, returnConfigDistrictID = F, returnCreatedTime = F, returnDistrictID = F, returnEnforceAddressRangeDefaults = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "ConfigDistrict", ConfigDistrictID, searchFields, EntityID)
}
#' Modify a specific ConfigDistrict
#'
#' This function modifies fields for a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict to be modified.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigDistrict <- function(ConfigDistrictID, EntityID = 1, setDistrictID = NULL, setEnforceAddressRangeDefaults = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "ConfigDistrict", ConfigDistrictID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigDistrict.
#'
#' This function creates a new ConfigDistrict.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigDistrict <- function(EntityID = 1, setDistrictID = NULL, setEnforceAddressRangeDefaults = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "ConfigDistrict", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigDistrict
#'
#' This function deletes a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigDistrict <- function(ConfigDistrictID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "ConfigDistrict", ConfigDistrictID, EntityID)
}
#' Get all ConfigSystems.
#'
#' This function returns a dataframe of all ConfigSystems in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All ConfigSystems in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigSystems <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigSystemID = F, returnCreatedTime = F, returnDefaultCaseAddressType = F, returnDefaultCaseAddressTypeCode = F, returnDefaultCaseNameType = F, returnDefaultCaseNameTypeCode = F, returnModifiedTime = F, returnNameNumberLength = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseSyncedNameNumber = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "ConfigSystem", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigSystem
#'
#' This function returns fields for a ConfigSystem.
#'
#' @param ConfigSystemID The id of the ConfigSystem.\cr Run \code{\link{getAllConfigSystems}} for a list of ConfigSystems.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the ConfigSystem.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigSystem <- function(ConfigSystemID, EntityID = 1, returnConfigSystemID = F, returnCreatedTime = F, returnDefaultCaseAddressType = F, returnDefaultCaseAddressTypeCode = F, returnDefaultCaseNameType = F, returnDefaultCaseNameTypeCode = F, returnModifiedTime = F, returnNameNumberLength = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseSyncedNameNumber = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "ConfigSystem", ConfigSystemID, searchFields, EntityID)
}
#' Modify a specific ConfigSystem
#'
#' This function modifies fields for a ConfigSystem.
#'
#' @param ConfigSystemID The id of the ConfigSystem to be modified.\cr Run \code{\link{getAllConfigSystems}} for a list of ConfigSystems.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified ConfigSystem.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigSystem <- function(ConfigSystemID, EntityID = 1, setDefaultCaseAddressType = NULL, setDefaultCaseAddressTypeCode = NULL, setDefaultCaseNameType = NULL, setDefaultCaseNameTypeCode = NULL, setNameNumberLength = NULL, setUseSyncedNameNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "ConfigSystem", ConfigSystemID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigSystem.
#'
#' This function creates a new ConfigSystem.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created ConfigSystem.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigSystem <- function(EntityID = 1, setDefaultCaseAddressType = NULL, setDefaultCaseAddressTypeCode = NULL, setDefaultCaseNameType = NULL, setDefaultCaseNameTypeCode = NULL, setNameNumberLength = NULL, setUseSyncedNameNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "ConfigSystem", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigSystem
#'
#' This function deletes a ConfigSystem.
#'
#' @param ConfigSystemID The id of the ConfigSystem.\cr Run \code{\link{getAllConfigSystems}} for a list of ConfigSystems.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted ConfigSystem.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigSystem <- function(ConfigSystemID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "ConfigSystem", ConfigSystemID, EntityID)
}
#' Get all Counties.
#'
#' This function returns a dataframe of all Counties in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Counties in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCounties <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCountyID = F, returnCountyMNID = F, returnCreatedTime = F, returnModifiedTime = F, returnName = F, returnStateCountyMNID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "County", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific County
#'
#' This function returns fields for a County.
#'
#' @param CountyID The id of the County.\cr Run \code{\link{getAllCounties}} for a list of Counties.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the County.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCounty <- function(CountyID, EntityID = 1, returnCountyID = F, returnCountyMNID = F, returnCreatedTime = F, returnModifiedTime = F, returnName = F, returnStateCountyMNID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "County", CountyID, searchFields, EntityID)
}
#' Modify a specific County
#'
#' This function modifies fields for a County.
#'
#' @param CountyID The id of the County to be modified.\cr Run \code{\link{getAllCounties}} for a list of Countys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified County.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCounty <- function(CountyID, EntityID = 1, setName = NULL, setStateCountyMNID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "County", CountyID, names(functionParams), functionParams, EntityID)
}
#' Create new County.
#'
#' This function creates a new County.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created County.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCounty <- function(EntityID = 1, setName = NULL, setStateCountyMNID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "County", names(functionParams), functionParams, EntityID)
}
#' Delete a specific County
#'
#' This function deletes a County.
#'
#' @param CountyID The id of the County.\cr Run \code{\link{getAllCounties}} for a list of Counties.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted County.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCounty <- function(CountyID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "County", CountyID, EntityID)
}
#' Get all Dependents.
#'
#' This function returns a dataframe of all Dependents in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Dependents in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDependents <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDependentID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameIDDependent = F, returnNameIDOwner = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Dependent", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Dependent
#'
#' This function returns fields for a Dependent.
#'
#' @param DependentID The id of the Dependent.\cr Run \code{\link{getAllDependents}} for a list of Dependents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Dependent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDependent <- function(DependentID, EntityID = 1, returnDependentID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameIDDependent = F, returnNameIDOwner = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Dependent", DependentID, searchFields, EntityID)
}
#' Modify a specific Dependent
#'
#' This function modifies fields for a Dependent.
#'
#' @param DependentID The id of the Dependent to be modified.\cr Run \code{\link{getAllDependents}} for a list of Dependents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Dependent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDependent <- function(DependentID, EntityID = 1, setNameIDDependent = NULL, setNameIDOwner = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Dependent", DependentID, names(functionParams), functionParams, EntityID)
}
#' Create new Dependent.
#'
#' This function creates a new Dependent.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Dependent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDependent <- function(EntityID = 1, setNameIDDependent = NULL, setNameIDOwner = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Dependent", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Dependent
#'
#' This function deletes a Dependent.
#'
#' @param DependentID The id of the Dependent.\cr Run \code{\link{getAllDependents}} for a list of Dependents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Dependent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDependent <- function(DependentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Dependent", DependentID, EntityID)
}
#' Get all Directionals.
#'
#' This function returns a dataframe of all Directionals in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Directionals in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDirectionals <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDirectionalID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Directional", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Directional
#'
#' This function returns fields for a Directional.
#'
#' @param DirectionalID The id of the Directional.\cr Run \code{\link{getAllDirectionals}} for a list of Directionals.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Directional.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDirectional <- function(DirectionalID, EntityID = 1, returnDirectionalID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Directional", DirectionalID, searchFields, EntityID)
}
#' Modify a specific Directional
#'
#' This function modifies fields for a Directional.
#'
#' @param DirectionalID The id of the Directional to be modified.\cr Run \code{\link{getAllDirectionals}} for a list of Directionals.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Directional.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDirectional <- function(DirectionalID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Directional", DirectionalID, names(functionParams), functionParams, EntityID)
}
#' Create new Directional.
#'
#' This function creates a new Directional.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Directional.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDirectional <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Directional", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Directional
#'
#' This function deletes a Directional.
#'
#' @param DirectionalID The id of the Directional.\cr Run \code{\link{getAllDirectionals}} for a list of Directionals.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Directional.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDirectional <- function(DirectionalID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Directional", DirectionalID, EntityID)
}
#' Get all EmailTypes.
#'
#' This function returns a dataframe of all EmailTypes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All EmailTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEmailTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEmailTypeID = F, returnARConfigDistrictEmailTypeRank = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnPreventFamilyStudentAccessUpdates = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "EmailType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EmailType
#'
#' This function returns fields for an EmailType.
#'
#' @param EmailTypeID The id of the EmailType.\cr Run \code{\link{getAllEmailTypes}} for a list of EmailTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the EmailType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEmailType <- function(EmailTypeID, EntityID = 1, returnEmailTypeID = F, returnARConfigDistrictEmailTypeRank = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnPreventFamilyStudentAccessUpdates = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "EmailType", EmailTypeID, searchFields, EntityID)
}
#' Modify a specific EmailType
#'
#' This function modifies fields for an EmailType.
#'
#' @param EmailTypeID The id of the EmailType to be modified.\cr Run \code{\link{getAllEmailTypes}} for a list of EmailTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified EmailType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEmailType <- function(EmailTypeID, EntityID = 1, setCode = NULL, setDescription = NULL, setPreventFamilyStudentAccessUpdates = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "EmailType", EmailTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new EmailType.
#'
#' This function creates a new EmailType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created EmailType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEmailType <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setPreventFamilyStudentAccessUpdates = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "EmailType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EmailType
#'
#' This function deletes an EmailType.
#'
#' @param EmailTypeID The id of the EmailType.\cr Run \code{\link{getAllEmailTypes}} for a list of EmailTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted EmailType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEmailType <- function(EmailTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "EmailType", EmailTypeID, EntityID)
}
#' Get all EmergencyContacts.
#'
#' This function returns a dataframe of all EmergencyContacts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All EmergencyContacts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEmergencyContacts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEmergencyContactID = F, returnAllowPickUp = F, returnComment = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnNameIDEmergencyContact = F, returnRank = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "EmergencyContact", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EmergencyContact
#'
#' This function returns fields for an EmergencyContact.
#'
#' @param EmergencyContactID The id of the EmergencyContact.\cr Run \code{\link{getAllEmergencyContacts}} for a list of EmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the EmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEmergencyContact <- function(EmergencyContactID, EntityID = 1, returnEmergencyContactID = F, returnAllowPickUp = F, returnComment = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnNameIDEmergencyContact = F, returnRank = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "EmergencyContact", EmergencyContactID, searchFields, EntityID)
}
#' Modify a specific EmergencyContact
#'
#' This function modifies fields for an EmergencyContact.
#'
#' @param EmergencyContactID The id of the EmergencyContact to be modified.\cr Run \code{\link{getAllEmergencyContacts}} for a list of EmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified EmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEmergencyContact <- function(EmergencyContactID, EntityID = 1, setAllowPickUp = NULL, setComment = NULL, setNameID = NULL, setNameIDEmergencyContact = NULL, setRank = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "EmergencyContact", EmergencyContactID, names(functionParams), functionParams, EntityID)
}
#' Create new EmergencyContact.
#'
#' This function creates a new EmergencyContact.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created EmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEmergencyContact <- function(EntityID = 1, setAllowPickUp = NULL, setComment = NULL, setNameID = NULL, setNameIDEmergencyContact = NULL, setRank = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "EmergencyContact", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EmergencyContact
#'
#' This function deletes an EmergencyContact.
#'
#' @param EmergencyContactID The id of the EmergencyContact.\cr Run \code{\link{getAllEmergencyContacts}} for a list of EmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted EmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEmergencyContact <- function(EmergencyContactID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "EmergencyContact", EmergencyContactID, EntityID)
}
#' Get all Employers.
#'
#' This function returns a dataframe of all Employers in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Employers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEmployers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEmployerID = F, returnACATransmitterControlCode = F, returnCreatedTime = F, returnDistrictID = F, returnEEO4ControlNumber = F, returnEEO4JurisdictionName = F, returnEEO5NameOfCertifyingOfficial = F, returnEEO5OfficeOfSchoolNumber = F, returnEEO5SchoolDistrictName = F, returnEEOCTitleOfCertifyingOfficial = F, returnEmployerMNID = F, returnFederalEEO4FunctionID = F, returnModifiedTime = F, returnNameID = F, returnPERAEmployerNumber = F, returnTRACountyGroupNumber = F, returnTRADistrictUnitNumber = F, returnUnemploymentInsuranceAccountNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Employer", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Employer
#'
#' This function returns fields for an Employer.
#'
#' @param EmployerID The id of the Employer.\cr Run \code{\link{getAllEmployers}} for a list of Employers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Employer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEmployer <- function(EmployerID, EntityID = 1, returnEmployerID = F, returnACATransmitterControlCode = F, returnCreatedTime = F, returnDistrictID = F, returnEEO4ControlNumber = F, returnEEO4JurisdictionName = F, returnEEO5NameOfCertifyingOfficial = F, returnEEO5OfficeOfSchoolNumber = F, returnEEO5SchoolDistrictName = F, returnEEOCTitleOfCertifyingOfficial = F, returnEmployerMNID = F, returnFederalEEO4FunctionID = F, returnModifiedTime = F, returnNameID = F, returnPERAEmployerNumber = F, returnTRACountyGroupNumber = F, returnTRADistrictUnitNumber = F, returnUnemploymentInsuranceAccountNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Employer", EmployerID, searchFields, EntityID)
}
#' Modify a specific Employer
#'
#' This function modifies fields for an Employer.
#'
#' @param EmployerID The id of the Employer to be modified.\cr Run \code{\link{getAllEmployers}} for a list of Employers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Employer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEmployer <- function(EmployerID, EntityID = 1, setACATransmitterControlCode = NULL, setDistrictID = NULL, setEEO4ControlNumber = NULL, setEEO4JurisdictionName = NULL, setEEO5NameOfCertifyingOfficial = NULL, setEEO5OfficeOfSchoolNumber = NULL, setEEO5SchoolDistrictName = NULL, setEEOCTitleOfCertifyingOfficial = NULL, setFederalEEO4FunctionID = NULL, setNameID = NULL, setPERAEmployerNumber = NULL, setTRACountyGroupNumber = NULL, setTRADistrictUnitNumber = NULL, setUnemploymentInsuranceAccountNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Employer", EmployerID, names(functionParams), functionParams, EntityID)
}
#' Create new Employer.
#'
#' This function creates a new Employer.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Employer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEmployer <- function(EntityID = 1, setACATransmitterControlCode = NULL, setDistrictID = NULL, setEEO4ControlNumber = NULL, setEEO4JurisdictionName = NULL, setEEO5NameOfCertifyingOfficial = NULL, setEEO5OfficeOfSchoolNumber = NULL, setEEO5SchoolDistrictName = NULL, setEEOCTitleOfCertifyingOfficial = NULL, setFederalEEO4FunctionID = NULL, setNameID = NULL, setPERAEmployerNumber = NULL, setTRACountyGroupNumber = NULL, setTRADistrictUnitNumber = NULL, setUnemploymentInsuranceAccountNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Employer", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Employer
#'
#' This function deletes an Employer.
#'
#' @param EmployerID The id of the Employer.\cr Run \code{\link{getAllEmployers}} for a list of Employers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Employer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEmployer <- function(EmployerID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Employer", EmployerID, EntityID)
}
#' Get all InstitutionDefaults.
#'
#' This function returns a dataframe of all InstitutionDefaults in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All InstitutionDefaults in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllInstitutionDefaults <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnInstitutionDefaultID = F, returnCEEBCode = F, returnCreatedTime = F, returnInstitutionDefaultMNID = F, returnMCCCCollegeCode = F, returnModifiedTime = F, returnName = F, returnSkywardHash = F, returnSkywardID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "InstitutionDefault", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific InstitutionDefault
#'
#' This function returns fields for an InstitutionDefault.
#'
#' @param InstitutionDefaultID The id of the InstitutionDefault.\cr Run \code{\link{getAllInstitutionDefaults}} for a list of InstitutionDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the InstitutionDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getInstitutionDefault <- function(InstitutionDefaultID, EntityID = 1, returnInstitutionDefaultID = F, returnCEEBCode = F, returnCreatedTime = F, returnInstitutionDefaultMNID = F, returnMCCCCollegeCode = F, returnModifiedTime = F, returnName = F, returnSkywardHash = F, returnSkywardID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "InstitutionDefault", InstitutionDefaultID, searchFields, EntityID)
}
#' Modify a specific InstitutionDefault
#'
#' This function modifies fields for an InstitutionDefault.
#'
#' @param InstitutionDefaultID The id of the InstitutionDefault to be modified.\cr Run \code{\link{getAllInstitutionDefaults}} for a list of InstitutionDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified InstitutionDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyInstitutionDefault <- function(InstitutionDefaultID, EntityID = 1, setCEEBCode = NULL, setMCCCCollegeCode = NULL, setName = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "InstitutionDefault", InstitutionDefaultID, names(functionParams), functionParams, EntityID)
}
#' Create new InstitutionDefault.
#'
#' This function creates a new InstitutionDefault.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created InstitutionDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createInstitutionDefault <- function(EntityID = 1, setCEEBCode = NULL, setMCCCCollegeCode = NULL, setName = NULL, setSkywardHash = NULL, setSkywardID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "InstitutionDefault", names(functionParams), functionParams, EntityID)
}
#' Delete a specific InstitutionDefault
#'
#' This function deletes an InstitutionDefault.
#'
#' @param InstitutionDefaultID The id of the InstitutionDefault.\cr Run \code{\link{getAllInstitutionDefaults}} for a list of InstitutionDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted InstitutionDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteInstitutionDefault <- function(InstitutionDefaultID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "InstitutionDefault", InstitutionDefaultID, EntityID)
}
#' Get all Institutions.
#'
#' This function returns a dataframe of all Institutions in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Institutions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllInstitutions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnInstitutionID = F, returnCEEBCode = F, returnCreatedTime = F, returnInstitutionDefaultID = F, returnInstitutionMNID = F, returnMCCCCollegeCode = F, returnModifiedTime = F, returnNameID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Institution", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Institution
#'
#' This function returns fields for an Institution.
#'
#' @param InstitutionID The id of the Institution.\cr Run \code{\link{getAllInstitutions}} for a list of Institutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Institution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getInstitution <- function(InstitutionID, EntityID = 1, returnInstitutionID = F, returnCEEBCode = F, returnCreatedTime = F, returnInstitutionDefaultID = F, returnInstitutionMNID = F, returnMCCCCollegeCode = F, returnModifiedTime = F, returnNameID = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Institution", InstitutionID, searchFields, EntityID)
}
#' Modify a specific Institution
#'
#' This function modifies fields for an Institution.
#'
#' @param InstitutionID The id of the Institution to be modified.\cr Run \code{\link{getAllInstitutions}} for a list of Institutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Institution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyInstitution <- function(InstitutionID, EntityID = 1, setCEEBCode = NULL, setInstitutionDefaultID = NULL, setMCCCCollegeCode = NULL, setNameID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Institution", InstitutionID, names(functionParams), functionParams, EntityID)
}
#' Create new Institution.
#'
#' This function creates a new Institution.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Institution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createInstitution <- function(EntityID = 1, setCEEBCode = NULL, setInstitutionDefaultID = NULL, setMCCCCollegeCode = NULL, setNameID = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Institution", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Institution
#'
#' This function deletes an Institution.
#'
#' @param InstitutionID The id of the Institution.\cr Run \code{\link{getAllInstitutions}} for a list of Institutions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Institution.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteInstitution <- function(InstitutionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Institution", InstitutionID, EntityID)
}
#' Get all Languages.
#'
#' This function returns a dataframe of all Languages in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Languages in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllLanguages <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnLanguageID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnCurrentStateLanguage = F, returnCurrentStateLanguageCode = F, returnCurrentStateLanguageID = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Language", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Language
#'
#' This function returns fields for a Language.
#'
#' @param LanguageID The id of the Language.\cr Run \code{\link{getAllLanguages}} for a list of Languages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Language.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getLanguage <- function(LanguageID, EntityID = 1, returnLanguageID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnCurrentStateLanguage = F, returnCurrentStateLanguageCode = F, returnCurrentStateLanguageID = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Language", LanguageID, searchFields, EntityID)
}
#' Modify a specific Language
#'
#' This function modifies fields for a Language.
#'
#' @param LanguageID The id of the Language to be modified.\cr Run \code{\link{getAllLanguages}} for a list of Languages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Language.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyLanguage <- function(LanguageID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Language", LanguageID, names(functionParams), functionParams, EntityID)
}
#' Create new Language.
#'
#' This function creates a new Language.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Language.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createLanguage <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Language", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Language
#'
#' This function deletes a Language.
#'
#' @param LanguageID The id of the Language.\cr Run \code{\link{getAllLanguages}} for a list of Languages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Language.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteLanguage <- function(LanguageID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Language", LanguageID, EntityID)
}
#' Get all LanguageSchoolYears.
#'
#' This function returns a dataframe of all LanguageSchoolYears in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All LanguageSchoolYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllLanguageSchoolYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnLanguageSchoolYearID = F, returnCreatedTime = F, returnEdFiLanguageID = F, returnLanguageID = F, returnLanguageSchoolYearIDClonedFrom = F, returnLanguageSchoolYearMNID = F, returnModifiedTime = F, returnSchoolYearID = F, returnStateHeadStartLanguageMNID = F, returnStateLanguageCodeMNID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "LanguageSchoolYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific LanguageSchoolYear
#'
#' This function returns fields for a LanguageSchoolYear.
#'
#' @param LanguageSchoolYearID The id of the LanguageSchoolYear.\cr Run \code{\link{getAllLanguageSchoolYears}} for a list of LanguageSchoolYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the LanguageSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getLanguageSchoolYear <- function(LanguageSchoolYearID, EntityID = 1, returnLanguageSchoolYearID = F, returnCreatedTime = F, returnEdFiLanguageID = F, returnLanguageID = F, returnLanguageSchoolYearIDClonedFrom = F, returnLanguageSchoolYearMNID = F, returnModifiedTime = F, returnSchoolYearID = F, returnStateHeadStartLanguageMNID = F, returnStateLanguageCodeMNID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "LanguageSchoolYear", LanguageSchoolYearID, searchFields, EntityID)
}
#' Modify a specific LanguageSchoolYear
#'
#' This function modifies fields for a LanguageSchoolYear.
#'
#' @param LanguageSchoolYearID The id of the LanguageSchoolYear to be modified.\cr Run \code{\link{getAllLanguageSchoolYears}} for a list of LanguageSchoolYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified LanguageSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyLanguageSchoolYear <- function(LanguageSchoolYearID, EntityID = 1, setEdFiLanguageID = NULL, setLanguageID = NULL, setLanguageSchoolYearIDClonedFrom = NULL, setSchoolYearID = NULL, setStateHeadStartLanguageMNID = NULL, setStateLanguageCodeMNID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "LanguageSchoolYear", LanguageSchoolYearID, names(functionParams), functionParams, EntityID)
}
#' Create new LanguageSchoolYear.
#'
#' This function creates a new LanguageSchoolYear.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created LanguageSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createLanguageSchoolYear <- function(EntityID = 1, setEdFiLanguageID = NULL, setLanguageID = NULL, setLanguageSchoolYearIDClonedFrom = NULL, setSchoolYearID = NULL, setStateHeadStartLanguageMNID = NULL, setStateLanguageCodeMNID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "LanguageSchoolYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific LanguageSchoolYear
#'
#' This function deletes a LanguageSchoolYear.
#'
#' @param LanguageSchoolYearID The id of the LanguageSchoolYear.\cr Run \code{\link{getAllLanguageSchoolYears}} for a list of LanguageSchoolYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted LanguageSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteLanguageSchoolYear <- function(LanguageSchoolYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "LanguageSchoolYear", LanguageSchoolYearID, EntityID)
}
#' Get all LastNameNumbers.
#'
#' This function returns a dataframe of all LastNameNumbers in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All LastNameNumbers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllLastNameNumbers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnLastNameNumberID = F, returnConfigSystemID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "LastNameNumber", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific LastNameNumber
#'
#' This function returns fields for a LastNameNumber.
#'
#' @param LastNameNumberID The id of the LastNameNumber.\cr Run \code{\link{getAllLastNameNumbers}} for a list of LastNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the LastNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getLastNameNumber <- function(LastNameNumberID, EntityID = 1, returnLastNameNumberID = F, returnConfigSystemID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "LastNameNumber", LastNameNumberID, searchFields, EntityID)
}
#' Modify a specific LastNameNumber
#'
#' This function modifies fields for a LastNameNumber.
#'
#' @param LastNameNumberID The id of the LastNameNumber to be modified.\cr Run \code{\link{getAllLastNameNumbers}} for a list of LastNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified LastNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyLastNameNumber <- function(LastNameNumberID, EntityID = 1, setConfigSystemID = NULL, setNameNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "LastNameNumber", LastNameNumberID, names(functionParams), functionParams, EntityID)
}
#' Create new LastNameNumber.
#'
#' This function creates a new LastNameNumber.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created LastNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createLastNameNumber <- function(EntityID = 1, setConfigSystemID = NULL, setNameNumber = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "LastNameNumber", names(functionParams), functionParams, EntityID)
}
#' Delete a specific LastNameNumber
#'
#' This function deletes a LastNameNumber.
#'
#' @param LastNameNumberID The id of the LastNameNumber.\cr Run \code{\link{getAllLastNameNumbers}} for a list of LastNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted LastNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteLastNameNumber <- function(LastNameNumberID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "LastNameNumber", LastNameNumberID, EntityID)
}
#' Get all Names.
#'
#' This function returns a dataframe of all Names in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Names in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNames <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameID = F, returnAge = F, returnBirthDate = F, returnBirthMonth = F, returnBirthMonthDay = F, returnBirthYear = F, returnBypassStudentRaceValidation = F, returnCalculatedPrimaryFormattedPhoneNumber = F, returnContactPerson = F, returnConversionKey = F, returnCreatedTime = F, returnDatePhysicalAddressLastChanged = F, returnDriversLicenseNumber = F, returnEthnicity = F, returnEthnicityAndRace = F, returnExternalUniqueIdentifier = F, returnFamilyStudentAccessStaffNameToUse = F, returnFederalEIN = F, returnFirstInitial = F, returnFirstInitialLastName = F, returnFirstInitialLastNameLegal = F, returnFirstInitialLegal = F, returnFirstName = F, returnFirstNameLegal = F, returnFullNameFL = F, returnFullNameFMIL = F, returnFullNameFML = F, returnFullNameLegalFL = F, returnFullNameLegalFML = F, returnFullNameLegalLFM = F, returnFullNameLF = F, returnFullNameLFM = F, returnGender = F, returnGenderCode = F, returnGetNameUse = F, returnGrandPeopleMAID = F, returnGrandPersonMAID = F, returnHasMailingOrPhysicalAddress = F, returnInitials = F, returnInitialsLegal = F, returnIsAlaskan = F, returnIsAsian = F, returnIsBlack = F, returnIsBusiness = F, returnIsCurrentStudent = F, returnIsEmergencyContactName = F, returnIsEmployeeName = F, returnIsEmployeeNameForDistrict = F, returnIsEmployeeNameOrInEmployeeFamily = F, returnIsFeeManagementCustomerName = F, returnIsFeeManagementPayorName = F, returnIsFoodServiceCustomerName = F, returnIsFoodServicePayorName = F, returnIsGuardianName = F, returnIsHawaiian = F, returnIsHealthProfessionalName = F, returnIsHispanic = F, returnIsInstitution = F, returnIsPayorName = F, returnIsPayorNameForDistrict = F, returnIsPlaceOfEmployment = F, returnIsSingleLegalName = F, returnIsSkyward = F, returnIsStaffName = F, returnIsStudentInDistrict = F, returnIsStudentName = F, returnIsUserName = F, returnIsVendorName = F, returnIsVendorNameForDistrict = F, returnIsWhite = F, returnLastInitial = F, returnLastInitialLegal = F, returnLastName = F, returnLastNameFirstInitial = F, returnLastNameLegal = F, returnMaritalStatus = F, returnMaritalStatusCode = F, returnMaskedSocialSecurityNumber = F, returnMediaIDPhoto = F, returnMiddleInitial = F, returnMiddleInitialLegal = F, returnMiddleName = F, returnMiddleNameLegal = F, returnModifiedTime = F, returnNameAddressMailingID = F, returnNameIDPlaceOfEmployment = F, returnNameKey = F, returnNameNumber = F, returnNameSuffixID = F, returnNameSuffixIDLegal = F, returnNameTitleID = F, returnNameTitleIDLegal = F, returnOccupationID = F, returnRace = F, returnRaceEduphoriaCode = F, returnRaceVerifiedBy = F, returnRaceVerifiedByCode = F, returnRaceVerifiedDate = F, returnSkywardHash = F, returnSkywardID = F, returnSocialSecurityNumber = F, returnSpecifySeparateLegalName = F, returnTitledName = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Name", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Name
#'
#' This function returns fields for a Name.
#'
#' @param NameID The id of the Name.\cr Run \code{\link{getAllNames}} for a list of Names.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Name.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getName <- function(NameID, EntityID = 1, returnNameID = F, returnAge = F, returnBirthDate = F, returnBirthMonth = F, returnBirthMonthDay = F, returnBirthYear = F, returnBypassStudentRaceValidation = F, returnCalculatedPrimaryFormattedPhoneNumber = F, returnContactPerson = F, returnConversionKey = F, returnCreatedTime = F, returnDatePhysicalAddressLastChanged = F, returnDriversLicenseNumber = F, returnEthnicity = F, returnEthnicityAndRace = F, returnExternalUniqueIdentifier = F, returnFamilyStudentAccessStaffNameToUse = F, returnFederalEIN = F, returnFirstInitial = F, returnFirstInitialLastName = F, returnFirstInitialLastNameLegal = F, returnFirstInitialLegal = F, returnFirstName = F, returnFirstNameLegal = F, returnFullNameFL = F, returnFullNameFMIL = F, returnFullNameFML = F, returnFullNameLegalFL = F, returnFullNameLegalFML = F, returnFullNameLegalLFM = F, returnFullNameLF = F, returnFullNameLFM = F, returnGender = F, returnGenderCode = F, returnGetNameUse = F, returnGrandPeopleMAID = F, returnGrandPersonMAID = F, returnHasMailingOrPhysicalAddress = F, returnInitials = F, returnInitialsLegal = F, returnIsAlaskan = F, returnIsAsian = F, returnIsBlack = F, returnIsBusiness = F, returnIsCurrentStudent = F, returnIsEmergencyContactName = F, returnIsEmployeeName = F, returnIsEmployeeNameForDistrict = F, returnIsEmployeeNameOrInEmployeeFamily = F, returnIsFeeManagementCustomerName = F, returnIsFeeManagementPayorName = F, returnIsFoodServiceCustomerName = F, returnIsFoodServicePayorName = F, returnIsGuardianName = F, returnIsHawaiian = F, returnIsHealthProfessionalName = F, returnIsHispanic = F, returnIsInstitution = F, returnIsPayorName = F, returnIsPayorNameForDistrict = F, returnIsPlaceOfEmployment = F, returnIsSingleLegalName = F, returnIsSkyward = F, returnIsStaffName = F, returnIsStudentInDistrict = F, returnIsStudentName = F, returnIsUserName = F, returnIsVendorName = F, returnIsVendorNameForDistrict = F, returnIsWhite = F, returnLastInitial = F, returnLastInitialLegal = F, returnLastName = F, returnLastNameFirstInitial = F, returnLastNameLegal = F, returnMaritalStatus = F, returnMaritalStatusCode = F, returnMaskedSocialSecurityNumber = F, returnMediaIDPhoto = F, returnMiddleInitial = F, returnMiddleInitialLegal = F, returnMiddleName = F, returnMiddleNameLegal = F, returnModifiedTime = F, returnNameAddressMailingID = F, returnNameIDPlaceOfEmployment = F, returnNameKey = F, returnNameNumber = F, returnNameSuffixID = F, returnNameSuffixIDLegal = F, returnNameTitleID = F, returnNameTitleIDLegal = F, returnOccupationID = F, returnRace = F, returnRaceEduphoriaCode = F, returnRaceVerifiedBy = F, returnRaceVerifiedByCode = F, returnRaceVerifiedDate = F, returnSkywardHash = F, returnSkywardID = F, returnSocialSecurityNumber = F, returnSpecifySeparateLegalName = F, returnTitledName = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Name", NameID, searchFields, EntityID)
}
#' Modify a specific Name
#'
#' This function modifies fields for a Name.
#'
#' @param NameID The id of the Name to be modified.\cr Run \code{\link{getAllNames}} for a list of Names.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Name.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyName <- function(NameID, EntityID = 1, setBirthDate = NULL, setBirthMonthDay = NULL, setBypassStudentRaceValidation = NULL, setContactPerson = NULL, setConversionKey = NULL, setDriversLicenseNumber = NULL, setExternalUniqueIdentifier = NULL, setFederalEIN = NULL, setFirstName = NULL, setFirstNameLegal = NULL, setGender = NULL, setGenderCode = NULL, setGrandPeopleMAID = NULL, setGrandPersonMAID = NULL, setIsAlaskan = NULL, setIsAsian = NULL, setIsBlack = NULL, setIsBusiness = NULL, setIsEmergencyContactName = NULL, setIsEmployeeName = NULL, setIsFeeManagementCustomerName = NULL, setIsFeeManagementPayorName = NULL, setIsFoodServiceCustomerName = NULL, setIsFoodServicePayorName = NULL, setIsGuardianName = NULL, setIsHawaiian = NULL, setIsHealthProfessionalName = NULL, setIsHispanic = NULL, setIsInstitution = NULL, setIsPayorName = NULL, setIsPlaceOfEmployment = NULL, setIsSingleLegalName = NULL, setIsStaffName = NULL, setIsStudentName = NULL, setIsUserName = NULL, setIsVendorName = NULL, setIsWhite = NULL, setLastName = NULL, setLastNameLegal = NULL, setMaritalStatus = NULL, setMaritalStatusCode = NULL, setMediaIDPhoto = NULL, setMiddleName = NULL, setMiddleNameLegal = NULL, setNameIDPlaceOfEmployment = NULL, setNameKey = NULL, setNameNumber = NULL, setNameSuffixID = NULL, setNameSuffixIDLegal = NULL, setNameTitleID = NULL, setNameTitleIDLegal = NULL, setOccupationID = NULL, setRaceVerifiedBy = NULL, setRaceVerifiedByCode = NULL, setRaceVerifiedDate = NULL, setSkywardHash = NULL, setSkywardID = NULL, setSocialSecurityNumber = NULL, setSpecifySeparateLegalName = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Name", NameID, names(functionParams), functionParams, EntityID)
}
#' Create new Name.
#'
#' This function creates a new Name.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Name.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createName <- function(EntityID = 1, setBirthDate = NULL, setBirthMonthDay = NULL, setBypassStudentRaceValidation = NULL, setContactPerson = NULL, setConversionKey = NULL, setDriversLicenseNumber = NULL, setExternalUniqueIdentifier = NULL, setFederalEIN = NULL, setFirstName = NULL, setFirstNameLegal = NULL, setGender = NULL, setGenderCode = NULL, setGrandPeopleMAID = NULL, setGrandPersonMAID = NULL, setIsAlaskan = NULL, setIsAsian = NULL, setIsBlack = NULL, setIsBusiness = NULL, setIsEmergencyContactName = NULL, setIsEmployeeName = NULL, setIsFeeManagementCustomerName = NULL, setIsFeeManagementPayorName = NULL, setIsFoodServiceCustomerName = NULL, setIsFoodServicePayorName = NULL, setIsGuardianName = NULL, setIsHawaiian = NULL, setIsHealthProfessionalName = NULL, setIsHispanic = NULL, setIsInstitution = NULL, setIsPayorName = NULL, setIsPlaceOfEmployment = NULL, setIsSingleLegalName = NULL, setIsStaffName = NULL, setIsStudentName = NULL, setIsUserName = NULL, setIsVendorName = NULL, setIsWhite = NULL, setLastName = NULL, setLastNameLegal = NULL, setMaritalStatus = NULL, setMaritalStatusCode = NULL, setMediaIDPhoto = NULL, setMiddleName = NULL, setMiddleNameLegal = NULL, setNameIDPlaceOfEmployment = NULL, setNameKey = NULL, setNameNumber = NULL, setNameSuffixID = NULL, setNameSuffixIDLegal = NULL, setNameTitleID = NULL, setNameTitleIDLegal = NULL, setOccupationID = NULL, setRaceVerifiedBy = NULL, setRaceVerifiedByCode = NULL, setRaceVerifiedDate = NULL, setSkywardHash = NULL, setSkywardID = NULL, setSocialSecurityNumber = NULL, setSpecifySeparateLegalName = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Name", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Name
#'
#' This function deletes a Name.
#'
#' @param NameID The id of the Name.\cr Run \code{\link{getAllNames}} for a list of Names.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Name.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteName <- function(NameID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Name", NameID, EntityID)
}
#' Get all NameAddresses.
#'
#' This function returns a dataframe of all NameAddresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameAddresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameAddressID = F, returnAddressID = F, returnCreatedTime = F, returnGetAddressType = F, returnHideFromDirectoryMA = F, returnIs1099 = F, returnIsBusDropoff = F, returnIsBusPickup = F, returnIsMailing = F, returnIsOrderFrom = F, returnIsPhysical = F, returnIsPrimaryGuardian = F, returnIsRemitTo = F, returnIsW2 = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameAddress", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameAddress
#'
#' This function returns fields for a NameAddress.
#'
#' @param NameAddressID The id of the NameAddress.\cr Run \code{\link{getAllNameAddresses}} for a list of NameAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameAddress <- function(NameAddressID, EntityID = 1, returnNameAddressID = F, returnAddressID = F, returnCreatedTime = F, returnGetAddressType = F, returnHideFromDirectoryMA = F, returnIs1099 = F, returnIsBusDropoff = F, returnIsBusPickup = F, returnIsMailing = F, returnIsOrderFrom = F, returnIsPhysical = F, returnIsPrimaryGuardian = F, returnIsRemitTo = F, returnIsW2 = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameAddress", NameAddressID, searchFields, EntityID)
}
#' Modify a specific NameAddress
#'
#' This function modifies fields for a NameAddress.
#'
#' @param NameAddressID The id of the NameAddress to be modified.\cr Run \code{\link{getAllNameAddresses}} for a list of NameAddress.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameAddress <- function(NameAddressID, EntityID = 1, setAddressID = NULL, setHideFromDirectoryMA = NULL, setIs1099 = NULL, setIsBusDropoff = NULL, setIsBusPickup = NULL, setIsMailing = NULL, setIsOrderFrom = NULL, setIsPhysical = NULL, setIsPrimaryGuardian = NULL, setIsRemitTo = NULL, setIsW2 = NULL, setNameID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameAddress", NameAddressID, names(functionParams), functionParams, EntityID)
}
#' Create new NameAddress.
#'
#' This function creates a new NameAddress.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameAddress <- function(EntityID = 1, setAddressID = NULL, setHideFromDirectoryMA = NULL, setIs1099 = NULL, setIsBusDropoff = NULL, setIsBusPickup = NULL, setIsMailing = NULL, setIsOrderFrom = NULL, setIsPhysical = NULL, setIsPrimaryGuardian = NULL, setIsRemitTo = NULL, setIsW2 = NULL, setNameID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameAddress", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameAddress
#'
#' This function deletes a NameAddress.
#'
#' @param NameAddressID The id of the NameAddress.\cr Run \code{\link{getAllNameAddresses}} for a list of NameAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameAddress <- function(NameAddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameAddress", NameAddressID, EntityID)
}
#' Get all NameAliases.
#'
#' This function returns a dataframe of all NameAliases in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameAliases in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameAliases <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameAliasID = F, returnCreatedTime = F, returnEffectiveDate = F, returnFirstName = F, returnFullNameFL = F, returnFullNameLF = F, returnIsBusiness = F, returnIsLegalName = F, returnIsMaidenName = F, returnIsSingleLegalName = F, returnLastName = F, returnMiddleName = F, returnModifiedTime = F, returnNameID = F, returnNameSuffixID = F, returnNameTitleID = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameAlias", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameAlias
#'
#' This function returns fields for a NameAlias.
#'
#' @param NameAliasID The id of the NameAlias.\cr Run \code{\link{getAllNameAliases}} for a list of NameAliases.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameAlias.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameAlias <- function(NameAliasID, EntityID = 1, returnNameAliasID = F, returnCreatedTime = F, returnEffectiveDate = F, returnFirstName = F, returnFullNameFL = F, returnFullNameLF = F, returnIsBusiness = F, returnIsLegalName = F, returnIsMaidenName = F, returnIsSingleLegalName = F, returnLastName = F, returnMiddleName = F, returnModifiedTime = F, returnNameID = F, returnNameSuffixID = F, returnNameTitleID = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameAlias", NameAliasID, searchFields, EntityID)
}
#' Modify a specific NameAlias
#'
#' This function modifies fields for a NameAlias.
#'
#' @param NameAliasID The id of the NameAlias to be modified.\cr Run \code{\link{getAllNameAliases}} for a list of NameAlias.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameAlias.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameAlias <- function(NameAliasID, EntityID = 1, setEffectiveDate = NULL, setFirstName = NULL, setIsBusiness = NULL, setIsLegalName = NULL, setIsMaidenName = NULL, setIsSingleLegalName = NULL, setLastName = NULL, setMiddleName = NULL, setNameID = NULL, setNameSuffixID = NULL, setNameTitleID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameAlias", NameAliasID, names(functionParams), functionParams, EntityID)
}
#' Create new NameAlias.
#'
#' This function creates a new NameAlias.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameAlias.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameAlias <- function(EntityID = 1, setEffectiveDate = NULL, setFirstName = NULL, setIsBusiness = NULL, setIsLegalName = NULL, setIsMaidenName = NULL, setIsSingleLegalName = NULL, setLastName = NULL, setMiddleName = NULL, setNameID = NULL, setNameSuffixID = NULL, setNameTitleID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameAlias", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameAlias
#'
#' This function deletes a NameAlias.
#'
#' @param NameAliasID The id of the NameAlias.\cr Run \code{\link{getAllNameAliases}} for a list of NameAliases.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameAlias.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameAlias <- function(NameAliasID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameAlias", NameAliasID, EntityID)
}
#' Get all NameEmails.
#'
#' This function returns a dataframe of all NameEmails in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameEmails in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameEmails <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameEmailID = F, returnCreatedTime = F, returnEmailAddress = F, returnEmailTypeID = F, returnIsAccountsPayableDirectDepositNotificationEmail = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnRank = F, returnUsedByHealthProfessional = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameEmail", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameEmail
#'
#' This function returns fields for a NameEmail.
#'
#' @param NameEmailID The id of the NameEmail.\cr Run \code{\link{getAllNameEmails}} for a list of NameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameEmail <- function(NameEmailID, EntityID = 1, returnNameEmailID = F, returnCreatedTime = F, returnEmailAddress = F, returnEmailTypeID = F, returnIsAccountsPayableDirectDepositNotificationEmail = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnRank = F, returnUsedByHealthProfessional = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameEmail", NameEmailID, searchFields, EntityID)
}
#' Modify a specific NameEmail
#'
#' This function modifies fields for a NameEmail.
#'
#' @param NameEmailID The id of the NameEmail to be modified.\cr Run \code{\link{getAllNameEmails}} for a list of NameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameEmail <- function(NameEmailID, EntityID = 1, setEmailAddress = NULL, setEmailTypeID = NULL, setNameID = NULL, setNote = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameEmail", NameEmailID, names(functionParams), functionParams, EntityID)
}
#' Create new NameEmail.
#'
#' This function creates a new NameEmail.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameEmail <- function(EntityID = 1, setEmailAddress = NULL, setEmailTypeID = NULL, setNameID = NULL, setNote = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameEmail", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameEmail
#'
#' This function deletes a NameEmail.
#'
#' @param NameEmailID The id of the NameEmail.\cr Run \code{\link{getAllNameEmails}} for a list of NameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameEmail <- function(NameEmailID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameEmail", NameEmailID, EntityID)
}
#' Get all NameEthnicityRaceSubcategoryMNs.
#'
#' This function returns a dataframe of all NameEthnicityRaceSubcategoryMNs in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameEthnicityRaceSubcategoryMNs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameEthnicityRaceSubcategoryMNs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameEthnicityRaceSubcategoryMNID = F, returnCreatedTime = F, returnEthnicityRaceType = F, returnEthnicityRaceTypeCode = F, returnModifiedTime = F, returnNameID = F, returnStateEthnicityRaceSubcategoryMNID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameEthnicityRaceSubcategoryMN", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameEthnicityRaceSubcategoryMN
#'
#' This function returns fields for a NameEthnicityRaceSubcategoryMN.
#'
#' @param NameEthnicityRaceSubcategoryMNID The id of the NameEthnicityRaceSubcategoryMN.\cr Run \code{\link{getAllNameEthnicityRaceSubcategoryMNs}} for a list of NameEthnicityRaceSubcategoryMNs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameEthnicityRaceSubcategoryMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameEthnicityRaceSubcategoryMN <- function(NameEthnicityRaceSubcategoryMNID, EntityID = 1, returnNameEthnicityRaceSubcategoryMNID = F, returnCreatedTime = F, returnEthnicityRaceType = F, returnEthnicityRaceTypeCode = F, returnModifiedTime = F, returnNameID = F, returnStateEthnicityRaceSubcategoryMNID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameEthnicityRaceSubcategoryMN", NameEthnicityRaceSubcategoryMNID, searchFields, EntityID)
}
#' Modify a specific NameEthnicityRaceSubcategoryMN
#'
#' This function modifies fields for a NameEthnicityRaceSubcategoryMN.
#'
#' @param NameEthnicityRaceSubcategoryMNID The id of the NameEthnicityRaceSubcategoryMN to be modified.\cr Run \code{\link{getAllNameEthnicityRaceSubcategoryMNs}} for a list of NameEthnicityRaceSubcategoryMNs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameEthnicityRaceSubcategoryMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameEthnicityRaceSubcategoryMN <- function(NameEthnicityRaceSubcategoryMNID, EntityID = 1, setEthnicityRaceType = NULL, setEthnicityRaceTypeCode = NULL, setNameID = NULL, setStateEthnicityRaceSubcategoryMNID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameEthnicityRaceSubcategoryMN", NameEthnicityRaceSubcategoryMNID, names(functionParams), functionParams, EntityID)
}
#' Create new NameEthnicityRaceSubcategoryMN.
#'
#' This function creates a new NameEthnicityRaceSubcategoryMN.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameEthnicityRaceSubcategoryMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameEthnicityRaceSubcategoryMN <- function(EntityID = 1, setEthnicityRaceType = NULL, setEthnicityRaceTypeCode = NULL, setNameID = NULL, setStateEthnicityRaceSubcategoryMNID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameEthnicityRaceSubcategoryMN", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameEthnicityRaceSubcategoryMN
#'
#' This function deletes a NameEthnicityRaceSubcategoryMN.
#'
#' @param NameEthnicityRaceSubcategoryMNID The id of the NameEthnicityRaceSubcategoryMN.\cr Run \code{\link{getAllNameEthnicityRaceSubcategoryMNs}} for a list of NameEthnicityRaceSubcategoryMNs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameEthnicityRaceSubcategoryMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameEthnicityRaceSubcategoryMN <- function(NameEthnicityRaceSubcategoryMNID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameEthnicityRaceSubcategoryMN", NameEthnicityRaceSubcategoryMNID, EntityID)
}
#' Get all NameMergeRunHistories.
#'
#' This function returns a dataframe of all NameMergeRunHistories in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameMergeRunHistories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameMergeRunHistories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameMergeRunHistoryID = F, returnBirthDateFrom = F, returnBirthDateTo = F, returnCreatedTime = F, returnFullNameLFMFrom = F, returnFullNameLFMTo = F, returnModifiedTime = F, returnNameIDFrom = F, returnNameIDTo = F, returnNameUsedByFrom = F, returnNameUsedByTo = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameMergeRunHistory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameMergeRunHistory
#'
#' This function returns fields for a NameMergeRunHistory.
#'
#' @param NameMergeRunHistoryID The id of the NameMergeRunHistory.\cr Run \code{\link{getAllNameMergeRunHistories}} for a list of NameMergeRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameMergeRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameMergeRunHistory <- function(NameMergeRunHistoryID, EntityID = 1, returnNameMergeRunHistoryID = F, returnBirthDateFrom = F, returnBirthDateTo = F, returnCreatedTime = F, returnFullNameLFMFrom = F, returnFullNameLFMTo = F, returnModifiedTime = F, returnNameIDFrom = F, returnNameIDTo = F, returnNameUsedByFrom = F, returnNameUsedByTo = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameMergeRunHistory", NameMergeRunHistoryID, searchFields, EntityID)
}
#' Modify a specific NameMergeRunHistory
#'
#' This function modifies fields for a NameMergeRunHistory.
#'
#' @param NameMergeRunHistoryID The id of the NameMergeRunHistory to be modified.\cr Run \code{\link{getAllNameMergeRunHistories}} for a list of NameMergeRunHistorys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameMergeRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameMergeRunHistory <- function(NameMergeRunHistoryID, EntityID = 1, setBirthDateFrom = NULL, setBirthDateTo = NULL, setFullNameLFMFrom = NULL, setFullNameLFMTo = NULL, setNameIDFrom = NULL, setNameIDTo = NULL, setNameUsedByFrom = NULL, setNameUsedByTo = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameMergeRunHistory", NameMergeRunHistoryID, names(functionParams), functionParams, EntityID)
}
#' Create new NameMergeRunHistory.
#'
#' This function creates a new NameMergeRunHistory.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameMergeRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameMergeRunHistory <- function(EntityID = 1, setBirthDateFrom = NULL, setBirthDateTo = NULL, setFullNameLFMFrom = NULL, setFullNameLFMTo = NULL, setNameIDFrom = NULL, setNameIDTo = NULL, setNameUsedByFrom = NULL, setNameUsedByTo = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameMergeRunHistory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameMergeRunHistory
#'
#' This function deletes a NameMergeRunHistory.
#'
#' @param NameMergeRunHistoryID The id of the NameMergeRunHistory.\cr Run \code{\link{getAllNameMergeRunHistories}} for a list of NameMergeRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameMergeRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameMergeRunHistory <- function(NameMergeRunHistoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameMergeRunHistory", NameMergeRunHistoryID, EntityID)
}
#' Get all NamePhones.
#'
#' This function returns a dataframe of all NamePhones in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NamePhones in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNamePhones <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNamePhoneID = F, returnCreatedTime = F, returnExtension = F, returnFormattedPhoneNumber = F, returnFormattedPhoneNumberCodeEEL = F, returnFullPhoneNumber = F, returnIsConfidential = F, returnIsFax = F, returnIsInternational = F, returnIsPrimaryFax = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnPhoneNumber = F, returnPhoneTypeID = F, returnRank = F, returnUsedByHealthProfessional = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NamePhone", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NamePhone
#'
#' This function returns fields for a NamePhone.
#'
#' @param NamePhoneID The id of the NamePhone.\cr Run \code{\link{getAllNamePhones}} for a list of NamePhones.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NamePhone.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNamePhone <- function(NamePhoneID, EntityID = 1, returnNamePhoneID = F, returnCreatedTime = F, returnExtension = F, returnFormattedPhoneNumber = F, returnFormattedPhoneNumberCodeEEL = F, returnFullPhoneNumber = F, returnIsConfidential = F, returnIsFax = F, returnIsInternational = F, returnIsPrimaryFax = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnPhoneNumber = F, returnPhoneTypeID = F, returnRank = F, returnUsedByHealthProfessional = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NamePhone", NamePhoneID, searchFields, EntityID)
}
#' Modify a specific NamePhone
#'
#' This function modifies fields for a NamePhone.
#'
#' @param NamePhoneID The id of the NamePhone to be modified.\cr Run \code{\link{getAllNamePhones}} for a list of NamePhones.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NamePhone.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNamePhone <- function(NamePhoneID, EntityID = 1, setExtension = NULL, setIsConfidential = NULL, setIsFax = NULL, setIsInternational = NULL, setNameID = NULL, setNote = NULL, setPhoneNumber = NULL, setPhoneTypeID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NamePhone", NamePhoneID, names(functionParams), functionParams, EntityID)
}
#' Create new NamePhone.
#'
#' This function creates a new NamePhone.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NamePhone.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNamePhone <- function(EntityID = 1, setExtension = NULL, setIsConfidential = NULL, setIsFax = NULL, setIsInternational = NULL, setNameID = NULL, setNote = NULL, setPhoneNumber = NULL, setPhoneTypeID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NamePhone", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NamePhone
#'
#' This function deletes a NamePhone.
#'
#' @param NamePhoneID The id of the NamePhone.\cr Run \code{\link{getAllNamePhones}} for a list of NamePhones.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NamePhone.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNamePhone <- function(NamePhoneID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NamePhone", NamePhoneID, EntityID)
}
#' Get all NameSuffixs.
#'
#' This function returns a dataframe of all NameSuffixs in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameSuffixs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameSuffixs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameSuffixID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameSuffix", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameSuffix
#'
#' This function returns fields for a NameSuffix.
#'
#' @param NameSuffixID The id of the NameSuffix.\cr Run \code{\link{getAllNameSuffixs}} for a list of NameSuffixs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameSuffix.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameSuffix <- function(NameSuffixID, EntityID = 1, returnNameSuffixID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameSuffix", NameSuffixID, searchFields, EntityID)
}
#' Modify a specific NameSuffix
#'
#' This function modifies fields for a NameSuffix.
#'
#' @param NameSuffixID The id of the NameSuffix to be modified.\cr Run \code{\link{getAllNameSuffixs}} for a list of NameSuffixs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameSuffix.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameSuffix <- function(NameSuffixID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameSuffix", NameSuffixID, names(functionParams), functionParams, EntityID)
}
#' Create new NameSuffix.
#'
#' This function creates a new NameSuffix.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameSuffix.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameSuffix <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameSuffix", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameSuffix
#'
#' This function deletes a NameSuffix.
#'
#' @param NameSuffixID The id of the NameSuffix.\cr Run \code{\link{getAllNameSuffixs}} for a list of NameSuffixs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameSuffix.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameSuffix <- function(NameSuffixID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameSuffix", NameSuffixID, EntityID)
}
#' Get all NameTitles.
#'
#' This function returns a dataframe of all NameTitles in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameTitles in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameTitles <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameTitleID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameTitle", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameTitle
#'
#' This function returns fields for a NameTitle.
#'
#' @param NameTitleID The id of the NameTitle.\cr Run \code{\link{getAllNameTitles}} for a list of NameTitles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameTitle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameTitle <- function(NameTitleID, EntityID = 1, returnNameTitleID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameTitle", NameTitleID, searchFields, EntityID)
}
#' Modify a specific NameTitle
#'
#' This function modifies fields for a NameTitle.
#'
#' @param NameTitleID The id of the NameTitle to be modified.\cr Run \code{\link{getAllNameTitles}} for a list of NameTitles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameTitle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameTitle <- function(NameTitleID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameTitle", NameTitleID, names(functionParams), functionParams, EntityID)
}
#' Create new NameTitle.
#'
#' This function creates a new NameTitle.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameTitle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameTitle <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameTitle", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameTitle
#'
#' This function deletes a NameTitle.
#'
#' @param NameTitleID The id of the NameTitle.\cr Run \code{\link{getAllNameTitles}} for a list of NameTitles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameTitle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameTitle <- function(NameTitleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameTitle", NameTitleID, EntityID)
}
#' Get all NameVehicles.
#'
#' This function returns a dataframe of all NameVehicles in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameVehicles in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameVehicles <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameVehicleID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVehicleID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameVehicle", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameVehicle
#'
#' This function returns fields for a NameVehicle.
#'
#' @param NameVehicleID The id of the NameVehicle.\cr Run \code{\link{getAllNameVehicles}} for a list of NameVehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameVehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameVehicle <- function(NameVehicleID, EntityID = 1, returnNameVehicleID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVehicleID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameVehicle", NameVehicleID, searchFields, EntityID)
}
#' Modify a specific NameVehicle
#'
#' This function modifies fields for a NameVehicle.
#'
#' @param NameVehicleID The id of the NameVehicle to be modified.\cr Run \code{\link{getAllNameVehicles}} for a list of NameVehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameVehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameVehicle <- function(NameVehicleID, EntityID = 1, setNameID = NULL, setVehicleID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameVehicle", NameVehicleID, names(functionParams), functionParams, EntityID)
}
#' Create new NameVehicle.
#'
#' This function creates a new NameVehicle.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameVehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameVehicle <- function(EntityID = 1, setNameID = NULL, setVehicleID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameVehicle", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameVehicle
#'
#' This function deletes a NameVehicle.
#'
#' @param NameVehicleID The id of the NameVehicle.\cr Run \code{\link{getAllNameVehicles}} for a list of NameVehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameVehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameVehicle <- function(NameVehicleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameVehicle", NameVehicleID, EntityID)
}
#' Get all NameWebsites.
#'
#' This function returns a dataframe of all NameWebsites in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All NameWebsites in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNameWebsites <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNameWebsiteID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnRank = F, returnURL = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "NameWebsite", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NameWebsite
#'
#' This function returns fields for a NameWebsite.
#'
#' @param NameWebsiteID The id of the NameWebsite.\cr Run \code{\link{getAllNameWebsites}} for a list of NameWebsites.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the NameWebsite.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNameWebsite <- function(NameWebsiteID, EntityID = 1, returnNameWebsiteID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnRank = F, returnURL = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "NameWebsite", NameWebsiteID, searchFields, EntityID)
}
#' Modify a specific NameWebsite
#'
#' This function modifies fields for a NameWebsite.
#'
#' @param NameWebsiteID The id of the NameWebsite to be modified.\cr Run \code{\link{getAllNameWebsites}} for a list of NameWebsites.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified NameWebsite.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNameWebsite <- function(NameWebsiteID, EntityID = 1, setNameID = NULL, setNote = NULL, setRank = NULL, setURL = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "NameWebsite", NameWebsiteID, names(functionParams), functionParams, EntityID)
}
#' Create new NameWebsite.
#'
#' This function creates a new NameWebsite.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created NameWebsite.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNameWebsite <- function(EntityID = 1, setNameID = NULL, setNote = NULL, setRank = NULL, setURL = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "NameWebsite", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NameWebsite
#'
#' This function deletes a NameWebsite.
#'
#' @param NameWebsiteID The id of the NameWebsite.\cr Run \code{\link{getAllNameWebsites}} for a list of NameWebsites.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted NameWebsite.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNameWebsite <- function(NameWebsiteID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "NameWebsite", NameWebsiteID, EntityID)
}
#' Get all Occupations.
#'
#' This function returns a dataframe of all Occupations in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Occupations in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllOccupations <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnOccupationID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Occupation", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Occupation
#'
#' This function returns fields for an Occupation.
#'
#' @param OccupationID The id of the Occupation.\cr Run \code{\link{getAllOccupations}} for a list of Occupations.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Occupation.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getOccupation <- function(OccupationID, EntityID = 1, returnOccupationID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Occupation", OccupationID, searchFields, EntityID)
}
#' Modify a specific Occupation
#'
#' This function modifies fields for an Occupation.
#'
#' @param OccupationID The id of the Occupation to be modified.\cr Run \code{\link{getAllOccupations}} for a list of Occupations.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Occupation.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyOccupation <- function(OccupationID, EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Occupation", OccupationID, names(functionParams), functionParams, EntityID)
}
#' Create new Occupation.
#'
#' This function creates a new Occupation.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Occupation.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createOccupation <- function(EntityID = 1, setCode = NULL, setDescription = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Occupation", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Occupation
#'
#' This function deletes an Occupation.
#'
#' @param OccupationID The id of the Occupation.\cr Run \code{\link{getAllOccupations}} for a list of Occupations.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Occupation.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteOccupation <- function(OccupationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Occupation", OccupationID, EntityID)
}
#' Get all PhoneTypes.
#'
#' This function returns a dataframe of all PhoneTypes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All PhoneTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllPhoneTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnPhoneTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnPreventFamilyStudentAccessUpdates = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "PhoneType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific PhoneType
#'
#' This function returns fields for a PhoneType.
#'
#' @param PhoneTypeID The id of the PhoneType.\cr Run \code{\link{getAllPhoneTypes}} for a list of PhoneTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the PhoneType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getPhoneType <- function(PhoneTypeID, EntityID = 1, returnPhoneTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnPreventFamilyStudentAccessUpdates = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "PhoneType", PhoneTypeID, searchFields, EntityID)
}
#' Modify a specific PhoneType
#'
#' This function modifies fields for a PhoneType.
#'
#' @param PhoneTypeID The id of the PhoneType to be modified.\cr Run \code{\link{getAllPhoneTypes}} for a list of PhoneTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified PhoneType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyPhoneType <- function(PhoneTypeID, EntityID = 1, setCode = NULL, setDescription = NULL, setPreventFamilyStudentAccessUpdates = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "PhoneType", PhoneTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new PhoneType.
#'
#' This function creates a new PhoneType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created PhoneType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createPhoneType <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setPreventFamilyStudentAccessUpdates = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "PhoneType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific PhoneType
#'
#' This function deletes a PhoneType.
#'
#' @param PhoneTypeID The id of the PhoneType.\cr Run \code{\link{getAllPhoneTypes}} for a list of PhoneTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted PhoneType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deletePhoneType <- function(PhoneTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "PhoneType", PhoneTypeID, EntityID)
}
#' Get all RaisersEdgeObjectMAs.
#'
#' This function returns a dataframe of all RaisersEdgeObjectMAs in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All RaisersEdgeObjectMAs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRaisersEdgeObjectMAs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRaisersEdgeObjectMAID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnRaisersEdgeID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "RaisersEdgeObjectMA", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RaisersEdgeObjectMA
#'
#' This function returns fields for a RaisersEdgeObjectMA.
#'
#' @param RaisersEdgeObjectMAID The id of the RaisersEdgeObjectMA.\cr Run \code{\link{getAllRaisersEdgeObjectMAs}} for a list of RaisersEdgeObjectMAs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the RaisersEdgeObjectMA.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRaisersEdgeObjectMA <- function(RaisersEdgeObjectMAID, EntityID = 1, returnRaisersEdgeObjectMAID = F, returnCreatedTime = F, returnModifiedTime = F, returnNameID = F, returnRaisersEdgeID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "RaisersEdgeObjectMA", RaisersEdgeObjectMAID, searchFields, EntityID)
}
#' Modify a specific RaisersEdgeObjectMA
#'
#' This function modifies fields for a RaisersEdgeObjectMA.
#'
#' @param RaisersEdgeObjectMAID The id of the RaisersEdgeObjectMA to be modified.\cr Run \code{\link{getAllRaisersEdgeObjectMAs}} for a list of RaisersEdgeObjectMAs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified RaisersEdgeObjectMA.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRaisersEdgeObjectMA <- function(RaisersEdgeObjectMAID, EntityID = 1, setNameID = NULL, setRaisersEdgeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "RaisersEdgeObjectMA", RaisersEdgeObjectMAID, names(functionParams), functionParams, EntityID)
}
#' Create new RaisersEdgeObjectMA.
#'
#' This function creates a new RaisersEdgeObjectMA.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created RaisersEdgeObjectMA.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRaisersEdgeObjectMA <- function(EntityID = 1, setNameID = NULL, setRaisersEdgeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "RaisersEdgeObjectMA", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RaisersEdgeObjectMA
#'
#' This function deletes a RaisersEdgeObjectMA.
#'
#' @param RaisersEdgeObjectMAID The id of the RaisersEdgeObjectMA.\cr Run \code{\link{getAllRaisersEdgeObjectMAs}} for a list of RaisersEdgeObjectMAs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted RaisersEdgeObjectMA.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRaisersEdgeObjectMA <- function(RaisersEdgeObjectMAID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "RaisersEdgeObjectMA", RaisersEdgeObjectMAID, EntityID)
}
#' Get all Relationships.
#'
#' This function returns a dataframe of all Relationships in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Relationships in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRelationships <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRelationshipID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEdFiRelationTypeID = F, returnGrandPeopleMAID = F, returnModifiedTime = F, returnRelationshipType = F, returnRelationshipTypeCode = F, returnShortenedDescription = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Relationship", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Relationship
#'
#' This function returns fields for a Relationship.
#'
#' @param RelationshipID The id of the Relationship.\cr Run \code{\link{getAllRelationships}} for a list of Relationships.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Relationship.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRelationship <- function(RelationshipID, EntityID = 1, returnRelationshipID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEdFiRelationTypeID = F, returnGrandPeopleMAID = F, returnModifiedTime = F, returnRelationshipType = F, returnRelationshipTypeCode = F, returnShortenedDescription = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Relationship", RelationshipID, searchFields, EntityID)
}
#' Modify a specific Relationship
#'
#' This function modifies fields for a Relationship.
#'
#' @param RelationshipID The id of the Relationship to be modified.\cr Run \code{\link{getAllRelationships}} for a list of Relationships.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Relationship.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRelationship <- function(RelationshipID, EntityID = 1, setCode = NULL, setDescription = NULL, setEdFiRelationTypeID = NULL, setGrandPeopleMAID = NULL, setRelationshipType = NULL, setRelationshipTypeCode = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Relationship", RelationshipID, names(functionParams), functionParams, EntityID)
}
#' Create new Relationship.
#'
#' This function creates a new Relationship.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Relationship.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRelationship <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setEdFiRelationTypeID = NULL, setGrandPeopleMAID = NULL, setRelationshipType = NULL, setRelationshipTypeCode = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Relationship", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Relationship
#'
#' This function deletes a Relationship.
#'
#' @param RelationshipID The id of the Relationship.\cr Run \code{\link{getAllRelationships}} for a list of Relationships.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Relationship.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRelationship <- function(RelationshipID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Relationship", RelationshipID, EntityID)
}
#' Get all Streets.
#'
#' This function returns a dataframe of all Streets in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Streets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStreets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStreetID = F, returnCreatedTime = F, returnDirectionalID = F, returnFormattedStreet = F, returnModifiedTime = F, returnName = F, returnStreetNameWithDirectionCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Street", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Street
#'
#' This function returns fields for a Street.
#'
#' @param StreetID The id of the Street.\cr Run \code{\link{getAllStreets}} for a list of Streets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Street.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStreet <- function(StreetID, EntityID = 1, returnStreetID = F, returnCreatedTime = F, returnDirectionalID = F, returnFormattedStreet = F, returnModifiedTime = F, returnName = F, returnStreetNameWithDirectionCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Street", StreetID, searchFields, EntityID)
}
#' Modify a specific Street
#'
#' This function modifies fields for a Street.
#'
#' @param StreetID The id of the Street to be modified.\cr Run \code{\link{getAllStreets}} for a list of Streets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Street.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStreet <- function(StreetID, EntityID = 1, setDirectionalID = NULL, setName = NULL, setZipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Street", StreetID, names(functionParams), functionParams, EntityID)
}
#' Create new Street.
#'
#' This function creates a new Street.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Street.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStreet <- function(EntityID = 1, setDirectionalID = NULL, setName = NULL, setZipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Street", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Street
#'
#' This function deletes a Street.
#'
#' @param StreetID The id of the Street.\cr Run \code{\link{getAllStreets}} for a list of Streets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Street.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStreet <- function(StreetID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Street", StreetID, EntityID)
}
#' Get all TempACHAccounts.
#'
#' This function returns a dataframe of all TempACHAccounts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempACHAccounts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempACHAccounts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempACHAccountID = F, returnAccountType = F, returnACHAccountID = F, returnACHAccountNumber = F, returnCreatedTime = F, returnIsEmployeeNetPayrollACH = F, returnIsVendorAccountsPayableACH = F, returnModifiedTime = F, returnName = F, returnRoutingNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseTaxAddenda = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempACHAccount", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempACHAccount
#'
#' This function returns fields for a TempACHAccount.
#'
#' @param TempACHAccountID The id of the TempACHAccount.\cr Run \code{\link{getAllTempACHAccounts}} for a list of TempACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempACHAccount <- function(TempACHAccountID, EntityID = 1, returnTempACHAccountID = F, returnAccountType = F, returnACHAccountID = F, returnACHAccountNumber = F, returnCreatedTime = F, returnIsEmployeeNetPayrollACH = F, returnIsVendorAccountsPayableACH = F, returnModifiedTime = F, returnName = F, returnRoutingNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseTaxAddenda = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempACHAccount", TempACHAccountID, searchFields, EntityID)
}
#' Modify a specific TempACHAccount
#'
#' This function modifies fields for a TempACHAccount.
#'
#' @param TempACHAccountID The id of the TempACHAccount to be modified.\cr Run \code{\link{getAllTempACHAccounts}} for a list of TempACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempACHAccount <- function(TempACHAccountID, EntityID = 1, setAccountType = NULL, setACHAccountID = NULL, setACHAccountNumber = NULL, setIsEmployeeNetPayrollACH = NULL, setIsVendorAccountsPayableACH = NULL, setName = NULL, setRoutingNumber = NULL, setUseTaxAddenda = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempACHAccount", TempACHAccountID, names(functionParams), functionParams, EntityID)
}
#' Create new TempACHAccount.
#'
#' This function creates a new TempACHAccount.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempACHAccount <- function(EntityID = 1, setAccountType = NULL, setACHAccountID = NULL, setACHAccountNumber = NULL, setIsEmployeeNetPayrollACH = NULL, setIsVendorAccountsPayableACH = NULL, setName = NULL, setRoutingNumber = NULL, setUseTaxAddenda = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempACHAccount", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempACHAccount
#'
#' This function deletes a TempACHAccount.
#'
#' @param TempACHAccountID The id of the TempACHAccount.\cr Run \code{\link{getAllTempACHAccounts}} for a list of TempACHAccounts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempACHAccount.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempACHAccount <- function(TempACHAccountID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempACHAccount", TempACHAccountID, EntityID)
}
#' Get all TempAddresses.
#'
#' This function returns a dataframe of all TempAddresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempAddresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAddressID = F, returnAddressID = F, returnAddressUsedBy = F, returnCreatedTime = F, returnCurrentFormattedFullAddress = F, returnFieldPathsToUpdate = F, returnFieldsToUpdate = F, returnModifiedTime = F, returnNewFormattedFullAddress = F, returnSelected = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWorkflowErrors = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempAddress", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAddress
#'
#' This function returns fields for a TempAddress.
#'
#' @param TempAddressID The id of the TempAddress.\cr Run \code{\link{getAllTempAddresses}} for a list of TempAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAddress <- function(TempAddressID, EntityID = 1, returnTempAddressID = F, returnAddressID = F, returnAddressUsedBy = F, returnCreatedTime = F, returnCurrentFormattedFullAddress = F, returnFieldPathsToUpdate = F, returnFieldsToUpdate = F, returnModifiedTime = F, returnNewFormattedFullAddress = F, returnSelected = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWorkflowErrors = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempAddress", TempAddressID, searchFields, EntityID)
}
#' Modify a specific TempAddress
#'
#' This function modifies fields for a TempAddress.
#'
#' @param TempAddressID The id of the TempAddress to be modified.\cr Run \code{\link{getAllTempAddresses}} for a list of TempAddress.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAddress <- function(TempAddressID, EntityID = 1, setAddressID = NULL, setAddressUsedBy = NULL, setCurrentFormattedFullAddress = NULL, setFieldPathsToUpdate = NULL, setFieldsToUpdate = NULL, setNewFormattedFullAddress = NULL, setSelected = NULL, setWorkflowErrors = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempAddress", TempAddressID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAddress.
#'
#' This function creates a new TempAddress.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAddress <- function(EntityID = 1, setAddressID = NULL, setAddressUsedBy = NULL, setCurrentFormattedFullAddress = NULL, setFieldPathsToUpdate = NULL, setFieldsToUpdate = NULL, setNewFormattedFullAddress = NULL, setSelected = NULL, setWorkflowErrors = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempAddress", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAddress
#'
#' This function deletes a TempAddress.
#'
#' @param TempAddressID The id of the TempAddress.\cr Run \code{\link{getAllTempAddresses}} for a list of TempAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAddress <- function(TempAddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempAddress", TempAddressID, EntityID)
}
#' Get all TempAddressRangeDefaults.
#'
#' This function returns a dataframe of all TempAddressRangeDefaults in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempAddressRangeDefaults in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAddressRangeDefaults <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAddressRangeDefaultID = F, returnCity = F, returnCreatedTime = F, returnDefaultSchools = F, returnException = F, returnModifiedTime = F, returnStateAbbreviation = F, returnStreetDirection = F, returnStreetName = F, returnStreetNumberHigh = F, returnStreetNumberLow = F, returnStreetSideCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F, returnZipCodeAddOn = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempAddressRangeDefault", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAddressRangeDefault
#'
#' This function returns fields for a TempAddressRangeDefault.
#'
#' @param TempAddressRangeDefaultID The id of the TempAddressRangeDefault.\cr Run \code{\link{getAllTempAddressRangeDefaults}} for a list of TempAddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempAddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAddressRangeDefault <- function(TempAddressRangeDefaultID, EntityID = 1, returnTempAddressRangeDefaultID = F, returnCity = F, returnCreatedTime = F, returnDefaultSchools = F, returnException = F, returnModifiedTime = F, returnStateAbbreviation = F, returnStreetDirection = F, returnStreetName = F, returnStreetNumberHigh = F, returnStreetNumberLow = F, returnStreetSideCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F, returnZipCodeAddOn = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempAddressRangeDefault", TempAddressRangeDefaultID, searchFields, EntityID)
}
#' Modify a specific TempAddressRangeDefault
#'
#' This function modifies fields for a TempAddressRangeDefault.
#'
#' @param TempAddressRangeDefaultID The id of the TempAddressRangeDefault to be modified.\cr Run \code{\link{getAllTempAddressRangeDefaults}} for a list of TempAddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempAddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAddressRangeDefault <- function(TempAddressRangeDefaultID, EntityID = 1, setCity = NULL, setDefaultSchools = NULL, setException = NULL, setStateAbbreviation = NULL, setStreetDirection = NULL, setStreetName = NULL, setStreetNumberHigh = NULL, setStreetNumberLow = NULL, setStreetSideCode = NULL, setZipCode = NULL, setZipCodeAddOn = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempAddressRangeDefault", TempAddressRangeDefaultID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAddressRangeDefault.
#'
#' This function creates a new TempAddressRangeDefault.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempAddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAddressRangeDefault <- function(EntityID = 1, setCity = NULL, setDefaultSchools = NULL, setException = NULL, setStateAbbreviation = NULL, setStreetDirection = NULL, setStreetName = NULL, setStreetNumberHigh = NULL, setStreetNumberLow = NULL, setStreetSideCode = NULL, setZipCode = NULL, setZipCodeAddOn = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempAddressRangeDefault", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAddressRangeDefault
#'
#' This function deletes a TempAddressRangeDefault.
#'
#' @param TempAddressRangeDefaultID The id of the TempAddressRangeDefault.\cr Run \code{\link{getAllTempAddressRangeDefaults}} for a list of TempAddressRangeDefaults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempAddressRangeDefault.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAddressRangeDefault <- function(TempAddressRangeDefaultID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempAddressRangeDefault", TempAddressRangeDefaultID, EntityID)
}
#' Get all TempCertifications.
#'
#' This function returns a dataframe of all TempCertifications in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempCertifications in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCertifications <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCertificationID = F, returnCertificationID = F, returnCertificationNumber = F, returnCertificationTypeCode = F, returnCertificationTypeCodeDescription = F, returnCertificationTypeID = F, returnComment = F, returnCreatedTime = F, returnErrorCount = F, returnExpirationDate = F, returnFullNameLFM = F, returnHasErrors = F, returnInstitutionID = F, returnInstitutionName = F, returnIssueDate = F, returnLineNumber = F, returnModifiedTime = F, returnNameID = F, returnStateDisplayName = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempCertification", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCertification
#'
#' This function returns fields for a TempCertification.
#'
#' @param TempCertificationID The id of the TempCertification.\cr Run \code{\link{getAllTempCertifications}} for a list of TempCertifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempCertification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCertification <- function(TempCertificationID, EntityID = 1, returnTempCertificationID = F, returnCertificationID = F, returnCertificationNumber = F, returnCertificationTypeCode = F, returnCertificationTypeCodeDescription = F, returnCertificationTypeID = F, returnComment = F, returnCreatedTime = F, returnErrorCount = F, returnExpirationDate = F, returnFullNameLFM = F, returnHasErrors = F, returnInstitutionID = F, returnInstitutionName = F, returnIssueDate = F, returnLineNumber = F, returnModifiedTime = F, returnNameID = F, returnStateDisplayName = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempCertification", TempCertificationID, searchFields, EntityID)
}
#' Modify a specific TempCertification
#'
#' This function modifies fields for a TempCertification.
#'
#' @param TempCertificationID The id of the TempCertification to be modified.\cr Run \code{\link{getAllTempCertifications}} for a list of TempCertifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempCertification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCertification <- function(TempCertificationID, EntityID = 1, setCertificationID = NULL, setCertificationNumber = NULL, setCertificationTypeCode = NULL, setCertificationTypeCodeDescription = NULL, setCertificationTypeID = NULL, setComment = NULL, setErrorCount = NULL, setExpirationDate = NULL, setFullNameLFM = NULL, setHasErrors = NULL, setInstitutionID = NULL, setInstitutionName = NULL, setIssueDate = NULL, setLineNumber = NULL, setNameID = NULL, setStateDisplayName = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempCertification", TempCertificationID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCertification.
#'
#' This function creates a new TempCertification.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempCertification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCertification <- function(EntityID = 1, setCertificationID = NULL, setCertificationNumber = NULL, setCertificationTypeCode = NULL, setCertificationTypeCodeDescription = NULL, setCertificationTypeID = NULL, setComment = NULL, setErrorCount = NULL, setExpirationDate = NULL, setFullNameLFM = NULL, setHasErrors = NULL, setInstitutionID = NULL, setInstitutionName = NULL, setIssueDate = NULL, setLineNumber = NULL, setNameID = NULL, setStateDisplayName = NULL, setStateID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempCertification", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCertification
#'
#' This function deletes a TempCertification.
#'
#' @param TempCertificationID The id of the TempCertification.\cr Run \code{\link{getAllTempCertifications}} for a list of TempCertifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempCertification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCertification <- function(TempCertificationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempCertification", TempCertificationID, EntityID)
}
#' Get all TempCertificationDetails.
#'
#' This function returns a dataframe of all TempCertificationDetails in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempCertificationDetails in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCertificationDetails <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCertificationDetailID = F, returnCertificationCompetencyCode = F, returnCertificationCompetencyID = F, returnCertificationGradeHighCodeDescription = F, returnCertificationGradeIDHigh = F, returnCertificationGradeIDLow = F, returnCertificationGradeLowCodeDescription = F, returnCertificationID = F, returnCertificationLevelCode = F, returnCertificationLevelID = F, returnCertificationSubjectCode = F, returnCertificationSubjectID = F, returnCreatedTime = F, returnExpirationDate = F, returnIsHighlyQualified = F, returnIssueDate = F, returnLineNumber = F, returnModifiedTime = F, returnTempCertificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempCertificationDetail", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCertificationDetail
#'
#' This function returns fields for a TempCertificationDetail.
#'
#' @param TempCertificationDetailID The id of the TempCertificationDetail.\cr Run \code{\link{getAllTempCertificationDetails}} for a list of TempCertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempCertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCertificationDetail <- function(TempCertificationDetailID, EntityID = 1, returnTempCertificationDetailID = F, returnCertificationCompetencyCode = F, returnCertificationCompetencyID = F, returnCertificationGradeHighCodeDescription = F, returnCertificationGradeIDHigh = F, returnCertificationGradeIDLow = F, returnCertificationGradeLowCodeDescription = F, returnCertificationID = F, returnCertificationLevelCode = F, returnCertificationLevelID = F, returnCertificationSubjectCode = F, returnCertificationSubjectID = F, returnCreatedTime = F, returnExpirationDate = F, returnIsHighlyQualified = F, returnIssueDate = F, returnLineNumber = F, returnModifiedTime = F, returnTempCertificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempCertificationDetail", TempCertificationDetailID, searchFields, EntityID)
}
#' Modify a specific TempCertificationDetail
#'
#' This function modifies fields for a TempCertificationDetail.
#'
#' @param TempCertificationDetailID The id of the TempCertificationDetail to be modified.\cr Run \code{\link{getAllTempCertificationDetails}} for a list of TempCertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempCertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCertificationDetail <- function(TempCertificationDetailID, EntityID = 1, setCertificationCompetencyCode = NULL, setCertificationCompetencyID = NULL, setCertificationGradeHighCodeDescription = NULL, setCertificationGradeIDHigh = NULL, setCertificationGradeIDLow = NULL, setCertificationGradeLowCodeDescription = NULL, setCertificationID = NULL, setCertificationLevelCode = NULL, setCertificationLevelID = NULL, setCertificationSubjectCode = NULL, setCertificationSubjectID = NULL, setExpirationDate = NULL, setIsHighlyQualified = NULL, setIssueDate = NULL, setLineNumber = NULL, setTempCertificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempCertificationDetail", TempCertificationDetailID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCertificationDetail.
#'
#' This function creates a new TempCertificationDetail.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempCertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCertificationDetail <- function(EntityID = 1, setCertificationCompetencyCode = NULL, setCertificationCompetencyID = NULL, setCertificationGradeHighCodeDescription = NULL, setCertificationGradeIDHigh = NULL, setCertificationGradeIDLow = NULL, setCertificationGradeLowCodeDescription = NULL, setCertificationID = NULL, setCertificationLevelCode = NULL, setCertificationLevelID = NULL, setCertificationSubjectCode = NULL, setCertificationSubjectID = NULL, setExpirationDate = NULL, setIsHighlyQualified = NULL, setIssueDate = NULL, setLineNumber = NULL, setTempCertificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempCertificationDetail", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCertificationDetail
#'
#' This function deletes a TempCertificationDetail.
#'
#' @param TempCertificationDetailID The id of the TempCertificationDetail.\cr Run \code{\link{getAllTempCertificationDetails}} for a list of TempCertificationDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempCertificationDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCertificationDetail <- function(TempCertificationDetailID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempCertificationDetail", TempCertificationDetailID, EntityID)
}
#' Get all TempCertificationErrors.
#'
#' This function returns a dataframe of all TempCertificationErrors in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempCertificationErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCertificationErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCertificationErrorID = F, returnCertificationID = F, returnCreatedTime = F, returnError = F, returnErrorDetail = F, returnLineNumber = F, returnModifiedTime = F, returnNameLFM = F, returnTempCertificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempCertificationError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCertificationError
#'
#' This function returns fields for a TempCertificationError.
#'
#' @param TempCertificationErrorID The id of the TempCertificationError.\cr Run \code{\link{getAllTempCertificationErrors}} for a list of TempCertificationErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempCertificationError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCertificationError <- function(TempCertificationErrorID, EntityID = 1, returnTempCertificationErrorID = F, returnCertificationID = F, returnCreatedTime = F, returnError = F, returnErrorDetail = F, returnLineNumber = F, returnModifiedTime = F, returnNameLFM = F, returnTempCertificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempCertificationError", TempCertificationErrorID, searchFields, EntityID)
}
#' Modify a specific TempCertificationError
#'
#' This function modifies fields for a TempCertificationError.
#'
#' @param TempCertificationErrorID The id of the TempCertificationError to be modified.\cr Run \code{\link{getAllTempCertificationErrors}} for a list of TempCertificationErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempCertificationError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCertificationError <- function(TempCertificationErrorID, EntityID = 1, setCertificationID = NULL, setError = NULL, setErrorDetail = NULL, setLineNumber = NULL, setNameLFM = NULL, setTempCertificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempCertificationError", TempCertificationErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCertificationError.
#'
#' This function creates a new TempCertificationError.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempCertificationError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCertificationError <- function(EntityID = 1, setCertificationID = NULL, setError = NULL, setErrorDetail = NULL, setLineNumber = NULL, setNameLFM = NULL, setTempCertificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempCertificationError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCertificationError
#'
#' This function deletes a TempCertificationError.
#'
#' @param TempCertificationErrorID The id of the TempCertificationError.\cr Run \code{\link{getAllTempCertificationErrors}} for a list of TempCertificationErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempCertificationError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCertificationError <- function(TempCertificationErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempCertificationError", TempCertificationErrorID, EntityID)
}
#' Get all TempEmergencyContacts.
#'
#' This function returns a dataframe of all TempEmergencyContacts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempEmergencyContacts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempEmergencyContacts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempEmergencyContactID = F, returnAllowPickUp = F, returnCreatedTime = F, returnEmergencyContactFor = F, returnEmergencyContactName = F, returnExceptionNote = F, returnHasActiveRestrictedAccess = F, returnHasExceptions = F, returnModifiedTime = F, returnNameID = F, returnNameIDEmergencyContact = F, returnRank = F, returnRelationshipDescription = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempEmergencyContact", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempEmergencyContact
#'
#' This function returns fields for a TempEmergencyContact.
#'
#' @param TempEmergencyContactID The id of the TempEmergencyContact.\cr Run \code{\link{getAllTempEmergencyContacts}} for a list of TempEmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempEmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempEmergencyContact <- function(TempEmergencyContactID, EntityID = 1, returnTempEmergencyContactID = F, returnAllowPickUp = F, returnCreatedTime = F, returnEmergencyContactFor = F, returnEmergencyContactName = F, returnExceptionNote = F, returnHasActiveRestrictedAccess = F, returnHasExceptions = F, returnModifiedTime = F, returnNameID = F, returnNameIDEmergencyContact = F, returnRank = F, returnRelationshipDescription = F, returnRelationshipID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempEmergencyContact", TempEmergencyContactID, searchFields, EntityID)
}
#' Modify a specific TempEmergencyContact
#'
#' This function modifies fields for a TempEmergencyContact.
#'
#' @param TempEmergencyContactID The id of the TempEmergencyContact to be modified.\cr Run \code{\link{getAllTempEmergencyContacts}} for a list of TempEmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempEmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempEmergencyContact <- function(TempEmergencyContactID, EntityID = 1, setAllowPickUp = NULL, setEmergencyContactFor = NULL, setEmergencyContactName = NULL, setExceptionNote = NULL, setHasActiveRestrictedAccess = NULL, setHasExceptions = NULL, setNameID = NULL, setNameIDEmergencyContact = NULL, setRank = NULL, setRelationshipDescription = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempEmergencyContact", TempEmergencyContactID, names(functionParams), functionParams, EntityID)
}
#' Create new TempEmergencyContact.
#'
#' This function creates a new TempEmergencyContact.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempEmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempEmergencyContact <- function(EntityID = 1, setAllowPickUp = NULL, setEmergencyContactFor = NULL, setEmergencyContactName = NULL, setExceptionNote = NULL, setHasActiveRestrictedAccess = NULL, setHasExceptions = NULL, setNameID = NULL, setNameIDEmergencyContact = NULL, setRank = NULL, setRelationshipDescription = NULL, setRelationshipID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempEmergencyContact", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempEmergencyContact
#'
#' This function deletes a TempEmergencyContact.
#'
#' @param TempEmergencyContactID The id of the TempEmergencyContact.\cr Run \code{\link{getAllTempEmergencyContacts}} for a list of TempEmergencyContacts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempEmergencyContact.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempEmergencyContact <- function(TempEmergencyContactID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempEmergencyContact", TempEmergencyContactID, EntityID)
}
#' Get all TempExceptions.
#'
#' This function returns a dataframe of all TempExceptions in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempExceptions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempExceptions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempExceptionID = F, returnCreatedTime = F, returnLineNumber = F, returnMessage = F, returnModifiedTime = F, returnNameLFM = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempException", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempException
#'
#' This function returns fields for a TempException.
#'
#' @param TempExceptionID The id of the TempException.\cr Run \code{\link{getAllTempExceptions}} for a list of TempExceptions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempException.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempException <- function(TempExceptionID, EntityID = 1, returnTempExceptionID = F, returnCreatedTime = F, returnLineNumber = F, returnMessage = F, returnModifiedTime = F, returnNameLFM = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempException", TempExceptionID, searchFields, EntityID)
}
#' Modify a specific TempException
#'
#' This function modifies fields for a TempException.
#'
#' @param TempExceptionID The id of the TempException to be modified.\cr Run \code{\link{getAllTempExceptions}} for a list of TempExceptions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempException.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempException <- function(TempExceptionID, EntityID = 1, setLineNumber = NULL, setMessage = NULL, setNameLFM = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempException", TempExceptionID, names(functionParams), functionParams, EntityID)
}
#' Create new TempException.
#'
#' This function creates a new TempException.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempException.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempException <- function(EntityID = 1, setLineNumber = NULL, setMessage = NULL, setNameLFM = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempException", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempException
#'
#' This function deletes a TempException.
#'
#' @param TempExceptionID The id of the TempException.\cr Run \code{\link{getAllTempExceptions}} for a list of TempExceptions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempException.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempException <- function(TempExceptionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempException", TempExceptionID, EntityID)
}
#' Get all TempMassUpdateGeolocationAddresses.
#'
#' This function returns a dataframe of all TempMassUpdateGeolocationAddresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempMassUpdateGeolocationAddresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempMassUpdateGeolocationAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempMassUpdateGeolocationAddressID = F, returnAddressID = F, returnConfidenceRating = F, returnCreatedTime = F, returnCurrentGeoID = F, returnCurrentLatitude = F, returnCurrentLongitude = F, returnFullAddress = F, returnModifiedTime = F, returnPreviousWasAPILoaded = F, returnUpdatedGeoID = F, returnUpdatedLatitude = F, returnUpdatedLongitude = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempMassUpdateGeolocationAddress", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempMassUpdateGeolocationAddress
#'
#' This function returns fields for a TempMassUpdateGeolocationAddress.
#'
#' @param TempMassUpdateGeolocationAddressID The id of the TempMassUpdateGeolocationAddress.\cr Run \code{\link{getAllTempMassUpdateGeolocationAddresses}} for a list of TempMassUpdateGeolocationAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempMassUpdateGeolocationAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempMassUpdateGeolocationAddress <- function(TempMassUpdateGeolocationAddressID, EntityID = 1, returnTempMassUpdateGeolocationAddressID = F, returnAddressID = F, returnConfidenceRating = F, returnCreatedTime = F, returnCurrentGeoID = F, returnCurrentLatitude = F, returnCurrentLongitude = F, returnFullAddress = F, returnModifiedTime = F, returnPreviousWasAPILoaded = F, returnUpdatedGeoID = F, returnUpdatedLatitude = F, returnUpdatedLongitude = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempMassUpdateGeolocationAddress", TempMassUpdateGeolocationAddressID, searchFields, EntityID)
}
#' Modify a specific TempMassUpdateGeolocationAddress
#'
#' This function modifies fields for a TempMassUpdateGeolocationAddress.
#'
#' @param TempMassUpdateGeolocationAddressID The id of the TempMassUpdateGeolocationAddress to be modified.\cr Run \code{\link{getAllTempMassUpdateGeolocationAddresses}} for a list of TempMassUpdateGeolocationAddress.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempMassUpdateGeolocationAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempMassUpdateGeolocationAddress <- function(TempMassUpdateGeolocationAddressID, EntityID = 1, setAddressID = NULL, setConfidenceRating = NULL, setCurrentGeoID = NULL, setCurrentLatitude = NULL, setCurrentLongitude = NULL, setFullAddress = NULL, setPreviousWasAPILoaded = NULL, setUpdatedGeoID = NULL, setUpdatedLatitude = NULL, setUpdatedLongitude = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempMassUpdateGeolocationAddress", TempMassUpdateGeolocationAddressID, names(functionParams), functionParams, EntityID)
}
#' Create new TempMassUpdateGeolocationAddress.
#'
#' This function creates a new TempMassUpdateGeolocationAddress.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempMassUpdateGeolocationAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempMassUpdateGeolocationAddress <- function(EntityID = 1, setAddressID = NULL, setConfidenceRating = NULL, setCurrentGeoID = NULL, setCurrentLatitude = NULL, setCurrentLongitude = NULL, setFullAddress = NULL, setPreviousWasAPILoaded = NULL, setUpdatedGeoID = NULL, setUpdatedLatitude = NULL, setUpdatedLongitude = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempMassUpdateGeolocationAddress", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempMassUpdateGeolocationAddress
#'
#' This function deletes a TempMassUpdateGeolocationAddress.
#'
#' @param TempMassUpdateGeolocationAddressID The id of the TempMassUpdateGeolocationAddress.\cr Run \code{\link{getAllTempMassUpdateGeolocationAddresses}} for a list of TempMassUpdateGeolocationAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempMassUpdateGeolocationAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempMassUpdateGeolocationAddress <- function(TempMassUpdateGeolocationAddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempMassUpdateGeolocationAddress", TempMassUpdateGeolocationAddressID, EntityID)
}
#' Get all TempNameAddresses.
#'
#' This function returns a dataframe of all TempNameAddresses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempNameAddresses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempNameAddresses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempNameAddressID = F, returnAddressID = F, returnCreatedTime = F, returnFullAddress = F, returnIs1099 = F, returnIsBusDropoff = F, returnIsBusPickup = F, returnIsMailing = F, returnIsOrderFrom = F, returnIsPhysical = F, returnIsRemitTo = F, returnIsW2 = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempNameAddress", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempNameAddress
#'
#' This function returns fields for a TempNameAddress.
#'
#' @param TempNameAddressID The id of the TempNameAddress.\cr Run \code{\link{getAllTempNameAddresses}} for a list of TempNameAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempNameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempNameAddress <- function(TempNameAddressID, EntityID = 1, returnTempNameAddressID = F, returnAddressID = F, returnCreatedTime = F, returnFullAddress = F, returnIs1099 = F, returnIsBusDropoff = F, returnIsBusPickup = F, returnIsMailing = F, returnIsOrderFrom = F, returnIsPhysical = F, returnIsRemitTo = F, returnIsW2 = F, returnModifiedTime = F, returnNameID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempNameAddress", TempNameAddressID, searchFields, EntityID)
}
#' Modify a specific TempNameAddress
#'
#' This function modifies fields for a TempNameAddress.
#'
#' @param TempNameAddressID The id of the TempNameAddress to be modified.\cr Run \code{\link{getAllTempNameAddresses}} for a list of TempNameAddress.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempNameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempNameAddress <- function(TempNameAddressID, EntityID = 1, setAddressID = NULL, setFullAddress = NULL, setIs1099 = NULL, setIsBusDropoff = NULL, setIsBusPickup = NULL, setIsMailing = NULL, setIsOrderFrom = NULL, setIsPhysical = NULL, setIsRemitTo = NULL, setIsW2 = NULL, setNameID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempNameAddress", TempNameAddressID, names(functionParams), functionParams, EntityID)
}
#' Create new TempNameAddress.
#'
#' This function creates a new TempNameAddress.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempNameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempNameAddress <- function(EntityID = 1, setAddressID = NULL, setFullAddress = NULL, setIs1099 = NULL, setIsBusDropoff = NULL, setIsBusPickup = NULL, setIsMailing = NULL, setIsOrderFrom = NULL, setIsPhysical = NULL, setIsRemitTo = NULL, setIsW2 = NULL, setNameID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempNameAddress", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempNameAddress
#'
#' This function deletes a TempNameAddress.
#'
#' @param TempNameAddressID The id of the TempNameAddress.\cr Run \code{\link{getAllTempNameAddresses}} for a list of TempNameAddresses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempNameAddress.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempNameAddress <- function(TempNameAddressID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempNameAddress", TempNameAddressID, EntityID)
}
#' Get all TempNameEmails.
#'
#' This function returns a dataframe of all TempNameEmails in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempNameEmails in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempNameEmails <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempNameEmailID = F, returnCreatedTime = F, returnEmailAddress = F, returnEmailTypeID = F, returnErrorCount = F, returnFullNameFML = F, returnModifiedTime = F, returnNameEmailID = F, returnNameID = F, returnNote = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempNameEmail", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempNameEmail
#'
#' This function returns fields for a TempNameEmail.
#'
#' @param TempNameEmailID The id of the TempNameEmail.\cr Run \code{\link{getAllTempNameEmails}} for a list of TempNameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempNameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempNameEmail <- function(TempNameEmailID, EntityID = 1, returnTempNameEmailID = F, returnCreatedTime = F, returnEmailAddress = F, returnEmailTypeID = F, returnErrorCount = F, returnFullNameFML = F, returnModifiedTime = F, returnNameEmailID = F, returnNameID = F, returnNote = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempNameEmail", TempNameEmailID, searchFields, EntityID)
}
#' Modify a specific TempNameEmail
#'
#' This function modifies fields for a TempNameEmail.
#'
#' @param TempNameEmailID The id of the TempNameEmail to be modified.\cr Run \code{\link{getAllTempNameEmails}} for a list of TempNameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempNameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempNameEmail <- function(TempNameEmailID, EntityID = 1, setEmailAddress = NULL, setEmailTypeID = NULL, setErrorCount = NULL, setFullNameFML = NULL, setNameEmailID = NULL, setNameID = NULL, setNote = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempNameEmail", TempNameEmailID, names(functionParams), functionParams, EntityID)
}
#' Create new TempNameEmail.
#'
#' This function creates a new TempNameEmail.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempNameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempNameEmail <- function(EntityID = 1, setEmailAddress = NULL, setEmailTypeID = NULL, setErrorCount = NULL, setFullNameFML = NULL, setNameEmailID = NULL, setNameID = NULL, setNote = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempNameEmail", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempNameEmail
#'
#' This function deletes a TempNameEmail.
#'
#' @param TempNameEmailID The id of the TempNameEmail.\cr Run \code{\link{getAllTempNameEmails}} for a list of TempNameEmails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempNameEmail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempNameEmail <- function(TempNameEmailID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempNameEmail", TempNameEmailID, EntityID)
}
#' Get all TempNameEmailErrors.
#'
#' This function returns a dataframe of all TempNameEmailErrors in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempNameEmailErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempNameEmailErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempNameEmailErrorID = F, returnCreatedTime = F, returnErrorField = F, returnErrorNumber = F, returnErrorText = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempNameEmailError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempNameEmailError
#'
#' This function returns fields for a TempNameEmailError.
#'
#' @param TempNameEmailErrorID The id of the TempNameEmailError.\cr Run \code{\link{getAllTempNameEmailErrors}} for a list of TempNameEmailErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempNameEmailError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempNameEmailError <- function(TempNameEmailErrorID, EntityID = 1, returnTempNameEmailErrorID = F, returnCreatedTime = F, returnErrorField = F, returnErrorNumber = F, returnErrorText = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempNameEmailError", TempNameEmailErrorID, searchFields, EntityID)
}
#' Modify a specific TempNameEmailError
#'
#' This function modifies fields for a TempNameEmailError.
#'
#' @param TempNameEmailErrorID The id of the TempNameEmailError to be modified.\cr Run \code{\link{getAllTempNameEmailErrors}} for a list of TempNameEmailErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempNameEmailError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempNameEmailError <- function(TempNameEmailErrorID, EntityID = 1, setErrorField = NULL, setErrorNumber = NULL, setErrorText = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempNameEmailError", TempNameEmailErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempNameEmailError.
#'
#' This function creates a new TempNameEmailError.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempNameEmailError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempNameEmailError <- function(EntityID = 1, setErrorField = NULL, setErrorNumber = NULL, setErrorText = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempNameEmailError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempNameEmailError
#'
#' This function deletes a TempNameEmailError.
#'
#' @param TempNameEmailErrorID The id of the TempNameEmailError.\cr Run \code{\link{getAllTempNameEmailErrors}} for a list of TempNameEmailErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempNameEmailError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempNameEmailError <- function(TempNameEmailErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempNameEmailError", TempNameEmailErrorID, EntityID)
}
#' Get all TempNameErrors.
#'
#' This function returns a dataframe of all TempNameErrors in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempNameErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempNameErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempNameErrorID = F, returnCreatedTime = F, returnFirstName = F, returnLastName = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempNameError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempNameError
#'
#' This function returns fields for a TempNameError.
#'
#' @param TempNameErrorID The id of the TempNameError.\cr Run \code{\link{getAllTempNameErrors}} for a list of TempNameErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempNameError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempNameError <- function(TempNameErrorID, EntityID = 1, returnTempNameErrorID = F, returnCreatedTime = F, returnFirstName = F, returnLastName = F, returnModifiedTime = F, returnNameID = F, returnNote = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempNameError", TempNameErrorID, searchFields, EntityID)
}
#' Modify a specific TempNameError
#'
#' This function modifies fields for a TempNameError.
#'
#' @param TempNameErrorID The id of the TempNameError to be modified.\cr Run \code{\link{getAllTempNameErrors}} for a list of TempNameErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempNameError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempNameError <- function(TempNameErrorID, EntityID = 1, setFirstName = NULL, setLastName = NULL, setNameID = NULL, setNote = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempNameError", TempNameErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempNameError.
#'
#' This function creates a new TempNameError.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempNameError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempNameError <- function(EntityID = 1, setFirstName = NULL, setLastName = NULL, setNameID = NULL, setNote = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempNameError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempNameError
#'
#' This function deletes a TempNameError.
#'
#' @param TempNameErrorID The id of the TempNameError.\cr Run \code{\link{getAllTempNameErrors}} for a list of TempNameErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempNameError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempNameError <- function(TempNameErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempNameError", TempNameErrorID, EntityID)
}
#' Get all TempNameNumbers.
#'
#' This function returns a dataframe of all TempNameNumbers in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All TempNameNumbers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempNameNumbers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempNameNumberID = F, returnConflictReason = F, returnCreatedTime = F, returnEmployeeID = F, returnFullNameLFM = F, returnHasConflicts = F, returnModifiedTime = F, returnNameID = F, returnNameNumber = F, returnNewEmployeeNumber = F, returnNewVendorNumber = F, returnOldEmployeeNumber = F, returnOldVendorNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "TempNameNumber", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempNameNumber
#'
#' This function returns fields for a TempNameNumber.
#'
#' @param TempNameNumberID The id of the TempNameNumber.\cr Run \code{\link{getAllTempNameNumbers}} for a list of TempNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the TempNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempNameNumber <- function(TempNameNumberID, EntityID = 1, returnTempNameNumberID = F, returnConflictReason = F, returnCreatedTime = F, returnEmployeeID = F, returnFullNameLFM = F, returnHasConflicts = F, returnModifiedTime = F, returnNameID = F, returnNameNumber = F, returnNewEmployeeNumber = F, returnNewVendorNumber = F, returnOldEmployeeNumber = F, returnOldVendorNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "TempNameNumber", TempNameNumberID, searchFields, EntityID)
}
#' Modify a specific TempNameNumber
#'
#' This function modifies fields for a TempNameNumber.
#'
#' @param TempNameNumberID The id of the TempNameNumber to be modified.\cr Run \code{\link{getAllTempNameNumbers}} for a list of TempNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified TempNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempNameNumber <- function(TempNameNumberID, EntityID = 1, setConflictReason = NULL, setEmployeeID = NULL, setFullNameLFM = NULL, setHasConflicts = NULL, setNameID = NULL, setNameNumber = NULL, setNewEmployeeNumber = NULL, setNewVendorNumber = NULL, setOldEmployeeNumber = NULL, setOldVendorNumber = NULL, setVendorID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "TempNameNumber", TempNameNumberID, names(functionParams), functionParams, EntityID)
}
#' Create new TempNameNumber.
#'
#' This function creates a new TempNameNumber.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created TempNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempNameNumber <- function(EntityID = 1, setConflictReason = NULL, setEmployeeID = NULL, setFullNameLFM = NULL, setHasConflicts = NULL, setNameID = NULL, setNameNumber = NULL, setNewEmployeeNumber = NULL, setNewVendorNumber = NULL, setOldEmployeeNumber = NULL, setOldVendorNumber = NULL, setVendorID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "TempNameNumber", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempNameNumber
#'
#' This function deletes a TempNameNumber.
#'
#' @param TempNameNumberID The id of the TempNameNumber.\cr Run \code{\link{getAllTempNameNumbers}} for a list of TempNameNumbers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted TempNameNumber.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempNameNumber <- function(TempNameNumberID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "TempNameNumber", TempNameNumberID, EntityID)
}
#' Get all Vehicles.
#'
#' This function returns a dataframe of all Vehicles in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Vehicles in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllVehicles <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnVehicleID = F, returnColor = F, returnCreatedTime = F, returnLicensePlateNumber = F, returnMakeModel = F, returnModifiedTime = F, returnPermitDate = F, returnPermitNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVIN = F, returnYear = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Vehicle", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Vehicle
#'
#' This function returns fields for a Vehicle.
#'
#' @param VehicleID The id of the Vehicle.\cr Run \code{\link{getAllVehicles}} for a list of Vehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Vehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getVehicle <- function(VehicleID, EntityID = 1, returnVehicleID = F, returnColor = F, returnCreatedTime = F, returnLicensePlateNumber = F, returnMakeModel = F, returnModifiedTime = F, returnPermitDate = F, returnPermitNumber = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVIN = F, returnYear = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Vehicle", VehicleID, searchFields, EntityID)
}
#' Modify a specific Vehicle
#'
#' This function modifies fields for a Vehicle.
#'
#' @param VehicleID The id of the Vehicle to be modified.\cr Run \code{\link{getAllVehicles}} for a list of Vehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Vehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyVehicle <- function(VehicleID, EntityID = 1, setColor = NULL, setLicensePlateNumber = NULL, setMakeModel = NULL, setPermitDate = NULL, setPermitNumber = NULL, setVIN = NULL, setYear = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Vehicle", VehicleID, names(functionParams), functionParams, EntityID)
}
#' Create new Vehicle.
#'
#' This function creates a new Vehicle.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Vehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createVehicle <- function(EntityID = 1, setColor = NULL, setLicensePlateNumber = NULL, setMakeModel = NULL, setPermitDate = NULL, setPermitNumber = NULL, setVIN = NULL, setYear = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Vehicle", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Vehicle
#'
#' This function deletes a Vehicle.
#'
#' @param VehicleID The id of the Vehicle.\cr Run \code{\link{getAllVehicles}} for a list of Vehicles.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Vehicle.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteVehicle <- function(VehicleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Vehicle", VehicleID, EntityID)
}
#' Get all Zips.
#'
#' This function returns a dataframe of all Zips in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return All Zips in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllZips <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnZipID = F, returnCity = F, returnCityState = F, returnCityStateCode = F, returnCityStateZip = F, returnCityZipCode = F, returnCountryCode = F, returnCreatedTime = F, returnEdFiCountryID = F, returnFreeFormCountry = F, returnFreeFormState = F, returnIsPreferredByUSPS = F, returnModifiedTime = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Demographics", "Zip", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Zip
#'
#' This function returns fields for a Zip.
#'
#' @param ZipID The id of the Zip.\cr Run \code{\link{getAllZips}} for a list of Zips.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Demographics
#' @return Details for the Zip.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getZip <- function(ZipID, EntityID = 1, returnZipID = F, returnCity = F, returnCityState = F, returnCityStateCode = F, returnCityStateZip = F, returnCityZipCode = F, returnCountryCode = F, returnCreatedTime = F, returnEdFiCountryID = F, returnFreeFormCountry = F, returnFreeFormState = F, returnIsPreferredByUSPS = F, returnModifiedTime = F, returnStateID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZipCode = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Demographics", "Zip", ZipID, searchFields, EntityID)
}
#' Modify a specific Zip
#'
#' This function modifies fields for a Zip.
#'
#' @param ZipID The id of the Zip to be modified.\cr Run \code{\link{getAllZips}} for a list of Zips.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return Details of the modified Zip.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyZip <- function(ZipID, EntityID = 1, setCity = NULL, setCountryCode = NULL, setEdFiCountryID = NULL, setFreeFormCountry = NULL, setFreeFormState = NULL, setIsPreferredByUSPS = NULL, setStateID = NULL, setZipCode = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Demographics", "Zip", ZipID, names(functionParams), functionParams, EntityID)
}
#' Create new Zip.
#'
#' This function creates a new Zip.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Demographics
#' @return The fields used to define the newly created Zip.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createZip <- function(EntityID = 1, setCity = NULL, setCountryCode = NULL, setEdFiCountryID = NULL, setFreeFormCountry = NULL, setFreeFormState = NULL, setIsPreferredByUSPS = NULL, setStateID = NULL, setZipCode = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Demographics", "Zip", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Zip
#'
#' This function deletes a Zip.
#'
#' @param ZipID The id of the Zip.\cr Run \code{\link{getAllZips}} for a list of Zips.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Demographics
#' @return The id of the deleted Zip.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteZip <- function(ZipID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Demographics", "Zip", ZipID, EntityID)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.