#' Get all Buildings.
#'
#' This function returns a dataframe of all Buildings 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 District
#' @return All Buildings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllBuildings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnBuildingID = F, returnAccountDistributionString = F, returnAddressID = F, returnBuildingMNID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = F, returnFederalNCESSchoolID = F, returnMaximumStudentCount = F, returnMinimumStudentCount = F, returnModifiedTime = F, returnOptimumStudentCount = F, returnParcelNumber = F, returnSTARSchoolNumber = F, returnUnemploymentInsuranceUnitLocation = 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("District", "Building", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Building
#'
#' This function returns fields for a Building.
#'
#' @param BuildingID The id of the Building.\cr Run \code{\link{getAllBuildings}} for a list of Buildings.
#' @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 District
#' @return Details for the Building.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getBuilding <- function(BuildingID, EntityID = 1, returnBuildingID = F, returnAccountDistributionString = F, returnAddressID = F, returnBuildingMNID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = F, returnFederalNCESSchoolID = F, returnMaximumStudentCount = F, returnMinimumStudentCount = F, returnModifiedTime = F, returnOptimumStudentCount = F, returnParcelNumber = F, returnSTARSchoolNumber = F, returnUnemploymentInsuranceUnitLocation = 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("District", "Building", BuildingID, searchFields, EntityID)
}
#' Modify a specific Building
#'
#' This function modifies fields for a Building.
#'
#' @param BuildingID The id of the Building to be modified.\cr Run \code{\link{getAllBuildings}} for a list of Buildings.
#' @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 District
#' @return Details of the modified Building.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyBuilding <- function(BuildingID, EntityID = 1, setAddressID = NULL, setCode = NULL, setDescription = NULL, setDistrictID = NULL, setFederalNCESSchoolID = NULL, setMaximumStudentCount = NULL, setMinimumStudentCount = NULL, setOptimumStudentCount = NULL, setParcelNumber = NULL, setSTARSchoolNumber = NULL, setUnemploymentInsuranceUnitLocation = 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("District", "Building", BuildingID, names(functionParams), functionParams, EntityID)
}
#' Create new Building.
#'
#' This function creates a new Building.
#'
#' @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 District
#' @return The fields used to define the newly created Building.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createBuilding <- function(EntityID = 1, setAddressID = NULL, setCode = NULL, setDescription = NULL, setDistrictID = NULL, setFederalNCESSchoolID = NULL, setMaximumStudentCount = NULL, setMinimumStudentCount = NULL, setOptimumStudentCount = NULL, setParcelNumber = NULL, setSTARSchoolNumber = NULL, setUnemploymentInsuranceUnitLocation = 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("District", "Building", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Building
#'
#' This function deletes a Building.
#'
#' @param BuildingID The id of the Building.\cr Run \code{\link{getAllBuildings}} for a list of Buildings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted Building.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteBuilding <- function(BuildingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "Building", BuildingID, EntityID)
}
#' Get all CalendarYears.
#'
#' This function returns a dataframe of all CalendarYears 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 District
#' @return All CalendarYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarYearID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnNumericYear = 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("District", "CalendarYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarYear
#'
#' This function returns fields for a CalendarYear.
#'
#' @param CalendarYearID The id of the CalendarYear.\cr Run \code{\link{getAllCalendarYears}} for a list of CalendarYears.
#' @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 District
#' @return Details for the CalendarYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarYear <- function(CalendarYearID, EntityID = 1, returnCalendarYearID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnNumericYear = 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("District", "CalendarYear", CalendarYearID, searchFields, EntityID)
}
#' Modify a specific CalendarYear
#'
#' This function modifies fields for a CalendarYear.
#'
#' @param CalendarYearID The id of the CalendarYear to be modified.\cr Run \code{\link{getAllCalendarYears}} for a list of CalendarYears.
#' @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 District
#' @return Details of the modified CalendarYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarYear <- function(CalendarYearID, EntityID = 1, setDescription = NULL, setNumericYear = 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("District", "CalendarYear", CalendarYearID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarYear.
#'
#' This function creates a new CalendarYear.
#'
#' @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 District
#' @return The fields used to define the newly created CalendarYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarYear <- function(EntityID = 1, setDescription = NULL, setNumericYear = 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("District", "CalendarYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarYear
#'
#' This function deletes a CalendarYear.
#'
#' @param CalendarYearID The id of the CalendarYear.\cr Run \code{\link{getAllCalendarYears}} for a list of CalendarYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted CalendarYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarYear <- function(CalendarYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "CalendarYear", CalendarYearID, EntityID)
}
#' Get all ConfigEntityYears.
#'
#' This function returns a dataframe of all ConfigEntityYears 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 District
#' @return All ConfigEntityYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigEntityYearsDistrict <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigEntityYearID = F, returnConfigEntityYearIDClonedFrom = F, returnCreatedTime = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "ConfigEntityYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigEntityYear
#'
#' This function returns fields for a ConfigEntityYear.
#'
#' @param ConfigEntityYearID The id of the ConfigEntityYear.\cr Run \code{\link{getAllConfigEntityYears}} for a list of ConfigEntityYears.
#' @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 District
#' @return Details for the ConfigEntityYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigEntityYearDistrict <- function(ConfigEntityYearID, EntityID = 1, returnConfigEntityYearID = F, returnConfigEntityYearIDClonedFrom = F, returnCreatedTime = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "ConfigEntityYear", ConfigEntityYearID, searchFields, EntityID)
}
#' Modify a specific ConfigEntityYear
#'
#' This function modifies fields for a ConfigEntityYear.
#'
#' @param ConfigEntityYearID The id of the ConfigEntityYear to be modified.\cr Run \code{\link{getAllConfigEntityYears}} for a list of ConfigEntityYears.
#' @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 District
#' @return Details of the modified ConfigEntityYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigEntityYearDistrict <- function(ConfigEntityYearID, EntityID = 1, setConfigEntityYearIDClonedFrom = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "ConfigEntityYear", ConfigEntityYearID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigEntityYear.
#'
#' This function creates a new ConfigEntityYear.
#'
#' @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 District
#' @return The fields used to define the newly created ConfigEntityYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigEntityYearDistrict <- function(EntityID = 1, setConfigEntityYearIDClonedFrom = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "ConfigEntityYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigEntityYear
#'
#' This function deletes a ConfigEntityYear.
#'
#' @param ConfigEntityYearID The id of the ConfigEntityYear.\cr Run \code{\link{getAllConfigEntityYears}} for a list of ConfigEntityYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted ConfigEntityYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigEntityYearDistrict <- function(ConfigEntityYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "ConfigEntityYear", ConfigEntityYearID, EntityID)
}
#' Get all DistrictGroups.
#'
#' This function returns a dataframe of all DistrictGroups 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 District
#' @return All DistrictGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDistrictGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDistrictGroupID = F, returnCreatedTime = F, returnModifiedTime = F, returnName = 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("District", "DistrictGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DistrictGroup
#'
#' This function returns fields for a DistrictGroup.
#'
#' @param DistrictGroupID The id of the DistrictGroup.\cr Run \code{\link{getAllDistrictGroups}} for a list of DistrictGroups.
#' @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 District
#' @return Details for the DistrictGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDistrictGroup <- function(DistrictGroupID, EntityID = 1, returnDistrictGroupID = F, returnCreatedTime = F, returnModifiedTime = F, returnName = 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("District", "DistrictGroup", DistrictGroupID, searchFields, EntityID)
}
#' Modify a specific DistrictGroup
#'
#' This function modifies fields for a DistrictGroup.
#'
#' @param DistrictGroupID The id of the DistrictGroup to be modified.\cr Run \code{\link{getAllDistrictGroups}} for a list of DistrictGroups.
#' @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 District
#' @return Details of the modified DistrictGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDistrictGroup <- function(DistrictGroupID, EntityID = 1, setName = 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("District", "DistrictGroup", DistrictGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new DistrictGroup.
#'
#' This function creates a new DistrictGroup.
#'
#' @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 District
#' @return The fields used to define the newly created DistrictGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDistrictGroup <- function(EntityID = 1, setName = 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("District", "DistrictGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DistrictGroup
#'
#' This function deletes a DistrictGroup.
#'
#' @param DistrictGroupID The id of the DistrictGroup.\cr Run \code{\link{getAllDistrictGroups}} for a list of DistrictGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted DistrictGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDistrictGroup <- function(DistrictGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "DistrictGroup", DistrictGroupID, EntityID)
}
#' Get a specific District
#'
#' This function returns fields for a District.
#'
#' @param DistrictID The id of the District.\cr Run \code{\link{getAllDistricts}} for a list of Districts.
#' @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 District
#' @return Details for the District.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDistrict <- function(DistrictID, EntityID = 1, returnDistrictID = F, returnBuildingID = F, returnCodeName = F, returnCreatedTime = F, returnDistrictCodeBySchoolYear = F, returnDistrictGroupID = F, returnDistrictMNID = F, returnDistrictNumber = F, returnFaxNumber = F, returnFaxNumberIsInternational = F, returnFormattedPhoneNumber = F, returnIsCurrentlySelected = F, returnModifiedTime = F, returnName = F, returnNCESIDCode = F, returnPhoneNumber = F, returnPhoneNumberIsInternational = F, returnRCDTCodeBySchoolYear = F, returnStaffIDSuperintendent = F, returnStateDistrictCode = F, returnStateDistrictMNID = F, returnStateDistrictTypeCodeMNID = 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("District", "District", DistrictID, searchFields, EntityID)
}
#' Modify a specific District
#'
#' This function modifies fields for a District.
#'
#' @param DistrictID The id of the District to be modified.\cr Run \code{\link{getAllDistricts}} for a list of Districts.
#' @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 District
#' @return Details of the modified District.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDistrict <- function(DistrictID, EntityID = 1, setBuildingID = NULL, setDistrictGroupID = NULL, setDistrictNumber = NULL, setFaxNumber = NULL, setFaxNumberIsInternational = NULL, setName = NULL, setNCESIDCode = NULL, setPhoneNumber = NULL, setPhoneNumberIsInternational = NULL, setStaffIDSuperintendent = NULL, setStateDistrictMNID = NULL, setStateDistrictTypeCodeMNID = 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("District", "District", DistrictID, names(functionParams), functionParams, EntityID)
}
#' Create new District.
#'
#' This function creates a new District.
#'
#' @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 District
#' @return The fields used to define the newly created District.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDistrict <- function(EntityID = 1, setBuildingID = NULL, setDistrictGroupID = NULL, setDistrictNumber = NULL, setFaxNumber = NULL, setFaxNumberIsInternational = NULL, setName = NULL, setNCESIDCode = NULL, setPhoneNumber = NULL, setPhoneNumberIsInternational = NULL, setStaffIDSuperintendent = NULL, setStateDistrictMNID = NULL, setStateDistrictTypeCodeMNID = NULL){
stop('Cannot create a District or Entity via the API!')
}
#' Delete a specific District
#'
#' This function deletes a District.
#'
#' @param DistrictID The id of the District.\cr Run \code{\link{getAllDistricts}} for a list of Districts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted District.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDistrict <- function(DistrictID, EntityID = 1){
stop('Cannot delete a District or Entity via the API!')
}
#' Get all DistrictSchoolYears.
#'
#' This function returns a dataframe of all DistrictSchoolYears 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 District
#' @return All DistrictSchoolYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDistrictSchoolYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDistrictSchoolYearID = F, returnCreatedTime = F, returnDistrictID = F, returnDistrictSchoolYearIDClonedFrom = F, returnEdFiDistrictID = F, returnHarassmentPolicyWebLink = F, returnHasDesegregationPlan = F, returnHasDistanceEducation = F, returnHasEarlyChildhood = F, returnHasEarlyChildhoodNonIDEA = F, returnHasGEDPreparationProgram = F, returnHasHarassmentPolicy = F, returnHasKindergarten = F, returnHasKindergartenFullDayCost = F, returnHasKindergartenFullDayFree = F, returnHasKindergartenPartDayCost = F, returnHasKindergartenPartDayFree = F, returnHasPreschool = F, returnHasPreschoolAllChildren = F, returnHasPreschoolFullDayCost = F, returnHasPreschoolFullDayFree = F, returnHasPreschoolIDEA = F, returnHasPreschoolLowIncome = F, returnHasPreschoolPartDayCost = F, returnHasPreschoolPartDayFree = F, returnHasPreschoolTitleI = F, returnIsCRDCCollectedForSchoolYear = F, returnModifiedTime = F, returnNameIDDisability = F, returnNameIDRace = F, returnNameIDSex = F, returnSchoolYearID = 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("District", "DistrictSchoolYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DistrictSchoolYear
#'
#' This function returns fields for a DistrictSchoolYear.
#'
#' @param DistrictSchoolYearID The id of the DistrictSchoolYear.\cr Run \code{\link{getAllDistrictSchoolYears}} for a list of DistrictSchoolYears.
#' @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 District
#' @return Details for the DistrictSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDistrictSchoolYear <- function(DistrictSchoolYearID, EntityID = 1, returnDistrictSchoolYearID = F, returnCreatedTime = F, returnDistrictID = F, returnDistrictSchoolYearIDClonedFrom = F, returnEdFiDistrictID = F, returnHarassmentPolicyWebLink = F, returnHasDesegregationPlan = F, returnHasDistanceEducation = F, returnHasEarlyChildhood = F, returnHasEarlyChildhoodNonIDEA = F, returnHasGEDPreparationProgram = F, returnHasHarassmentPolicy = F, returnHasKindergarten = F, returnHasKindergartenFullDayCost = F, returnHasKindergartenFullDayFree = F, returnHasKindergartenPartDayCost = F, returnHasKindergartenPartDayFree = F, returnHasPreschool = F, returnHasPreschoolAllChildren = F, returnHasPreschoolFullDayCost = F, returnHasPreschoolFullDayFree = F, returnHasPreschoolIDEA = F, returnHasPreschoolLowIncome = F, returnHasPreschoolPartDayCost = F, returnHasPreschoolPartDayFree = F, returnHasPreschoolTitleI = F, returnIsCRDCCollectedForSchoolYear = F, returnModifiedTime = F, returnNameIDDisability = F, returnNameIDRace = F, returnNameIDSex = F, returnSchoolYearID = 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("District", "DistrictSchoolYear", DistrictSchoolYearID, searchFields, EntityID)
}
#' Modify a specific DistrictSchoolYear
#'
#' This function modifies fields for a DistrictSchoolYear.
#'
#' @param DistrictSchoolYearID The id of the DistrictSchoolYear to be modified.\cr Run \code{\link{getAllDistrictSchoolYears}} for a list of DistrictSchoolYears.
#' @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 District
#' @return Details of the modified DistrictSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDistrictSchoolYear <- function(DistrictSchoolYearID, EntityID = 1, setDistrictID = NULL, setDistrictSchoolYearIDClonedFrom = NULL, setEdFiDistrictID = NULL, setHarassmentPolicyWebLink = NULL, setHasDesegregationPlan = NULL, setHasDistanceEducation = NULL, setHasEarlyChildhood = NULL, setHasEarlyChildhoodNonIDEA = NULL, setHasGEDPreparationProgram = NULL, setHasHarassmentPolicy = NULL, setHasKindergarten = NULL, setHasKindergartenFullDayCost = NULL, setHasKindergartenFullDayFree = NULL, setHasKindergartenPartDayCost = NULL, setHasKindergartenPartDayFree = NULL, setHasPreschool = NULL, setHasPreschoolAllChildren = NULL, setHasPreschoolFullDayCost = NULL, setHasPreschoolFullDayFree = NULL, setHasPreschoolIDEA = NULL, setHasPreschoolLowIncome = NULL, setHasPreschoolPartDayCost = NULL, setHasPreschoolPartDayFree = NULL, setHasPreschoolTitleI = NULL, setNameIDDisability = NULL, setNameIDRace = NULL, setNameIDSex = NULL, setSchoolYearID = 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("District", "DistrictSchoolYear", DistrictSchoolYearID, names(functionParams), functionParams, EntityID)
}
#' Create new DistrictSchoolYear.
#'
#' This function creates a new DistrictSchoolYear.
#'
#' @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 District
#' @return The fields used to define the newly created DistrictSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDistrictSchoolYear <- function(EntityID = 1, setDistrictID = NULL, setDistrictSchoolYearIDClonedFrom = NULL, setEdFiDistrictID = NULL, setHarassmentPolicyWebLink = NULL, setHasDesegregationPlan = NULL, setHasDistanceEducation = NULL, setHasEarlyChildhood = NULL, setHasEarlyChildhoodNonIDEA = NULL, setHasGEDPreparationProgram = NULL, setHasHarassmentPolicy = NULL, setHasKindergarten = NULL, setHasKindergartenFullDayCost = NULL, setHasKindergartenFullDayFree = NULL, setHasKindergartenPartDayCost = NULL, setHasKindergartenPartDayFree = NULL, setHasPreschool = NULL, setHasPreschoolAllChildren = NULL, setHasPreschoolFullDayCost = NULL, setHasPreschoolFullDayFree = NULL, setHasPreschoolIDEA = NULL, setHasPreschoolLowIncome = NULL, setHasPreschoolPartDayCost = NULL, setHasPreschoolPartDayFree = NULL, setHasPreschoolTitleI = NULL, setNameIDDisability = NULL, setNameIDRace = NULL, setNameIDSex = NULL, setSchoolYearID = 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("District", "DistrictSchoolYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DistrictSchoolYear
#'
#' This function deletes a DistrictSchoolYear.
#'
#' @param DistrictSchoolYearID The id of the DistrictSchoolYear.\cr Run \code{\link{getAllDistrictSchoolYears}} for a list of DistrictSchoolYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted DistrictSchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDistrictSchoolYear <- function(DistrictSchoolYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "DistrictSchoolYear", DistrictSchoolYearID, EntityID)
}
#' Get all EntityCloneDestinations.
#'
#' This function returns a dataframe of all EntityCloneDestinations 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 District
#' @return All EntityCloneDestinations in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityCloneDestinations <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityCloneDestinationID = F, returnCreatedTime = F, returnEntityCloneRunID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "EntityCloneDestination", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityCloneDestination
#'
#' This function returns fields for an EntityCloneDestination.
#'
#' @param EntityCloneDestinationID The id of the EntityCloneDestination.\cr Run \code{\link{getAllEntityCloneDestinations}} for a list of EntityCloneDestinations.
#' @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 District
#' @return Details for the EntityCloneDestination.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityCloneDestination <- function(EntityCloneDestinationID, EntityID = 1, returnEntityCloneDestinationID = F, returnCreatedTime = F, returnEntityCloneRunID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "EntityCloneDestination", EntityCloneDestinationID, searchFields, EntityID)
}
#' Modify a specific EntityCloneDestination
#'
#' This function modifies fields for an EntityCloneDestination.
#'
#' @param EntityCloneDestinationID The id of the EntityCloneDestination to be modified.\cr Run \code{\link{getAllEntityCloneDestinations}} for a list of EntityCloneDestinations.
#' @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 District
#' @return Details of the modified EntityCloneDestination.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityCloneDestination <- function(EntityCloneDestinationID, EntityID = 1, setEntityCloneRunID = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "EntityCloneDestination", EntityCloneDestinationID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityCloneDestination.
#'
#' This function creates a new EntityCloneDestination.
#'
#' @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 District
#' @return The fields used to define the newly created EntityCloneDestination.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityCloneDestination <- function(EntityID = 1, setEntityCloneRunID = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "EntityCloneDestination", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityCloneDestination
#'
#' This function deletes an EntityCloneDestination.
#'
#' @param EntityCloneDestinationID The id of the EntityCloneDestination.\cr Run \code{\link{getAllEntityCloneDestinations}} for a list of EntityCloneDestinations.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityCloneDestination.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityCloneDestination <- function(EntityCloneDestinationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityCloneDestination", EntityCloneDestinationID, EntityID)
}
#' Get all EntityCloneErrors.
#'
#' This function returns a dataframe of all EntityCloneErrors 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 District
#' @return All EntityCloneErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityCloneErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityCloneErrorID = F, returnAttemptedOperation = F, returnAttemptedOperationCode = F, returnCreatedTime = F, returnEntityCloneSelectedObjectID = F, returnEntityIDTarget = F, returnMessage = F, returnModifiedTime = F, returnObjectJSON = F, returnSchoolYearIDTarget = 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("District", "EntityCloneError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityCloneError
#'
#' This function returns fields for an EntityCloneError.
#'
#' @param EntityCloneErrorID The id of the EntityCloneError.\cr Run \code{\link{getAllEntityCloneErrors}} for a list of EntityCloneErrors.
#' @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 District
#' @return Details for the EntityCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityCloneError <- function(EntityCloneErrorID, EntityID = 1, returnEntityCloneErrorID = F, returnAttemptedOperation = F, returnAttemptedOperationCode = F, returnCreatedTime = F, returnEntityCloneSelectedObjectID = F, returnEntityIDTarget = F, returnMessage = F, returnModifiedTime = F, returnObjectJSON = F, returnSchoolYearIDTarget = 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("District", "EntityCloneError", EntityCloneErrorID, searchFields, EntityID)
}
#' Modify a specific EntityCloneError
#'
#' This function modifies fields for an EntityCloneError.
#'
#' @param EntityCloneErrorID The id of the EntityCloneError to be modified.\cr Run \code{\link{getAllEntityCloneErrors}} for a list of EntityCloneErrors.
#' @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 District
#' @return Details of the modified EntityCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityCloneError <- function(EntityCloneErrorID, EntityID = 1, setAttemptedOperation = NULL, setAttemptedOperationCode = NULL, setEntityCloneSelectedObjectID = NULL, setEntityIDTarget = NULL, setMessage = NULL, setObjectJSON = NULL, setSchoolYearIDTarget = 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("District", "EntityCloneError", EntityCloneErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityCloneError.
#'
#' This function creates a new EntityCloneError.
#'
#' @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 District
#' @return The fields used to define the newly created EntityCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityCloneError <- function(EntityID = 1, setAttemptedOperation = NULL, setAttemptedOperationCode = NULL, setEntityCloneSelectedObjectID = NULL, setEntityIDTarget = NULL, setMessage = NULL, setObjectJSON = NULL, setSchoolYearIDTarget = 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("District", "EntityCloneError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityCloneError
#'
#' This function deletes an EntityCloneError.
#'
#' @param EntityCloneErrorID The id of the EntityCloneError.\cr Run \code{\link{getAllEntityCloneErrors}} for a list of EntityCloneErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityCloneError <- function(EntityCloneErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityCloneError", EntityCloneErrorID, EntityID)
}
#' Get all EntityCloneRuns.
#'
#' This function returns a dataframe of all EntityCloneRuns 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 District
#' @return All EntityCloneRuns in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityCloneRuns <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityCloneRunID = F, returnCreatedTime = F, returnEntityIDSource = F, returnMediaID = F, returnModifiedTime = F, returnSchoolYearIDSource = F, returnStatus = F, returnStatusCode = F, returnTargetEntities = F, returnTargetYears = F, returnTotalRecordsAdded = F, returnTotalRecordsDeleted = F, returnTotalRecordsErrored = F, returnTotalRecordsUpdated = 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("District", "EntityCloneRun", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityCloneRun
#'
#' This function returns fields for an EntityCloneRun.
#'
#' @param EntityCloneRunID The id of the EntityCloneRun.\cr Run \code{\link{getAllEntityCloneRuns}} for a list of EntityCloneRuns.
#' @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 District
#' @return Details for the EntityCloneRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityCloneRun <- function(EntityCloneRunID, EntityID = 1, returnEntityCloneRunID = F, returnCreatedTime = F, returnEntityIDSource = F, returnMediaID = F, returnModifiedTime = F, returnSchoolYearIDSource = F, returnStatus = F, returnStatusCode = F, returnTargetEntities = F, returnTargetYears = F, returnTotalRecordsAdded = F, returnTotalRecordsDeleted = F, returnTotalRecordsErrored = F, returnTotalRecordsUpdated = 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("District", "EntityCloneRun", EntityCloneRunID, searchFields, EntityID)
}
#' Modify a specific EntityCloneRun
#'
#' This function modifies fields for an EntityCloneRun.
#'
#' @param EntityCloneRunID The id of the EntityCloneRun to be modified.\cr Run \code{\link{getAllEntityCloneRuns}} for a list of EntityCloneRuns.
#' @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 District
#' @return Details of the modified EntityCloneRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityCloneRun <- function(EntityCloneRunID, EntityID = 1, setEntityIDSource = NULL, setMediaID = NULL, setSchoolYearIDSource = NULL, setStatus = NULL, setStatusCode = 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("District", "EntityCloneRun", EntityCloneRunID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityCloneRun.
#'
#' This function creates a new EntityCloneRun.
#'
#' @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 District
#' @return The fields used to define the newly created EntityCloneRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityCloneRun <- function(EntityID = 1, setEntityIDSource = NULL, setMediaID = NULL, setSchoolYearIDSource = NULL, setStatus = NULL, setStatusCode = 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("District", "EntityCloneRun", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityCloneRun
#'
#' This function deletes an EntityCloneRun.
#'
#' @param EntityCloneRunID The id of the EntityCloneRun.\cr Run \code{\link{getAllEntityCloneRuns}} for a list of EntityCloneRuns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityCloneRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityCloneRun <- function(EntityCloneRunID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityCloneRun", EntityCloneRunID, EntityID)
}
#' Get all EntityCloneSelectedObjects.
#'
#' This function returns a dataframe of all EntityCloneSelectedObjects 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 District
#' @return All EntityCloneSelectedObjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityCloneSelectedObjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityCloneSelectedObjectID = F, returnCloneOrder = F, returnCreatedTime = F, returnDependencies = F, returnEntityCloneRunID = F, returnIsAdding = F, returnIsDeleting = F, returnIsUpdating = F, returnModifiedTime = F, returnNumberOfRecordsAdded = F, returnNumberOfRecordsDeleted = F, returnNumberOfRecordsErrored = F, returnNumberOfRecordsExported = F, returnNumberOfRecordsUpdated = F, returnObjectID = 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("District", "EntityCloneSelectedObject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityCloneSelectedObject
#'
#' This function returns fields for an EntityCloneSelectedObject.
#'
#' @param EntityCloneSelectedObjectID The id of the EntityCloneSelectedObject.\cr Run \code{\link{getAllEntityCloneSelectedObjects}} for a list of EntityCloneSelectedObjects.
#' @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 District
#' @return Details for the EntityCloneSelectedObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityCloneSelectedObject <- function(EntityCloneSelectedObjectID, EntityID = 1, returnEntityCloneSelectedObjectID = F, returnCloneOrder = F, returnCreatedTime = F, returnDependencies = F, returnEntityCloneRunID = F, returnIsAdding = F, returnIsDeleting = F, returnIsUpdating = F, returnModifiedTime = F, returnNumberOfRecordsAdded = F, returnNumberOfRecordsDeleted = F, returnNumberOfRecordsErrored = F, returnNumberOfRecordsExported = F, returnNumberOfRecordsUpdated = F, returnObjectID = 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("District", "EntityCloneSelectedObject", EntityCloneSelectedObjectID, searchFields, EntityID)
}
#' Modify a specific EntityCloneSelectedObject
#'
#' This function modifies fields for an EntityCloneSelectedObject.
#'
#' @param EntityCloneSelectedObjectID The id of the EntityCloneSelectedObject to be modified.\cr Run \code{\link{getAllEntityCloneSelectedObjects}} for a list of EntityCloneSelectedObjects.
#' @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 District
#' @return Details of the modified EntityCloneSelectedObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityCloneSelectedObject <- function(EntityCloneSelectedObjectID, EntityID = 1, setCloneOrder = NULL, setDependencies = NULL, setEntityCloneRunID = NULL, setIsAdding = NULL, setIsDeleting = NULL, setIsUpdating = NULL, setNumberOfRecordsAdded = NULL, setNumberOfRecordsDeleted = NULL, setNumberOfRecordsErrored = NULL, setNumberOfRecordsExported = NULL, setNumberOfRecordsUpdated = NULL, setObjectID = 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("District", "EntityCloneSelectedObject", EntityCloneSelectedObjectID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityCloneSelectedObject.
#'
#' This function creates a new EntityCloneSelectedObject.
#'
#' @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 District
#' @return The fields used to define the newly created EntityCloneSelectedObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityCloneSelectedObject <- function(EntityID = 1, setCloneOrder = NULL, setDependencies = NULL, setEntityCloneRunID = NULL, setIsAdding = NULL, setIsDeleting = NULL, setIsUpdating = NULL, setNumberOfRecordsAdded = NULL, setNumberOfRecordsDeleted = NULL, setNumberOfRecordsErrored = NULL, setNumberOfRecordsExported = NULL, setNumberOfRecordsUpdated = NULL, setObjectID = 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("District", "EntityCloneSelectedObject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityCloneSelectedObject
#'
#' This function deletes an EntityCloneSelectedObject.
#'
#' @param EntityCloneSelectedObjectID The id of the EntityCloneSelectedObject.\cr Run \code{\link{getAllEntityCloneSelectedObjects}} for a list of EntityCloneSelectedObjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityCloneSelectedObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityCloneSelectedObject <- function(EntityCloneSelectedObjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityCloneSelectedObject", EntityCloneSelectedObjectID, EntityID)
}
#' Get all EntityCloneSelections.
#'
#' This function returns a dataframe of all EntityCloneSelections 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 District
#' @return All EntityCloneSelections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityCloneSelections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityCloneSelectionID = F, returnCreatedTime = F, returnDependencies = F, returnEntityCloneRunID = F, returnIsAdding = F, returnIsDeleting = F, returnIsUpdating = F, returnModifiedTime = F, returnModuleID = F, returnObjectName = 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("District", "EntityCloneSelection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityCloneSelection
#'
#' This function returns fields for an EntityCloneSelection.
#'
#' @param EntityCloneSelectionID The id of the EntityCloneSelection.\cr Run \code{\link{getAllEntityCloneSelections}} for a list of EntityCloneSelections.
#' @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 District
#' @return Details for the EntityCloneSelection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityCloneSelection <- function(EntityCloneSelectionID, EntityID = 1, returnEntityCloneSelectionID = F, returnCreatedTime = F, returnDependencies = F, returnEntityCloneRunID = F, returnIsAdding = F, returnIsDeleting = F, returnIsUpdating = F, returnModifiedTime = F, returnModuleID = F, returnObjectName = 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("District", "EntityCloneSelection", EntityCloneSelectionID, searchFields, EntityID)
}
#' Modify a specific EntityCloneSelection
#'
#' This function modifies fields for an EntityCloneSelection.
#'
#' @param EntityCloneSelectionID The id of the EntityCloneSelection to be modified.\cr Run \code{\link{getAllEntityCloneSelections}} for a list of EntityCloneSelections.
#' @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 District
#' @return Details of the modified EntityCloneSelection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityCloneSelection <- function(EntityCloneSelectionID, EntityID = 1, setDependencies = NULL, setEntityCloneRunID = NULL, setIsAdding = NULL, setIsDeleting = NULL, setIsUpdating = NULL, setModuleID = NULL, setObjectName = 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("District", "EntityCloneSelection", EntityCloneSelectionID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityCloneSelection.
#'
#' This function creates a new EntityCloneSelection.
#'
#' @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 District
#' @return The fields used to define the newly created EntityCloneSelection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityCloneSelection <- function(EntityID = 1, setDependencies = NULL, setEntityCloneRunID = NULL, setIsAdding = NULL, setIsDeleting = NULL, setIsUpdating = NULL, setModuleID = NULL, setObjectName = 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("District", "EntityCloneSelection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityCloneSelection
#'
#' This function deletes an EntityCloneSelection.
#'
#' @param EntityCloneSelectionID The id of the EntityCloneSelection.\cr Run \code{\link{getAllEntityCloneSelections}} for a list of EntityCloneSelections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityCloneSelection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityCloneSelection <- function(EntityCloneSelectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityCloneSelection", EntityCloneSelectionID, EntityID)
}
#' Get all EntityGroups.
#'
#' This function returns a dataframe of all EntityGroups 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 District
#' @return All EntityGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupID = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnName = 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("District", "EntityGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroup
#'
#' This function returns fields for an EntityGroup.
#'
#' @param EntityGroupID The id of the EntityGroup.\cr Run \code{\link{getAllEntityGroups}} for a list of EntityGroups.
#' @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 District
#' @return Details for the EntityGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroup <- function(EntityGroupID, EntityID = 1, returnEntityGroupID = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnName = 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("District", "EntityGroup", EntityGroupID, searchFields, EntityID)
}
#' Modify a specific EntityGroup
#'
#' This function modifies fields for an EntityGroup.
#'
#' @param EntityGroupID The id of the EntityGroup to be modified.\cr Run \code{\link{getAllEntityGroups}} for a list of EntityGroups.
#' @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 District
#' @return Details of the modified EntityGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroup <- function(EntityGroupID, EntityID = 1, setDistrictID = NULL, setName = 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("District", "EntityGroup", EntityGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroup.
#'
#' This function creates a new EntityGroup.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroup <- function(EntityID = 1, setDistrictID = NULL, setName = 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("District", "EntityGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroup
#'
#' This function deletes an EntityGroup.
#'
#' @param EntityGroupID The id of the EntityGroup.\cr Run \code{\link{getAllEntityGroups}} for a list of EntityGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroup <- function(EntityGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroup", EntityGroupID, EntityID)
}
#' Get all EntityGroupEntities.
#'
#' This function returns a dataframe of all EntityGroupEntities 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 District
#' @return All EntityGroupEntities in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroupEntities <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupEntityID = F, returnCreatedTime = F, returnEntityGroupID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "EntityGroupEntity", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroupEntity
#'
#' This function returns fields for an EntityGroupEntity.
#'
#' @param EntityGroupEntityID The id of the EntityGroupEntity.\cr Run \code{\link{getAllEntityGroupEntities}} for a list of EntityGroupEntities.
#' @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 District
#' @return Details for the EntityGroupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroupEntity <- function(EntityGroupEntityID, EntityID = 1, returnEntityGroupEntityID = F, returnCreatedTime = F, returnEntityGroupID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = 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("District", "EntityGroupEntity", EntityGroupEntityID, searchFields, EntityID)
}
#' Modify a specific EntityGroupEntity
#'
#' This function modifies fields for an EntityGroupEntity.
#'
#' @param EntityGroupEntityID The id of the EntityGroupEntity to be modified.\cr Run \code{\link{getAllEntityGroupEntities}} for a list of EntityGroupEntitys.
#' @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 District
#' @return Details of the modified EntityGroupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroupEntity <- function(EntityGroupEntityID, EntityID = 1, setEntityGroupID = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "EntityGroupEntity", EntityGroupEntityID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroupEntity.
#'
#' This function creates a new EntityGroupEntity.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroupEntity <- function(EntityID = 1, setEntityGroupID = NULL, setEntityID = NULL, setSchoolYearID = 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("District", "EntityGroupEntity", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroupEntity
#'
#' This function deletes an EntityGroupEntity.
#'
#' @param EntityGroupEntityID The id of the EntityGroupEntity.\cr Run \code{\link{getAllEntityGroupEntities}} for a list of EntityGroupEntities.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroupEntity <- function(EntityGroupEntityID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroupEntity", EntityGroupEntityID, EntityID)
}
#' Get all EntityGroupSetups.
#'
#' This function returns a dataframe of all EntityGroupSetups 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 District
#' @return All EntityGroupSetups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroupSetups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupSetupID = F, returnCreatedTime = F, returnEffectiveGroupName = F, returnEntityGroupID = F, returnEntityIDPrimary = F, returnHasBeenProcessed = F, returnModifiedTime = F, returnNewGroupName = F, returnSchoolYearID = 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("District", "EntityGroupSetup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroupSetup
#'
#' This function returns fields for an EntityGroupSetup.
#'
#' @param EntityGroupSetupID The id of the EntityGroupSetup.\cr Run \code{\link{getAllEntityGroupSetups}} for a list of EntityGroupSetups.
#' @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 District
#' @return Details for the EntityGroupSetup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroupSetup <- function(EntityGroupSetupID, EntityID = 1, returnEntityGroupSetupID = F, returnCreatedTime = F, returnEffectiveGroupName = F, returnEntityGroupID = F, returnEntityIDPrimary = F, returnHasBeenProcessed = F, returnModifiedTime = F, returnNewGroupName = F, returnSchoolYearID = 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("District", "EntityGroupSetup", EntityGroupSetupID, searchFields, EntityID)
}
#' Modify a specific EntityGroupSetup
#'
#' This function modifies fields for an EntityGroupSetup.
#'
#' @param EntityGroupSetupID The id of the EntityGroupSetup to be modified.\cr Run \code{\link{getAllEntityGroupSetups}} for a list of EntityGroupSetups.
#' @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 District
#' @return Details of the modified EntityGroupSetup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroupSetup <- function(EntityGroupSetupID, EntityID = 1, setEntityGroupID = NULL, setEntityIDPrimary = NULL, setHasBeenProcessed = NULL, setNewGroupName = NULL, setSchoolYearID = 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("District", "EntityGroupSetup", EntityGroupSetupID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroupSetup.
#'
#' This function creates a new EntityGroupSetup.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroupSetup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroupSetup <- function(EntityID = 1, setEntityGroupID = NULL, setEntityIDPrimary = NULL, setHasBeenProcessed = NULL, setNewGroupName = NULL, setSchoolYearID = 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("District", "EntityGroupSetup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroupSetup
#'
#' This function deletes an EntityGroupSetup.
#'
#' @param EntityGroupSetupID The id of the EntityGroupSetup.\cr Run \code{\link{getAllEntityGroupSetups}} for a list of EntityGroupSetups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroupSetup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroupSetup <- function(EntityGroupSetupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroupSetup", EntityGroupSetupID, EntityID)
}
#' Get all EntityGroupSetupEntities.
#'
#' This function returns a dataframe of all EntityGroupSetupEntities 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 District
#' @return All EntityGroupSetupEntities in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroupSetupEntities <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupSetupEntityID = F, returnCreatedTime = F, returnEntityGroupSetupID = F, returnEntityID = 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("District", "EntityGroupSetupEntity", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroupSetupEntity
#'
#' This function returns fields for an EntityGroupSetupEntity.
#'
#' @param EntityGroupSetupEntityID The id of the EntityGroupSetupEntity.\cr Run \code{\link{getAllEntityGroupSetupEntities}} for a list of EntityGroupSetupEntities.
#' @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 District
#' @return Details for the EntityGroupSetupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroupSetupEntity <- function(EntityGroupSetupEntityID, EntityID = 1, returnEntityGroupSetupEntityID = F, returnCreatedTime = F, returnEntityGroupSetupID = F, returnEntityID = 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("District", "EntityGroupSetupEntity", EntityGroupSetupEntityID, searchFields, EntityID)
}
#' Modify a specific EntityGroupSetupEntity
#'
#' This function modifies fields for an EntityGroupSetupEntity.
#'
#' @param EntityGroupSetupEntityID The id of the EntityGroupSetupEntity to be modified.\cr Run \code{\link{getAllEntityGroupSetupEntities}} for a list of EntityGroupSetupEntitys.
#' @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 District
#' @return Details of the modified EntityGroupSetupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroupSetupEntity <- function(EntityGroupSetupEntityID, EntityID = 1, setEntityGroupSetupID = NULL, setEntityID = 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("District", "EntityGroupSetupEntity", EntityGroupSetupEntityID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroupSetupEntity.
#'
#' This function creates a new EntityGroupSetupEntity.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroupSetupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroupSetupEntity <- function(EntityID = 1, setEntityGroupSetupID = NULL, setEntityID = 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("District", "EntityGroupSetupEntity", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroupSetupEntity
#'
#' This function deletes an EntityGroupSetupEntity.
#'
#' @param EntityGroupSetupEntityID The id of the EntityGroupSetupEntity.\cr Run \code{\link{getAllEntityGroupSetupEntities}} for a list of EntityGroupSetupEntities.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroupSetupEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroupSetupEntity <- function(EntityGroupSetupEntityID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroupSetupEntity", EntityGroupSetupEntityID, EntityID)
}
#' Get all EntityGroupSetupRuns.
#'
#' This function returns a dataframe of all EntityGroupSetupRuns 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 District
#' @return All EntityGroupSetupRuns in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroupSetupRuns <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupSetupRunID = F, returnCreatedTime = F, returnEntityGroupSetupID = 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("District", "EntityGroupSetupRun", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroupSetupRun
#'
#' This function returns fields for an EntityGroupSetupRun.
#'
#' @param EntityGroupSetupRunID The id of the EntityGroupSetupRun.\cr Run \code{\link{getAllEntityGroupSetupRuns}} for a list of EntityGroupSetupRuns.
#' @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 District
#' @return Details for the EntityGroupSetupRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroupSetupRun <- function(EntityGroupSetupRunID, EntityID = 1, returnEntityGroupSetupRunID = F, returnCreatedTime = F, returnEntityGroupSetupID = 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("District", "EntityGroupSetupRun", EntityGroupSetupRunID, searchFields, EntityID)
}
#' Modify a specific EntityGroupSetupRun
#'
#' This function modifies fields for an EntityGroupSetupRun.
#'
#' @param EntityGroupSetupRunID The id of the EntityGroupSetupRun to be modified.\cr Run \code{\link{getAllEntityGroupSetupRuns}} for a list of EntityGroupSetupRuns.
#' @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 District
#' @return Details of the modified EntityGroupSetupRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroupSetupRun <- function(EntityGroupSetupRunID, EntityID = 1, setEntityGroupSetupID = 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("District", "EntityGroupSetupRun", EntityGroupSetupRunID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroupSetupRun.
#'
#' This function creates a new EntityGroupSetupRun.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroupSetupRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroupSetupRun <- function(EntityID = 1, setEntityGroupSetupID = 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("District", "EntityGroupSetupRun", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroupSetupRun
#'
#' This function deletes an EntityGroupSetupRun.
#'
#' @param EntityGroupSetupRunID The id of the EntityGroupSetupRun.\cr Run \code{\link{getAllEntityGroupSetupRuns}} for a list of EntityGroupSetupRuns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroupSetupRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroupSetupRun <- function(EntityGroupSetupRunID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroupSetupRun", EntityGroupSetupRunID, EntityID)
}
#' Get all EntityGroupSetupRunDetails.
#'
#' This function returns a dataframe of all EntityGroupSetupRunDetails 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 District
#' @return All EntityGroupSetupRunDetails in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllEntityGroupSetupRunDetails <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnEntityGroupSetupRunDetailID = F, returnChangeType = F, returnChangeTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnEntityGroupSetupRunID = F, returnEntityID = F, returnError = F, returnIdentifyingFields = F, returnIsProcessed = F, returnIsUpdated = F, returnModifiedTime = F, returnModule = F, returnNewFieldValues = F, returnNewValues = F, returnObject = F, returnObjectPrimaryKey = F, returnOriginalValues = F, returnSchoolYearID = 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("District", "EntityGroupSetupRunDetail", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific EntityGroupSetupRunDetail
#'
#' This function returns fields for an EntityGroupSetupRunDetail.
#'
#' @param EntityGroupSetupRunDetailID The id of the EntityGroupSetupRunDetail.\cr Run \code{\link{getAllEntityGroupSetupRunDetails}} for a list of EntityGroupSetupRunDetails.
#' @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 District
#' @return Details for the EntityGroupSetupRunDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntityGroupSetupRunDetail <- function(EntityGroupSetupRunDetailID, EntityID = 1, returnEntityGroupSetupRunDetailID = F, returnChangeType = F, returnChangeTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnEntityGroupSetupRunID = F, returnEntityID = F, returnError = F, returnIdentifyingFields = F, returnIsProcessed = F, returnIsUpdated = F, returnModifiedTime = F, returnModule = F, returnNewFieldValues = F, returnNewValues = F, returnObject = F, returnObjectPrimaryKey = F, returnOriginalValues = F, returnSchoolYearID = 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("District", "EntityGroupSetupRunDetail", EntityGroupSetupRunDetailID, searchFields, EntityID)
}
#' Modify a specific EntityGroupSetupRunDetail
#'
#' This function modifies fields for an EntityGroupSetupRunDetail.
#'
#' @param EntityGroupSetupRunDetailID The id of the EntityGroupSetupRunDetail to be modified.\cr Run \code{\link{getAllEntityGroupSetupRunDetails}} for a list of EntityGroupSetupRunDetails.
#' @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 District
#' @return Details of the modified EntityGroupSetupRunDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntityGroupSetupRunDetail <- function(EntityGroupSetupRunDetailID, EntityID = 1, setChangeType = NULL, setChangeTypeCode = NULL, setEntityGroupKey = NULL, setEntityGroupSetupRunID = NULL, setEntityID = NULL, setError = NULL, setIdentifyingFields = NULL, setIsProcessed = NULL, setIsUpdated = NULL, setModule = NULL, setNewFieldValues = NULL, setNewValues = NULL, setObject = NULL, setObjectPrimaryKey = NULL, setOriginalValues = NULL, setSchoolYearID = 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("District", "EntityGroupSetupRunDetail", EntityGroupSetupRunDetailID, names(functionParams), functionParams, EntityID)
}
#' Create new EntityGroupSetupRunDetail.
#'
#' This function creates a new EntityGroupSetupRunDetail.
#'
#' @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 District
#' @return The fields used to define the newly created EntityGroupSetupRunDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntityGroupSetupRunDetail <- function(EntityID = 1, setChangeType = NULL, setChangeTypeCode = NULL, setEntityGroupKey = NULL, setEntityGroupSetupRunID = NULL, setEntityID = NULL, setError = NULL, setIdentifyingFields = NULL, setIsProcessed = NULL, setIsUpdated = NULL, setModule = NULL, setNewFieldValues = NULL, setNewValues = NULL, setObject = NULL, setObjectPrimaryKey = NULL, setOriginalValues = NULL, setSchoolYearID = 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("District", "EntityGroupSetupRunDetail", names(functionParams), functionParams, EntityID)
}
#' Delete a specific EntityGroupSetupRunDetail
#'
#' This function deletes an EntityGroupSetupRunDetail.
#'
#' @param EntityGroupSetupRunDetailID The id of the EntityGroupSetupRunDetail.\cr Run \code{\link{getAllEntityGroupSetupRunDetails}} for a list of EntityGroupSetupRunDetails.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted EntityGroupSetupRunDetail.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntityGroupSetupRunDetail <- function(EntityGroupSetupRunDetailID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "EntityGroupSetupRunDetail", EntityGroupSetupRunDetailID, EntityID)
}
#' Get a specific Entity
#'
#' This function returns fields for an Entity.
#'
#' @param EntityID The id of the Entity.\cr Run \code{\link{getAllEntities}} for a list of Entities.
#' @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 District
#' @return Details for the Entity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getEntity <- function(EntityID, returnEntityID = F, returnAllowDualEnrollment = F, returnCampusID = F, returnCode = F, returnCodeName = F, returnCreatedTime = F, returnDistrictCodeEntityCode = F, returnDistrictID = F, returnEnforceAddressRangeDefaults = F, returnEntityCodeOrCombinedCodesFollettExport = F, returnEntityGroupCount = F, returnEntityIDHash = F, returnEntityMNID = F, returnExternalLinkEntityCount = F, returnIlluminateEndGradeLevel = F, returnIlluminateSiteType = F, returnIlluminateSiteTypeCalculated = F, returnIlluminateSiteTypeOverride = F, returnIlluminateStartGradeLevel = F, returnIsCurrentlySelected = F, returnIsDistrictWide = F, returnIsSystemWide = F, returnModifiedTime = F, returnName = F, returnReportToState = F, returnSchoolYearIDCurrent = F, returnTotalPlanEntityYears = 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("District", "Entity", EntityID, searchFields, EntityID)
}
#' Modify a specific Entity
#'
#' This function modifies fields for an Entity.
#'
#' @param EntityID The id of the Entity to be modified.\cr Run \code{\link{getAllEntities}} for a list of Entitys.
#' @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 District
#' @return Details of the modified Entity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyEntity <- function(EntityID, setAllowDualEnrollment = NULL, setCode = NULL, setDistrictID = NULL, setEnforceAddressRangeDefaults = NULL, setIlluminateSiteTypeOverride = NULL, setIsDistrictWide = NULL, setIsSystemWide = NULL, setName = NULL, setReportToState = NULL, setSchoolYearIDCurrent = 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("District", "Entity", EntityID, names(functionParams), functionParams, EntityID)
}
#' Create new Entity.
#'
#' This function creates a new Entity.
#'
#' @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 District
#' @return The fields used to define the newly created Entity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createEntity <- function(EntityID = 1, setAllowDualEnrollment = NULL, setCode = NULL, setDistrictID = NULL, setEnforceAddressRangeDefaults = NULL, setIlluminateSiteTypeOverride = NULL, setIsDistrictWide = NULL, setIsSystemWide = NULL, setName = NULL, setReportToState = NULL, setSchoolYearIDCurrent = NULL){
stop('Cannot create a District or Entity via the API!')
}
#' Delete a specific Entity
#'
#' This function deletes an Entity.
#'
#' @param EntityID The id of the Entity.\cr Run \code{\link{getAllEntities}} for a list of Entities.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted Entity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteEntity <- function(EntityID){
stop('Cannot delete a District or Entity via the API!')
}
#' Get all FiscalYears.
#'
#' This function returns a dataframe of all FiscalYears 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 District
#' @return All FiscalYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllFiscalYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnFiscalYearID = F, returnConflictAccountingUpdates = F, returnConflictAccountsPayableRuns = F, returnConflictAdditionDisposals = F, returnConflictBudgetAmendments = F, returnConflictCashReceiptDeposits = F, returnConflictDepreciations = F, returnConflictInvoices = F, returnConflictJournalEntries = F, returnConflictPayrollRuns = F, returnConflictPurchaseOrders = F, returnConflictWarehouseRequests = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = F, returnDynamicRelationshipID = F, returnEndDate = F, returnIsClosed = F, returnIsLockedByHR = F, returnModifiedTime = F, returnNumericYear = F, returnStartDate = 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("District", "FiscalYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific FiscalYear
#'
#' This function returns fields for a FiscalYear.
#'
#' @param FiscalYearID The id of the FiscalYear.\cr Run \code{\link{getAllFiscalYears}} for a list of FiscalYears.
#' @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 District
#' @return Details for the FiscalYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getFiscalYear <- function(FiscalYearID, EntityID = 1, returnFiscalYearID = F, returnConflictAccountingUpdates = F, returnConflictAccountsPayableRuns = F, returnConflictAdditionDisposals = F, returnConflictBudgetAmendments = F, returnConflictCashReceiptDeposits = F, returnConflictDepreciations = F, returnConflictInvoices = F, returnConflictJournalEntries = F, returnConflictPayrollRuns = F, returnConflictPurchaseOrders = F, returnConflictWarehouseRequests = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = F, returnDynamicRelationshipID = F, returnEndDate = F, returnIsClosed = F, returnIsLockedByHR = F, returnModifiedTime = F, returnNumericYear = F, returnStartDate = 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("District", "FiscalYear", FiscalYearID, searchFields, EntityID)
}
#' Modify a specific FiscalYear
#'
#' This function modifies fields for a FiscalYear.
#'
#' @param FiscalYearID The id of the FiscalYear to be modified.\cr Run \code{\link{getAllFiscalYears}} for a list of FiscalYears.
#' @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 District
#' @return Details of the modified FiscalYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyFiscalYear <- function(FiscalYearID, EntityID = 1, setDescription = NULL, setDistrictID = NULL, setDynamicRelationshipID = NULL, setEndDate = NULL, setIsLockedByHR = NULL, setStartDate = 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("District", "FiscalYear", FiscalYearID, names(functionParams), functionParams, EntityID)
}
#' Create new FiscalYear.
#'
#' This function creates a new FiscalYear.
#'
#' @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 District
#' @return The fields used to define the newly created FiscalYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createFiscalYear <- function(EntityID = 1, setDescription = NULL, setDistrictID = NULL, setDynamicRelationshipID = NULL, setEndDate = NULL, setIsLockedByHR = NULL, setStartDate = 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("District", "FiscalYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific FiscalYear
#'
#' This function deletes a FiscalYear.
#'
#' @param FiscalYearID The id of the FiscalYear.\cr Run \code{\link{getAllFiscalYears}} for a list of FiscalYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted FiscalYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteFiscalYear <- function(FiscalYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "FiscalYear", FiscalYearID, EntityID)
}
#' Get all Rooms.
#'
#' This function returns a dataframe of all Rooms 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 District
#' @return All Rooms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRooms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRoomID = F, returnBuildingCodeRoomNumber = F, returnBuildingID = F, returnCreatedTime = F, returnDescription = F, returnFormattedPhoneNumber = F, returnMaxConcurrentSections = F, returnMaxSeats = F, returnModifiedTime = F, returnPhoneExtension = F, returnPhoneNumber = F, returnPhoneNumberIsInternational = F, returnRoomNumber = F, returnRoomNumberDescription = F, returnRoomTypeID = F, returnSeatsAvailableForDateRangeAndDisplayPeriods = F, returnSquareFootage = 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("District", "Room", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Room
#'
#' This function returns fields for a Room.
#'
#' @param RoomID The id of the Room.\cr Run \code{\link{getAllRooms}} for a list of Rooms.
#' @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 District
#' @return Details for the Room.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRoom <- function(RoomID, EntityID = 1, returnRoomID = F, returnBuildingCodeRoomNumber = F, returnBuildingID = F, returnCreatedTime = F, returnDescription = F, returnFormattedPhoneNumber = F, returnMaxConcurrentSections = F, returnMaxSeats = F, returnModifiedTime = F, returnPhoneExtension = F, returnPhoneNumber = F, returnPhoneNumberIsInternational = F, returnRoomNumber = F, returnRoomNumberDescription = F, returnRoomTypeID = F, returnSeatsAvailableForDateRangeAndDisplayPeriods = F, returnSquareFootage = 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("District", "Room", RoomID, searchFields, EntityID)
}
#' Modify a specific Room
#'
#' This function modifies fields for a Room.
#'
#' @param RoomID The id of the Room to be modified.\cr Run \code{\link{getAllRooms}} for a list of Rooms.
#' @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 District
#' @return Details of the modified Room.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRoom <- function(RoomID, EntityID = 1, setBuildingID = NULL, setDescription = NULL, setMaxConcurrentSections = NULL, setMaxSeats = NULL, setPhoneExtension = NULL, setPhoneNumber = NULL, setPhoneNumberIsInternational = NULL, setRoomNumber = NULL, setRoomTypeID = NULL, setSquareFootage = 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("District", "Room", RoomID, names(functionParams), functionParams, EntityID)
}
#' Create new Room.
#'
#' This function creates a new Room.
#'
#' @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 District
#' @return The fields used to define the newly created Room.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRoom <- function(EntityID = 1, setBuildingID = NULL, setDescription = NULL, setMaxConcurrentSections = NULL, setMaxSeats = NULL, setPhoneExtension = NULL, setPhoneNumber = NULL, setPhoneNumberIsInternational = NULL, setRoomNumber = NULL, setRoomTypeID = NULL, setSquareFootage = 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("District", "Room", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Room
#'
#' This function deletes a Room.
#'
#' @param RoomID The id of the Room.\cr Run \code{\link{getAllRooms}} for a list of Rooms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted Room.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRoom <- function(RoomID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "Room", RoomID, EntityID)
}
#' Get all RoomTypes.
#'
#' This function returns a dataframe of all RoomTypes 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 District
#' @return All RoomTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRoomTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRoomTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = 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("District", "RoomType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RoomType
#'
#' This function returns fields for a RoomType.
#'
#' @param RoomTypeID The id of the RoomType.\cr Run \code{\link{getAllRoomTypes}} for a list of RoomTypes.
#' @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 District
#' @return Details for the RoomType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRoomType <- function(RoomTypeID, EntityID = 1, returnRoomTypeID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDistrictID = 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("District", "RoomType", RoomTypeID, searchFields, EntityID)
}
#' Modify a specific RoomType
#'
#' This function modifies fields for a RoomType.
#'
#' @param RoomTypeID The id of the RoomType to be modified.\cr Run \code{\link{getAllRoomTypes}} for a list of RoomTypes.
#' @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 District
#' @return Details of the modified RoomType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRoomType <- function(RoomTypeID, EntityID = 1, setCode = NULL, setDescription = NULL, setDistrictID = 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("District", "RoomType", RoomTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new RoomType.
#'
#' This function creates a new RoomType.
#'
#' @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 District
#' @return The fields used to define the newly created RoomType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRoomType <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setDistrictID = 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("District", "RoomType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RoomType
#'
#' This function deletes a RoomType.
#'
#' @param RoomTypeID The id of the RoomType.\cr Run \code{\link{getAllRoomTypes}} for a list of RoomTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted RoomType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRoomType <- function(RoomTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "RoomType", RoomTypeID, EntityID)
}
#' Get all SchoolYears.
#'
#' This function returns a dataframe of all SchoolYears 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 District
#' @return All SchoolYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSchoolYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSchoolYearID = F, returnCreatedTime = F, returnDescription = F, returnIsCurrentYearForProvidedEntity = F, returnIsUpcomingYearForProvidedEntity = F, returnModifiedTime = F, returnNextNumericYear = F, returnNumericYear = F, returnStudentAwardID = 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("District", "SchoolYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SchoolYear
#'
#' This function returns fields for a SchoolYear.
#'
#' @param SchoolYearID The id of the SchoolYear.\cr Run \code{\link{getAllSchoolYears}} for a list of SchoolYears.
#' @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 District
#' @return Details for the SchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSchoolYear <- function(SchoolYearID, EntityID = 1, returnSchoolYearID = F, returnCreatedTime = F, returnDescription = F, returnIsCurrentYearForProvidedEntity = F, returnIsUpcomingYearForProvidedEntity = F, returnModifiedTime = F, returnNextNumericYear = F, returnNumericYear = F, returnStudentAwardID = 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("District", "SchoolYear", SchoolYearID, searchFields, EntityID)
}
#' Modify a specific SchoolYear
#'
#' This function modifies fields for a SchoolYear.
#'
#' @param SchoolYearID The id of the SchoolYear to be modified.\cr Run \code{\link{getAllSchoolYears}} for a list of SchoolYears.
#' @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 District
#' @return Details of the modified SchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySchoolYear <- function(SchoolYearID, EntityID = 1, setDescription = NULL, setNumericYear = NULL, setStudentAwardID = 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("District", "SchoolYear", SchoolYearID, names(functionParams), functionParams, EntityID)
}
#' Create new SchoolYear.
#'
#' This function creates a new SchoolYear.
#'
#' @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 District
#' @return The fields used to define the newly created SchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSchoolYear <- function(EntityID = 1, setDescription = NULL, setNumericYear = NULL, setStudentAwardID = 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("District", "SchoolYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SchoolYear
#'
#' This function deletes a SchoolYear.
#'
#' @param SchoolYearID The id of the SchoolYear.\cr Run \code{\link{getAllSchoolYears}} for a list of SchoolYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted SchoolYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSchoolYear <- function(SchoolYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "SchoolYear", SchoolYearID, EntityID)
}
#' Get all StateDistrictMNs.
#'
#' This function returns a dataframe of all StateDistrictMNs 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 District
#' @return All StateDistrictMNs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStateDistrictMNs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStateDistrictMNID = F, returnCode = F, returnCodeName = F, returnCreatedTime = F, returnModifiedTime = F, returnName = F, returnStateDistrictTypeCodeMNID = 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("District", "StateDistrictMN", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StateDistrictMN
#'
#' This function returns fields for a StateDistrictMN.
#'
#' @param StateDistrictMNID The id of the StateDistrictMN.\cr Run \code{\link{getAllStateDistrictMNs}} for a list of StateDistrictMNs.
#' @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 District
#' @return Details for the StateDistrictMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStateDistrictMN <- function(StateDistrictMNID, EntityID = 1, returnStateDistrictMNID = F, returnCode = F, returnCodeName = F, returnCreatedTime = F, returnModifiedTime = F, returnName = F, returnStateDistrictTypeCodeMNID = 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("District", "StateDistrictMN", StateDistrictMNID, searchFields, EntityID)
}
#' Modify a specific StateDistrictMN
#'
#' This function modifies fields for a StateDistrictMN.
#'
#' @param StateDistrictMNID The id of the StateDistrictMN to be modified.\cr Run \code{\link{getAllStateDistrictMNs}} for a list of StateDistrictMNs.
#' @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 District
#' @return Details of the modified StateDistrictMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStateDistrictMN <- function(StateDistrictMNID, EntityID = 1, setCode = NULL, setName = NULL, setStateDistrictTypeCodeMNID = 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("District", "StateDistrictMN", StateDistrictMNID, names(functionParams), functionParams, EntityID)
}
#' Create new StateDistrictMN.
#'
#' This function creates a new StateDistrictMN.
#'
#' @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 District
#' @return The fields used to define the newly created StateDistrictMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStateDistrictMN <- function(EntityID = 1, setCode = NULL, setName = NULL, setStateDistrictTypeCodeMNID = 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("District", "StateDistrictMN", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StateDistrictMN
#'
#' This function deletes a StateDistrictMN.
#'
#' @param StateDistrictMNID The id of the StateDistrictMN.\cr Run \code{\link{getAllStateDistrictMNs}} for a list of StateDistrictMNs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept District
#' @return The id of the deleted StateDistrictMN.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStateDistrictMN <- function(StateDistrictMNID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("District", "StateDistrictMN", StateDistrictMNID, EntityID)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.