#' Get all AcademicStandardGradingScaleGroups.
#'
#' This function returns a dataframe of all AcademicStandardGradingScaleGroups 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 Gradebook
#' @return All AcademicStandardGradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAcademicStandardGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAcademicStandardGradingScaleGroupID = F, returnAcademicStandardGradingScaleGroupIDClonedFrom = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnModifiedTime = F, returnStandardCount = 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("Gradebook", "AcademicStandardGradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AcademicStandardGradingScaleGroup
#'
#' This function returns fields for an AcademicStandardGradingScaleGroup.
#'
#' @param AcademicStandardGradingScaleGroupID The id of the AcademicStandardGradingScaleGroup.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroups}} for a list of AcademicStandardGradingScaleGroups.
#' @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 Gradebook
#' @return Details for the AcademicStandardGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAcademicStandardGradingScaleGroup <- function(AcademicStandardGradingScaleGroupID, EntityID = 1, returnAcademicStandardGradingScaleGroupID = F, returnAcademicStandardGradingScaleGroupIDClonedFrom = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnModifiedTime = F, returnStandardCount = 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("Gradebook", "AcademicStandardGradingScaleGroup", AcademicStandardGradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific AcademicStandardGradingScaleGroup
#'
#' This function modifies fields for an AcademicStandardGradingScaleGroup.
#'
#' @param AcademicStandardGradingScaleGroupID The id of the AcademicStandardGradingScaleGroup to be modified.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroups}} for a list of AcademicStandardGradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified AcademicStandardGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAcademicStandardGradingScaleGroup <- function(AcademicStandardGradingScaleGroupID, EntityID = 1, setAcademicStandardGradingScaleGroupIDClonedFrom = NULL, setCalculationGroupID = NULL, setDescription = NULL, setEntityGroupKey = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = 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("Gradebook", "AcademicStandardGradingScaleGroup", AcademicStandardGradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new AcademicStandardGradingScaleGroup.
#'
#' This function creates a new AcademicStandardGradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created AcademicStandardGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAcademicStandardGradingScaleGroup <- function(EntityID = 1, setAcademicStandardGradingScaleGroupIDClonedFrom = NULL, setCalculationGroupID = NULL, setDescription = NULL, setEntityGroupKey = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = 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("Gradebook", "AcademicStandardGradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AcademicStandardGradingScaleGroup
#'
#' This function deletes an AcademicStandardGradingScaleGroup.
#'
#' @param AcademicStandardGradingScaleGroupID The id of the AcademicStandardGradingScaleGroup.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroups}} for a list of AcademicStandardGradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted AcademicStandardGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAcademicStandardGradingScaleGroup <- function(AcademicStandardGradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "AcademicStandardGradingScaleGroup", AcademicStandardGradingScaleGroupID, EntityID)
}
#' Get all AcademicStandardGradingScaleGroupAcademicStandards.
#'
#' This function returns a dataframe of all AcademicStandardGradingScaleGroupAcademicStandards 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 Gradebook
#' @return All AcademicStandardGradingScaleGroupAcademicStandards in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAcademicStandardGradingScaleGroupAcademicStandards <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAcademicStandardGradingScaleGroupAcademicStandardID = F, returnAcademicStandardGradingScaleGroupAcademicStandardIDClonedFrom = F, returnAcademicStandardGradingScaleGroupID = F, returnCalculationGroupAcademicStandardID = F, returnCreatedTime = F, returnEntityGroupKey = 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("Gradebook", "AcademicStandardGradingScaleGroupAcademicStandard", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AcademicStandardGradingScaleGroupAcademicStandard
#'
#' This function returns fields for an AcademicStandardGradingScaleGroupAcademicStandard.
#'
#' @param AcademicStandardGradingScaleGroupAcademicStandardID The id of the AcademicStandardGradingScaleGroupAcademicStandard.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroupAcademicStandards}} for a list of AcademicStandardGradingScaleGroupAcademicStandards.
#' @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 Gradebook
#' @return Details for the AcademicStandardGradingScaleGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAcademicStandardGradingScaleGroupAcademicStandard <- function(AcademicStandardGradingScaleGroupAcademicStandardID, EntityID = 1, returnAcademicStandardGradingScaleGroupAcademicStandardID = F, returnAcademicStandardGradingScaleGroupAcademicStandardIDClonedFrom = F, returnAcademicStandardGradingScaleGroupID = F, returnCalculationGroupAcademicStandardID = F, returnCreatedTime = F, returnEntityGroupKey = 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("Gradebook", "AcademicStandardGradingScaleGroupAcademicStandard", AcademicStandardGradingScaleGroupAcademicStandardID, searchFields, EntityID)
}
#' Modify a specific AcademicStandardGradingScaleGroupAcademicStandard
#'
#' This function modifies fields for an AcademicStandardGradingScaleGroupAcademicStandard.
#'
#' @param AcademicStandardGradingScaleGroupAcademicStandardID The id of the AcademicStandardGradingScaleGroupAcademicStandard to be modified.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroupAcademicStandards}} for a list of AcademicStandardGradingScaleGroupAcademicStandards.
#' @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 Gradebook
#' @return Details of the modified AcademicStandardGradingScaleGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAcademicStandardGradingScaleGroupAcademicStandard <- function(AcademicStandardGradingScaleGroupAcademicStandardID, EntityID = 1, setAcademicStandardGradingScaleGroupAcademicStandardIDClonedFrom = NULL, setAcademicStandardGradingScaleGroupID = NULL, setCalculationGroupAcademicStandardID = NULL, setEntityGroupKey = 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("Gradebook", "AcademicStandardGradingScaleGroupAcademicStandard", AcademicStandardGradingScaleGroupAcademicStandardID, names(functionParams), functionParams, EntityID)
}
#' Create new AcademicStandardGradingScaleGroupAcademicStandard.
#'
#' This function creates a new AcademicStandardGradingScaleGroupAcademicStandard.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created AcademicStandardGradingScaleGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAcademicStandardGradingScaleGroupAcademicStandard <- function(EntityID = 1, setAcademicStandardGradingScaleGroupAcademicStandardIDClonedFrom = NULL, setAcademicStandardGradingScaleGroupID = NULL, setCalculationGroupAcademicStandardID = NULL, setEntityGroupKey = 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("Gradebook", "AcademicStandardGradingScaleGroupAcademicStandard", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AcademicStandardGradingScaleGroupAcademicStandard
#'
#' This function deletes an AcademicStandardGradingScaleGroupAcademicStandard.
#'
#' @param AcademicStandardGradingScaleGroupAcademicStandardID The id of the AcademicStandardGradingScaleGroupAcademicStandard.\cr Run \code{\link{getAllAcademicStandardGradingScaleGroupAcademicStandards}} for a list of AcademicStandardGradingScaleGroupAcademicStandards.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted AcademicStandardGradingScaleGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAcademicStandardGradingScaleGroupAcademicStandard <- function(AcademicStandardGradingScaleGroupAcademicStandardID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "AcademicStandardGradingScaleGroupAcademicStandard", AcademicStandardGradingScaleGroupAcademicStandardID, EntityID)
}
#' Get all Assessments.
#'
#' This function returns a dataframe of all Assessments 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 Gradebook
#' @return All Assessments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAssessments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAssessmentID = F, returnAssignedDate = F, returnAssignmentCount = F, returnCanDelete = F, returnCategoryID = F, returnCreatedTime = F, returnDescription = F, returnDisplayRestoreButton = F, returnDueDate = F, returnIsDeleted = F, returnModifiedTime = F, returnName = F, returnSectionID = 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("Gradebook", "Assessment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Assessment
#'
#' This function returns fields for an Assessment.
#'
#' @param AssessmentID The id of the Assessment.\cr Run \code{\link{getAllAssessments}} for a list of Assessments.
#' @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 Gradebook
#' @return Details for the Assessment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAssessment <- function(AssessmentID, EntityID = 1, returnAssessmentID = F, returnAssignedDate = F, returnAssignmentCount = F, returnCanDelete = F, returnCategoryID = F, returnCreatedTime = F, returnDescription = F, returnDisplayRestoreButton = F, returnDueDate = F, returnIsDeleted = F, returnModifiedTime = F, returnName = F, returnSectionID = 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("Gradebook", "Assessment", AssessmentID, searchFields, EntityID)
}
#' Modify a specific Assessment
#'
#' This function modifies fields for an Assessment.
#'
#' @param AssessmentID The id of the Assessment to be modified.\cr Run \code{\link{getAllAssessments}} for a list of Assessments.
#' @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 Gradebook
#' @return Details of the modified Assessment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAssessment <- function(AssessmentID, EntityID = 1, setAssignedDate = NULL, setCategoryID = NULL, setDescription = NULL, setDueDate = NULL, setIsDeleted = NULL, setName = NULL, setSectionID = 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("Gradebook", "Assessment", AssessmentID, names(functionParams), functionParams, EntityID)
}
#' Create new Assessment.
#'
#' This function creates a new Assessment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created Assessment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAssessment <- function(EntityID = 1, setAssignedDate = NULL, setCategoryID = NULL, setDescription = NULL, setDueDate = NULL, setIsDeleted = NULL, setName = NULL, setSectionID = 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("Gradebook", "Assessment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Assessment
#'
#' This function deletes an Assessment.
#'
#' @param AssessmentID The id of the Assessment.\cr Run \code{\link{getAllAssessments}} for a list of Assessments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted Assessment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAssessment <- function(AssessmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "Assessment", AssessmentID, EntityID)
}
#' Get all Assignments.
#'
#' This function returns a dataframe of all Assignments 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 Gradebook
#' @return All Assignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAssignmentID = F, returnAcademicStandardID = F, returnAcademicStandards = F, returnActiveStudentCount = F, returnActiveStudentGroups = F, returnAllowAutoScore = F, returnAllStudentAssignmentsAreNotStarted = F, returnAnswerRevealTime = F, returnAssessmentID = F, returnAssignedDate = F, returnAssignmentIDClonedFrom = F, returnAssignmentIDParent = F, returnAssignmentQuestionCount = F, returnAssignmentSyncKey = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnAutoScore = F, returnAveragePercent = F, returnCalculatedPointsAllowedFromQuestions = F, returnCanDelete = F, returnCategoryID = F, returnChildAssignmentCount = F, returnClassesSyncedTo = F, returnCreatedTime = F, returnCreateStudentGroupAssignmentErrorMessage = F, returnDefaultPointsPerQuestion = F, returnDescription = F, returnDisplayRestoreButton = F, returnDueDate = F, returnDueDateInCurrentOpenExtendedGradingPeriod = F, returnDueDateInTransactionForGivenStudentSection = F, returnDueDateIsInGivenDateRange = F, returnEffectiveAcademicStandardID = F, returnEndTime = F, returnHasInstructions = F, returnHasParent = F, returnHasQuestions = F, returnHasStudentAssignments = F, returnHasStudentAssignmentsWithScoreOrGradeMark = F, returnHasStudentFamilyAttachmentsToDisplay = F, returnHasStudentGroupAssignments = F, returnHasUngradedStudentAssignments = F, returnHasWholeNumberWeight = F, returnHideScoreUntilTime = F, returnInstructions = F, returnIsActiveOrUnlocked = F, returnIsAHistoricRecord = F, returnIsAvailableForStudentGroup = F, returnIsAvailableForStudentSection = F, returnIsDeleted = F, returnIsOnlineAssignment = F, returnIsParent = F, returnIsPastEndTime = F, returnIsSynced = F, returnMaxScore = F, returnModifiedTime = F, returnName = F, returnQuestionCount = F, returnRandomizeQuestions = F, returnRelatedAssignmentsHaveAcademicStandards = F, returnRelatedAssignmentsHaveSubjects = F, returnScoreDisplayType = F, returnScoreDisplayTypeCode = F, returnScoredStudentAssignmentCount = F, returnSectionID = F, returnSendNotificationWhenAnswersRevealed = F, returnSendNotificationWhenAssignmentReadyToTake = F, returnShowCorrectAnswers = F, returnShowScore = F, returnStartTime = F, returnStudentFamilyAccessAttachmentCount = F, returnSubjectID = F, returnSubjects = F, returnUseGradeMarkScoring = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "Assignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Assignment
#'
#' This function returns fields for an Assignment.
#'
#' @param AssignmentID The id of the Assignment.\cr Run \code{\link{getAllAssignments}} for a list of Assignments.
#' @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 Gradebook
#' @return Details for the Assignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAssignment <- function(AssignmentID, EntityID = 1, returnAssignmentID = F, returnAcademicStandardID = F, returnAcademicStandards = F, returnActiveStudentCount = F, returnActiveStudentGroups = F, returnAllowAutoScore = F, returnAllStudentAssignmentsAreNotStarted = F, returnAnswerRevealTime = F, returnAssessmentID = F, returnAssignedDate = F, returnAssignmentIDClonedFrom = F, returnAssignmentIDParent = F, returnAssignmentQuestionCount = F, returnAssignmentSyncKey = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnAutoScore = F, returnAveragePercent = F, returnCalculatedPointsAllowedFromQuestions = F, returnCanDelete = F, returnCategoryID = F, returnChildAssignmentCount = F, returnClassesSyncedTo = F, returnCreatedTime = F, returnCreateStudentGroupAssignmentErrorMessage = F, returnDefaultPointsPerQuestion = F, returnDescription = F, returnDisplayRestoreButton = F, returnDueDate = F, returnDueDateInCurrentOpenExtendedGradingPeriod = F, returnDueDateInTransactionForGivenStudentSection = F, returnDueDateIsInGivenDateRange = F, returnEffectiveAcademicStandardID = F, returnEndTime = F, returnHasInstructions = F, returnHasParent = F, returnHasQuestions = F, returnHasStudentAssignments = F, returnHasStudentAssignmentsWithScoreOrGradeMark = F, returnHasStudentFamilyAttachmentsToDisplay = F, returnHasStudentGroupAssignments = F, returnHasUngradedStudentAssignments = F, returnHasWholeNumberWeight = F, returnHideScoreUntilTime = F, returnInstructions = F, returnIsActiveOrUnlocked = F, returnIsAHistoricRecord = F, returnIsAvailableForStudentGroup = F, returnIsAvailableForStudentSection = F, returnIsDeleted = F, returnIsOnlineAssignment = F, returnIsParent = F, returnIsPastEndTime = F, returnIsSynced = F, returnMaxScore = F, returnModifiedTime = F, returnName = F, returnQuestionCount = F, returnRandomizeQuestions = F, returnRelatedAssignmentsHaveAcademicStandards = F, returnRelatedAssignmentsHaveSubjects = F, returnScoreDisplayType = F, returnScoreDisplayTypeCode = F, returnScoredStudentAssignmentCount = F, returnSectionID = F, returnSendNotificationWhenAnswersRevealed = F, returnSendNotificationWhenAssignmentReadyToTake = F, returnShowCorrectAnswers = F, returnShowScore = F, returnStartTime = F, returnStudentFamilyAccessAttachmentCount = F, returnSubjectID = F, returnSubjects = F, returnUseGradeMarkScoring = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "Assignment", AssignmentID, searchFields, EntityID)
}
#' Modify a specific Assignment
#'
#' This function modifies fields for an Assignment.
#'
#' @param AssignmentID The id of the Assignment to be modified.\cr Run \code{\link{getAllAssignments}} for a list of Assignments.
#' @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 Gradebook
#' @return Details of the modified Assignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAssignment <- function(AssignmentID, EntityID = 1, setAcademicStandardID = NULL, setAnswerRevealTime = NULL, setAssessmentID = NULL, setAssignedDate = NULL, setAssignmentIDClonedFrom = NULL, setAssignmentIDParent = NULL, setAssignmentSyncKey = NULL, setAutoScore = NULL, setCategoryID = NULL, setDefaultPointsPerQuestion = NULL, setDescription = NULL, setDueDate = NULL, setEndTime = NULL, setHideScoreUntilTime = NULL, setInstructions = NULL, setIsDeleted = NULL, setIsOnlineAssignment = NULL, setIsParent = NULL, setMaxScore = NULL, setName = NULL, setRandomizeQuestions = NULL, setScoreDisplayType = NULL, setScoreDisplayTypeCode = NULL, setSectionID = NULL, setSendNotificationWhenAnswersRevealed = NULL, setSendNotificationWhenAssignmentReadyToTake = NULL, setShowCorrectAnswers = NULL, setStartTime = NULL, setSubjectID = NULL, setUseGradeMarkScoring = NULL, setWeight = 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("Gradebook", "Assignment", AssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new Assignment.
#'
#' This function creates a new Assignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created Assignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAssignment <- function(EntityID = 1, setAcademicStandardID = NULL, setAnswerRevealTime = NULL, setAssessmentID = NULL, setAssignedDate = NULL, setAssignmentIDClonedFrom = NULL, setAssignmentIDParent = NULL, setAssignmentSyncKey = NULL, setAutoScore = NULL, setCategoryID = NULL, setDefaultPointsPerQuestion = NULL, setDescription = NULL, setDueDate = NULL, setEndTime = NULL, setHideScoreUntilTime = NULL, setInstructions = NULL, setIsDeleted = NULL, setIsOnlineAssignment = NULL, setIsParent = NULL, setMaxScore = NULL, setName = NULL, setRandomizeQuestions = NULL, setScoreDisplayType = NULL, setScoreDisplayTypeCode = NULL, setSectionID = NULL, setSendNotificationWhenAnswersRevealed = NULL, setSendNotificationWhenAssignmentReadyToTake = NULL, setShowCorrectAnswers = NULL, setStartTime = NULL, setSubjectID = NULL, setUseGradeMarkScoring = NULL, setWeight = 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("Gradebook", "Assignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Assignment
#'
#' This function deletes an Assignment.
#'
#' @param AssignmentID The id of the Assignment.\cr Run \code{\link{getAllAssignments}} for a list of Assignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted Assignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAssignment <- function(AssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "Assignment", AssignmentID, EntityID)
}
#' Get all AssignmentAttachments.
#'
#' This function returns a dataframe of all AssignmentAttachments 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 Gradebook
#' @return All AssignmentAttachments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAssignmentAttachments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAssignmentAttachmentID = F, returnAssignmentID = F, returnAttachmentID = F, returnCreatedTime = F, returnDisplayInStudentFamilyAccess = 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("Gradebook", "AssignmentAttachment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AssignmentAttachment
#'
#' This function returns fields for an AssignmentAttachment.
#'
#' @param AssignmentAttachmentID The id of the AssignmentAttachment.\cr Run \code{\link{getAllAssignmentAttachments}} for a list of AssignmentAttachments.
#' @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 Gradebook
#' @return Details for the AssignmentAttachment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAssignmentAttachment <- function(AssignmentAttachmentID, EntityID = 1, returnAssignmentAttachmentID = F, returnAssignmentID = F, returnAttachmentID = F, returnCreatedTime = F, returnDisplayInStudentFamilyAccess = 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("Gradebook", "AssignmentAttachment", AssignmentAttachmentID, searchFields, EntityID)
}
#' Modify a specific AssignmentAttachment
#'
#' This function modifies fields for an AssignmentAttachment.
#'
#' @param AssignmentAttachmentID The id of the AssignmentAttachment to be modified.\cr Run \code{\link{getAllAssignmentAttachments}} for a list of AssignmentAttachments.
#' @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 Gradebook
#' @return Details of the modified AssignmentAttachment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAssignmentAttachment <- function(AssignmentAttachmentID, EntityID = 1, setAssignmentID = NULL, setAttachmentID = NULL, setDisplayInStudentFamilyAccess = 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("Gradebook", "AssignmentAttachment", AssignmentAttachmentID, names(functionParams), functionParams, EntityID)
}
#' Create new AssignmentAttachment.
#'
#' This function creates a new AssignmentAttachment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created AssignmentAttachment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAssignmentAttachment <- function(EntityID = 1, setAssignmentID = NULL, setAttachmentID = NULL, setDisplayInStudentFamilyAccess = 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("Gradebook", "AssignmentAttachment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AssignmentAttachment
#'
#' This function deletes an AssignmentAttachment.
#'
#' @param AssignmentAttachmentID The id of the AssignmentAttachment.\cr Run \code{\link{getAllAssignmentAttachments}} for a list of AssignmentAttachments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted AssignmentAttachment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAssignmentAttachment <- function(AssignmentAttachmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "AssignmentAttachment", AssignmentAttachmentID, EntityID)
}
#' Get all AssignmentQuestions.
#'
#' This function returns a dataframe of all AssignmentQuestions 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 Gradebook
#' @return All AssignmentQuestions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAssignmentQuestions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAssignmentQuestionID = F, returnAllowPartialCredit = F, returnAssignmentID = F, returnCreatedTime = F, returnDisplayOrder = F, returnModifiedTime = F, returnPointsAllowed = F, returnQuestionAnswerCount = F, returnQuestionID = 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("Gradebook", "AssignmentQuestion", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AssignmentQuestion
#'
#' This function returns fields for an AssignmentQuestion.
#'
#' @param AssignmentQuestionID The id of the AssignmentQuestion.\cr Run \code{\link{getAllAssignmentQuestions}} for a list of AssignmentQuestions.
#' @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 Gradebook
#' @return Details for the AssignmentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAssignmentQuestion <- function(AssignmentQuestionID, EntityID = 1, returnAssignmentQuestionID = F, returnAllowPartialCredit = F, returnAssignmentID = F, returnCreatedTime = F, returnDisplayOrder = F, returnModifiedTime = F, returnPointsAllowed = F, returnQuestionAnswerCount = F, returnQuestionID = 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("Gradebook", "AssignmentQuestion", AssignmentQuestionID, searchFields, EntityID)
}
#' Modify a specific AssignmentQuestion
#'
#' This function modifies fields for an AssignmentQuestion.
#'
#' @param AssignmentQuestionID The id of the AssignmentQuestion to be modified.\cr Run \code{\link{getAllAssignmentQuestions}} for a list of AssignmentQuestions.
#' @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 Gradebook
#' @return Details of the modified AssignmentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAssignmentQuestion <- function(AssignmentQuestionID, EntityID = 1, setAllowPartialCredit = NULL, setAssignmentID = NULL, setDisplayOrder = NULL, setPointsAllowed = NULL, setQuestionID = 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("Gradebook", "AssignmentQuestion", AssignmentQuestionID, names(functionParams), functionParams, EntityID)
}
#' Create new AssignmentQuestion.
#'
#' This function creates a new AssignmentQuestion.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created AssignmentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAssignmentQuestion <- function(EntityID = 1, setAllowPartialCredit = NULL, setAssignmentID = NULL, setDisplayOrder = NULL, setPointsAllowed = NULL, setQuestionID = 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("Gradebook", "AssignmentQuestion", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AssignmentQuestion
#'
#' This function deletes an AssignmentQuestion.
#'
#' @param AssignmentQuestionID The id of the AssignmentQuestion.\cr Run \code{\link{getAllAssignmentQuestions}} for a list of AssignmentQuestions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted AssignmentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAssignmentQuestion <- function(AssignmentQuestionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "AssignmentQuestion", AssignmentQuestionID, EntityID)
}
#' Get all CalculationGroups.
#'
#' This function returns a dataframe of all CalculationGroups 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 Gradebook
#' @return All CalculationGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupID = F, returnAllowAcademicStandardWeightingTeacherOverride = F, returnAllowAssignmentAveragePercentTeacherOverride = F, returnAllowAssignmentPointsTeacherOverride = F, returnAllowCategoryOverride = F, returnAllowCategoryWeightingTeacherOverride = F, returnAllowDecayingAverageTeacherOverride = F, returnAllowedTeacherOverrideCalculationTypes = F, returnAllowGradeBucketWeightingTeacherOverride = F, returnAllowNotGradedTeacherOverride = F, returnAllowSubjectiveTeacherOverride = F, returnAllowSubjectWeightingTeacherOverride = F, returnAllowTotalPointsAndGradeBucketWeightingTeacherOverride = F, returnCalculationGroupIDClonedFrom = F, returnCreatedTime = F, returnDecayingAveragePercent = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnFilter = F, returnHasAcademicStandards = F, returnHasAcademicStandardWeightingOverrides = F, returnHasAssignmentAveragePercentOverrides = F, returnHasAssignmentPointsOverrides = F, returnHasCategoryWeightingOverrides = F, returnHasDecayingAverage = F, returnHasDecayingAverageOverrides = F, returnHasDefaultCloneFilter = F, returnHasGradeBucketWeightingOverrides = F, returnHasNotGradedOverrides = F, returnHasSubjectiveOverrides = F, returnHasSubjects = F, returnHasSubjectWeightingOverrides = F, returnHasTotalPointsAndGradeBucketWeightingOverrides = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnLimitTeacherOverridesToCategoriesInGroup = F, returnModifiedTime = F, returnRank = F, returnSchoolYearID = F, returnSearchConditionFilter = 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("Gradebook", "CalculationGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroup
#'
#' This function returns fields for a CalculationGroup.
#'
#' @param CalculationGroupID The id of the CalculationGroup.\cr Run \code{\link{getAllCalculationGroups}} for a list of CalculationGroups.
#' @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 Gradebook
#' @return Details for the CalculationGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroup <- function(CalculationGroupID, EntityID = 1, returnCalculationGroupID = F, returnAllowAcademicStandardWeightingTeacherOverride = F, returnAllowAssignmentAveragePercentTeacherOverride = F, returnAllowAssignmentPointsTeacherOverride = F, returnAllowCategoryOverride = F, returnAllowCategoryWeightingTeacherOverride = F, returnAllowDecayingAverageTeacherOverride = F, returnAllowedTeacherOverrideCalculationTypes = F, returnAllowGradeBucketWeightingTeacherOverride = F, returnAllowNotGradedTeacherOverride = F, returnAllowSubjectiveTeacherOverride = F, returnAllowSubjectWeightingTeacherOverride = F, returnAllowTotalPointsAndGradeBucketWeightingTeacherOverride = F, returnCalculationGroupIDClonedFrom = F, returnCreatedTime = F, returnDecayingAveragePercent = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnFilter = F, returnHasAcademicStandards = F, returnHasAcademicStandardWeightingOverrides = F, returnHasAssignmentAveragePercentOverrides = F, returnHasAssignmentPointsOverrides = F, returnHasCategoryWeightingOverrides = F, returnHasDecayingAverage = F, returnHasDecayingAverageOverrides = F, returnHasDefaultCloneFilter = F, returnHasGradeBucketWeightingOverrides = F, returnHasNotGradedOverrides = F, returnHasSubjectiveOverrides = F, returnHasSubjects = F, returnHasSubjectWeightingOverrides = F, returnHasTotalPointsAndGradeBucketWeightingOverrides = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnLimitTeacherOverridesToCategoriesInGroup = F, returnModifiedTime = F, returnRank = F, returnSchoolYearID = F, returnSearchConditionFilter = 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("Gradebook", "CalculationGroup", CalculationGroupID, searchFields, EntityID)
}
#' Modify a specific CalculationGroup
#'
#' This function modifies fields for a CalculationGroup.
#'
#' @param CalculationGroupID The id of the CalculationGroup to be modified.\cr Run \code{\link{getAllCalculationGroups}} for a list of CalculationGroups.
#' @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 Gradebook
#' @return Details of the modified CalculationGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroup <- function(CalculationGroupID, EntityID = 1, setAllowAcademicStandardWeightingTeacherOverride = NULL, setAllowAssignmentAveragePercentTeacherOverride = NULL, setAllowAssignmentPointsTeacherOverride = NULL, setAllowCategoryOverride = NULL, setAllowCategoryWeightingTeacherOverride = NULL, setAllowDecayingAverageTeacherOverride = NULL, setAllowGradeBucketWeightingTeacherOverride = NULL, setAllowNotGradedTeacherOverride = NULL, setAllowSubjectiveTeacherOverride = NULL, setAllowSubjectWeightingTeacherOverride = NULL, setAllowTotalPointsAndGradeBucketWeightingTeacherOverride = NULL, setCalculationGroupIDClonedFrom = NULL, setDecayingAveragePercent = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFilter = NULL, setIsDefaultGroup = NULL, setLimitTeacherOverridesToCategoriesInGroup = NULL, setRank = NULL, setSchoolYearID = NULL, setSearchConditionFilter = 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("Gradebook", "CalculationGroup", CalculationGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroup.
#'
#' This function creates a new CalculationGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroup <- function(EntityID = 1, setAllowAcademicStandardWeightingTeacherOverride = NULL, setAllowAssignmentAveragePercentTeacherOverride = NULL, setAllowAssignmentPointsTeacherOverride = NULL, setAllowCategoryOverride = NULL, setAllowCategoryWeightingTeacherOverride = NULL, setAllowDecayingAverageTeacherOverride = NULL, setAllowGradeBucketWeightingTeacherOverride = NULL, setAllowNotGradedTeacherOverride = NULL, setAllowSubjectiveTeacherOverride = NULL, setAllowSubjectWeightingTeacherOverride = NULL, setAllowTotalPointsAndGradeBucketWeightingTeacherOverride = NULL, setCalculationGroupIDClonedFrom = NULL, setDecayingAveragePercent = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFilter = NULL, setIsDefaultGroup = NULL, setLimitTeacherOverridesToCategoriesInGroup = NULL, setRank = NULL, setSchoolYearID = NULL, setSearchConditionFilter = 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("Gradebook", "CalculationGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroup
#'
#' This function deletes a CalculationGroup.
#'
#' @param CalculationGroupID The id of the CalculationGroup.\cr Run \code{\link{getAllCalculationGroups}} for a list of CalculationGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroup <- function(CalculationGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroup", CalculationGroupID, EntityID)
}
#' Get all CalculationGroupAcademicStandards.
#'
#' This function returns a dataframe of all CalculationGroupAcademicStandards 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 Gradebook
#' @return All CalculationGroupAcademicStandards in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupAcademicStandards <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupAcademicStandardID = F, returnAcademicStandardID = F, returnCalculateForSingleBucket = F, returnCalculationGroupAcademicStandardIDClonedFrom = F, returnCalculationGroupAcademicStandardIDParent = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDisplayOnReportCard = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasGradingScale = F, returnHasParentSubject = F, returnIsDescendantOfSpecifiedAcademicStandard = F, returnLevel = F, returnModifiedTime = F, returnOrder = 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("Gradebook", "CalculationGroupAcademicStandard", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupAcademicStandard
#'
#' This function returns fields for a CalculationGroupAcademicStandard.
#'
#' @param CalculationGroupAcademicStandardID The id of the CalculationGroupAcademicStandard.\cr Run \code{\link{getAllCalculationGroupAcademicStandards}} for a list of CalculationGroupAcademicStandards.
#' @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 Gradebook
#' @return Details for the CalculationGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupAcademicStandard <- function(CalculationGroupAcademicStandardID, EntityID = 1, returnCalculationGroupAcademicStandardID = F, returnAcademicStandardID = F, returnCalculateForSingleBucket = F, returnCalculationGroupAcademicStandardIDClonedFrom = F, returnCalculationGroupAcademicStandardIDParent = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDisplayOnReportCard = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasGradingScale = F, returnHasParentSubject = F, returnIsDescendantOfSpecifiedAcademicStandard = F, returnLevel = F, returnModifiedTime = F, returnOrder = 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("Gradebook", "CalculationGroupAcademicStandard", CalculationGroupAcademicStandardID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupAcademicStandard
#'
#' This function modifies fields for a CalculationGroupAcademicStandard.
#'
#' @param CalculationGroupAcademicStandardID The id of the CalculationGroupAcademicStandard to be modified.\cr Run \code{\link{getAllCalculationGroupAcademicStandards}} for a list of CalculationGroupAcademicStandards.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupAcademicStandard <- function(CalculationGroupAcademicStandardID, EntityID = 1, setAcademicStandardID = NULL, setCalculateForSingleBucket = NULL, setCalculationGroupAcademicStandardIDClonedFrom = NULL, setCalculationGroupAcademicStandardIDParent = NULL, setCalculationGroupID = NULL, setDisplayOnReportCard = NULL, setEntityGroupKey = NULL, setLevel = NULL, setOrder = 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("Gradebook", "CalculationGroupAcademicStandard", CalculationGroupAcademicStandardID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupAcademicStandard.
#'
#' This function creates a new CalculationGroupAcademicStandard.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupAcademicStandard <- function(EntityID = 1, setAcademicStandardID = NULL, setCalculateForSingleBucket = NULL, setCalculationGroupAcademicStandardIDClonedFrom = NULL, setCalculationGroupAcademicStandardIDParent = NULL, setCalculationGroupID = NULL, setDisplayOnReportCard = NULL, setEntityGroupKey = NULL, setLevel = NULL, setOrder = 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("Gradebook", "CalculationGroupAcademicStandard", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupAcademicStandard
#'
#' This function deletes a CalculationGroupAcademicStandard.
#'
#' @param CalculationGroupAcademicStandardID The id of the CalculationGroupAcademicStandard.\cr Run \code{\link{getAllCalculationGroupAcademicStandards}} for a list of CalculationGroupAcademicStandards.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupAcademicStandard <- function(CalculationGroupAcademicStandardID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupAcademicStandard", CalculationGroupAcademicStandardID, EntityID)
}
#' Get all CalculationGroupAcademicStandardCalculationGroupHierarchyDepths.
#'
#' This function returns a dataframe of all CalculationGroupAcademicStandardCalculationGroupHierarchyDepths 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 Gradebook
#' @return All CalculationGroupAcademicStandardCalculationGroupHierarchyDepths in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupAcademicStandardCalculationGroupHierarchyDepths <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupAcademicStandardCalculationGroupHierarchyDepthID = F, returnCalculationGroupAcademicStandardCalculationGroupHierarchyDepthIDClonedFrom = F, returnCalculationGroupAcademicStandardID = F, returnCalculationGroupAcademicStandardIDAtLevel = F, returnCalculationGroupHierarchyDepthID = F, returnCreatedTime = F, returnEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardCalculationGroupHierarchyDepth", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupAcademicStandardCalculationGroupHierarchyDepth
#'
#' This function returns fields for a CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID The id of the CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.\cr Run \code{\link{getAllCalculationGroupAcademicStandardCalculationGroupHierarchyDepths}} for a list of CalculationGroupAcademicStandardCalculationGroupHierarchyDepths.
#' @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 Gradebook
#' @return Details for the CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupAcademicStandardCalculationGroupHierarchyDepth <- function(CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, EntityID = 1, returnCalculationGroupAcademicStandardCalculationGroupHierarchyDepthID = F, returnCalculationGroupAcademicStandardCalculationGroupHierarchyDepthIDClonedFrom = F, returnCalculationGroupAcademicStandardID = F, returnCalculationGroupAcademicStandardIDAtLevel = F, returnCalculationGroupHierarchyDepthID = F, returnCreatedTime = F, returnEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardCalculationGroupHierarchyDepth", CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupAcademicStandardCalculationGroupHierarchyDepth
#'
#' This function modifies fields for a CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID The id of the CalculationGroupAcademicStandardCalculationGroupHierarchyDepth to be modified.\cr Run \code{\link{getAllCalculationGroupAcademicStandardCalculationGroupHierarchyDepths}} for a list of CalculationGroupAcademicStandardCalculationGroupHierarchyDepths.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupAcademicStandardCalculationGroupHierarchyDepth <- function(CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, EntityID = 1, setCalculationGroupAcademicStandardCalculationGroupHierarchyDepthIDClonedFrom = NULL, setCalculationGroupAcademicStandardID = NULL, setCalculationGroupAcademicStandardIDAtLevel = NULL, setCalculationGroupHierarchyDepthID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardCalculationGroupHierarchyDepth", CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#'
#' This function creates a new CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupAcademicStandardCalculationGroupHierarchyDepth <- function(EntityID = 1, setCalculationGroupAcademicStandardCalculationGroupHierarchyDepthIDClonedFrom = NULL, setCalculationGroupAcademicStandardID = NULL, setCalculationGroupAcademicStandardIDAtLevel = NULL, setCalculationGroupHierarchyDepthID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardCalculationGroupHierarchyDepth", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupAcademicStandardCalculationGroupHierarchyDepth
#'
#' This function deletes a CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID The id of the CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.\cr Run \code{\link{getAllCalculationGroupAcademicStandardCalculationGroupHierarchyDepths}} for a list of CalculationGroupAcademicStandardCalculationGroupHierarchyDepths.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupAcademicStandardCalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupAcademicStandardCalculationGroupHierarchyDepth <- function(CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupAcademicStandardCalculationGroupHierarchyDepth", CalculationGroupAcademicStandardCalculationGroupHierarchyDepthID, EntityID)
}
#' Get all CalculationGroupAcademicStandardGradeBuckets.
#'
#' This function returns a dataframe of all CalculationGroupAcademicStandardGradeBuckets 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 Gradebook
#' @return All CalculationGroupAcademicStandardGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupAcademicStandardGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupAcademicStandardGradeBucketID = F, returnCalculationGroupAcademicStandardGradeBucketIDClonedFrom = F, returnCalculationGroupAcademicStandardID = F, returnCalculationGroupGradeBucketID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAcademicStandardWeighting = F, returnHasAssignments = F, returnHasCalculationGroupSubjectWeight = F, returnHasCalculationGroupWeight = F, returnHasCategoryWeighting = F, returnIsAHistoricRecord = F, returnIsWeightedOnByACalculationGroupSubjectGradeBucket = F, returnIsWeightedOnInASectionOverride = 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("Gradebook", "CalculationGroupAcademicStandardGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupAcademicStandardGradeBucket
#'
#' This function returns fields for a CalculationGroupAcademicStandardGradeBucket.
#'
#' @param CalculationGroupAcademicStandardGradeBucketID The id of the CalculationGroupAcademicStandardGradeBucket.\cr Run \code{\link{getAllCalculationGroupAcademicStandardGradeBuckets}} for a list of CalculationGroupAcademicStandardGradeBuckets.
#' @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 Gradebook
#' @return Details for the CalculationGroupAcademicStandardGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupAcademicStandardGradeBucket <- function(CalculationGroupAcademicStandardGradeBucketID, EntityID = 1, returnCalculationGroupAcademicStandardGradeBucketID = F, returnCalculationGroupAcademicStandardGradeBucketIDClonedFrom = F, returnCalculationGroupAcademicStandardID = F, returnCalculationGroupGradeBucketID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAcademicStandardWeighting = F, returnHasAssignments = F, returnHasCalculationGroupSubjectWeight = F, returnHasCalculationGroupWeight = F, returnHasCategoryWeighting = F, returnIsAHistoricRecord = F, returnIsWeightedOnByACalculationGroupSubjectGradeBucket = F, returnIsWeightedOnInASectionOverride = 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("Gradebook", "CalculationGroupAcademicStandardGradeBucket", CalculationGroupAcademicStandardGradeBucketID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupAcademicStandardGradeBucket
#'
#' This function modifies fields for a CalculationGroupAcademicStandardGradeBucket.
#'
#' @param CalculationGroupAcademicStandardGradeBucketID The id of the CalculationGroupAcademicStandardGradeBucket to be modified.\cr Run \code{\link{getAllCalculationGroupAcademicStandardGradeBuckets}} for a list of CalculationGroupAcademicStandardGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupAcademicStandardGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupAcademicStandardGradeBucket <- function(CalculationGroupAcademicStandardGradeBucketID, EntityID = 1, setCalculationGroupAcademicStandardGradeBucketIDClonedFrom = NULL, setCalculationGroupAcademicStandardID = NULL, setCalculationGroupGradeBucketID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardGradeBucket", CalculationGroupAcademicStandardGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupAcademicStandardGradeBucket.
#'
#' This function creates a new CalculationGroupAcademicStandardGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupAcademicStandardGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupAcademicStandardGradeBucket <- function(EntityID = 1, setCalculationGroupAcademicStandardGradeBucketIDClonedFrom = NULL, setCalculationGroupAcademicStandardID = NULL, setCalculationGroupGradeBucketID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupAcademicStandardGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupAcademicStandardGradeBucket
#'
#' This function deletes a CalculationGroupAcademicStandardGradeBucket.
#'
#' @param CalculationGroupAcademicStandardGradeBucketID The id of the CalculationGroupAcademicStandardGradeBucket.\cr Run \code{\link{getAllCalculationGroupAcademicStandardGradeBuckets}} for a list of CalculationGroupAcademicStandardGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupAcademicStandardGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupAcademicStandardGradeBucket <- function(CalculationGroupAcademicStandardGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupAcademicStandardGradeBucket", CalculationGroupAcademicStandardGradeBucketID, EntityID)
}
#' Get all CalculationGroupAcademicStandardWeightings.
#'
#' This function returns a dataframe of all CalculationGroupAcademicStandardWeightings 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 Gradebook
#' @return All CalculationGroupAcademicStandardWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupAcademicStandardWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupAcademicStandardWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardAdjustedWeightFormula = F, returnAcademicStandardIDToWeight = F, returnAdjustedWeightPercent = F, returnCalculationGroupAcademicStandardGradeBucketID = F, returnCalculationGroupAcademicStandardWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryAdjustedWeightFormula = F, returnCategoryIDToWeight = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedCategory = F, returnPointsEarnedCategory = F, returnUseForWeightSum = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupAcademicStandardWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupAcademicStandardWeighting
#'
#' This function returns fields for a CalculationGroupAcademicStandardWeighting.
#'
#' @param CalculationGroupAcademicStandardWeightingID The id of the CalculationGroupAcademicStandardWeighting.\cr Run \code{\link{getAllCalculationGroupAcademicStandardWeightings}} for a list of CalculationGroupAcademicStandardWeightings.
#' @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 Gradebook
#' @return Details for the CalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupAcademicStandardWeighting <- function(CalculationGroupAcademicStandardWeightingID, EntityID = 1, returnCalculationGroupAcademicStandardWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardAdjustedWeightFormula = F, returnAcademicStandardIDToWeight = F, returnAdjustedWeightPercent = F, returnCalculationGroupAcademicStandardGradeBucketID = F, returnCalculationGroupAcademicStandardWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryAdjustedWeightFormula = F, returnCategoryIDToWeight = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedCategory = F, returnPointsEarnedCategory = F, returnUseForWeightSum = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupAcademicStandardWeighting", CalculationGroupAcademicStandardWeightingID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupAcademicStandardWeighting
#'
#' This function modifies fields for a CalculationGroupAcademicStandardWeighting.
#'
#' @param CalculationGroupAcademicStandardWeightingID The id of the CalculationGroupAcademicStandardWeighting to be modified.\cr Run \code{\link{getAllCalculationGroupAcademicStandardWeightings}} for a list of CalculationGroupAcademicStandardWeightings.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupAcademicStandardWeighting <- function(CalculationGroupAcademicStandardWeightingID, EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupAcademicStandardGradeBucketID = NULL, setCalculationGroupAcademicStandardWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupAcademicStandardWeighting", CalculationGroupAcademicStandardWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupAcademicStandardWeighting.
#'
#' This function creates a new CalculationGroupAcademicStandardWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupAcademicStandardWeighting <- function(EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupAcademicStandardGradeBucketID = NULL, setCalculationGroupAcademicStandardWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupAcademicStandardWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupAcademicStandardWeighting
#'
#' This function deletes a CalculationGroupAcademicStandardWeighting.
#'
#' @param CalculationGroupAcademicStandardWeightingID The id of the CalculationGroupAcademicStandardWeighting.\cr Run \code{\link{getAllCalculationGroupAcademicStandardWeightings}} for a list of CalculationGroupAcademicStandardWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupAcademicStandardWeighting <- function(CalculationGroupAcademicStandardWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupAcademicStandardWeighting", CalculationGroupAcademicStandardWeightingID, EntityID)
}
#' Get all CalculationGroupCategories.
#'
#' This function returns a dataframe of all CalculationGroupCategories 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 Gradebook
#' @return All CalculationGroupCategories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupCategoryID = F, returnCalculationGroupCategoryIDClonedFrom = F, returnCalculationGroupID = F, returnCategoryID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = 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("Gradebook", "CalculationGroupCategory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupCategory
#'
#' This function returns fields for a CalculationGroupCategory.
#'
#' @param CalculationGroupCategoryID The id of the CalculationGroupCategory.\cr Run \code{\link{getAllCalculationGroupCategories}} for a list of CalculationGroupCategories.
#' @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 Gradebook
#' @return Details for the CalculationGroupCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupCategory <- function(CalculationGroupCategoryID, EntityID = 1, returnCalculationGroupCategoryID = F, returnCalculationGroupCategoryIDClonedFrom = F, returnCalculationGroupID = F, returnCategoryID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = 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("Gradebook", "CalculationGroupCategory", CalculationGroupCategoryID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupCategory
#'
#' This function modifies fields for a CalculationGroupCategory.
#'
#' @param CalculationGroupCategoryID The id of the CalculationGroupCategory to be modified.\cr Run \code{\link{getAllCalculationGroupCategories}} for a list of CalculationGroupCategorys.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupCategory <- function(CalculationGroupCategoryID, EntityID = 1, setCalculationGroupCategoryIDClonedFrom = NULL, setCalculationGroupID = NULL, setCategoryID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupCategory", CalculationGroupCategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupCategory.
#'
#' This function creates a new CalculationGroupCategory.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupCategory <- function(EntityID = 1, setCalculationGroupCategoryIDClonedFrom = NULL, setCalculationGroupID = NULL, setCategoryID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupCategory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupCategory
#'
#' This function deletes a CalculationGroupCategory.
#'
#' @param CalculationGroupCategoryID The id of the CalculationGroupCategory.\cr Run \code{\link{getAllCalculationGroupCategories}} for a list of CalculationGroupCategories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupCategory <- function(CalculationGroupCategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupCategory", CalculationGroupCategoryID, EntityID)
}
#' Get all CalculationGroupCourses.
#'
#' This function returns a dataframe of all CalculationGroupCourses 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 Gradebook
#' @return All CalculationGroupCourses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupCourses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupCourseID = F, returnCalculationGroupCourseIDClonedFrom = F, returnCalculationGroupID = F, returnCourseID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Gradebook", "CalculationGroupCourse", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupCourse
#'
#' This function returns fields for a CalculationGroupCourse.
#'
#' @param CalculationGroupCourseID The id of the CalculationGroupCourse.\cr Run \code{\link{getAllCalculationGroupCourses}} for a list of CalculationGroupCourses.
#' @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 Gradebook
#' @return Details for the CalculationGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupCourse <- function(CalculationGroupCourseID, EntityID = 1, returnCalculationGroupCourseID = F, returnCalculationGroupCourseIDClonedFrom = F, returnCalculationGroupID = F, returnCourseID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Gradebook", "CalculationGroupCourse", CalculationGroupCourseID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupCourse
#'
#' This function modifies fields for a CalculationGroupCourse.
#'
#' @param CalculationGroupCourseID The id of the CalculationGroupCourse to be modified.\cr Run \code{\link{getAllCalculationGroupCourses}} for a list of CalculationGroupCourses.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupCourse <- function(CalculationGroupCourseID, EntityID = 1, setCalculationGroupCourseIDClonedFrom = NULL, setCalculationGroupID = NULL, setCourseID = 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("Gradebook", "CalculationGroupCourse", CalculationGroupCourseID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupCourse.
#'
#' This function creates a new CalculationGroupCourse.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupCourse <- function(EntityID = 1, setCalculationGroupCourseIDClonedFrom = NULL, setCalculationGroupID = NULL, setCourseID = 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("Gradebook", "CalculationGroupCourse", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupCourse
#'
#' This function deletes a CalculationGroupCourse.
#'
#' @param CalculationGroupCourseID The id of the CalculationGroupCourse.\cr Run \code{\link{getAllCalculationGroupCourses}} for a list of CalculationGroupCourses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupCourse <- function(CalculationGroupCourseID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupCourse", CalculationGroupCourseID, EntityID)
}
#' Get all CalculationGroupGradeBuckets.
#'
#' This function returns a dataframe of all CalculationGroupGradeBuckets 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 Gradebook
#' @return All CalculationGroupGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupGradeBucketID = F, returnAllowCalculationTypeOverride = F, returnAllowWeightOverride = F, returnCalculationGroupGradeBucketIDClonedFrom = F, returnCalculationGroupID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCourseCount = F, returnCreatedTime = F, returnEffectiveCalculationType = F, returnEffectiveCalculationTypeCode = F, returnEntityGroupKey = F, returnGetCopySectionLengthXMLFilter = F, returnGradeMarkScoringType = F, returnGradeMarkScoringTypeCode = F, returnGradingPeriodGradeBucketID = F, returnHasAcademicStandards = F, returnHasAcademicStandardWeighting = F, returnHasCategoryWeighting = F, returnHasGradeBucketWeighting = F, returnHasSubjects = F, returnHasSubjectWeighting = F, returnInnerCalculationGroupGradeBucketsCount = F, returnInUseBySections = F, returnIsAHistoricRecord = F, returnIsMissingStudentGradeBucketAcademicStandards = F, returnIsMissingStudentGradeBucketSubjects = F, returnModifiedTime = F, returnNumberOfCategories = F, returnRoundBucketPercent = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercentTotal = 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("Gradebook", "CalculationGroupGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupGradeBucket
#'
#' This function returns fields for a CalculationGroupGradeBucket.
#'
#' @param CalculationGroupGradeBucketID The id of the CalculationGroupGradeBucket.\cr Run \code{\link{getAllCalculationGroupGradeBuckets}} for a list of CalculationGroupGradeBuckets.
#' @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 Gradebook
#' @return Details for the CalculationGroupGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupGradeBucket <- function(CalculationGroupGradeBucketID, EntityID = 1, returnCalculationGroupGradeBucketID = F, returnAllowCalculationTypeOverride = F, returnAllowWeightOverride = F, returnCalculationGroupGradeBucketIDClonedFrom = F, returnCalculationGroupID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCourseCount = F, returnCreatedTime = F, returnEffectiveCalculationType = F, returnEffectiveCalculationTypeCode = F, returnEntityGroupKey = F, returnGetCopySectionLengthXMLFilter = F, returnGradeMarkScoringType = F, returnGradeMarkScoringTypeCode = F, returnGradingPeriodGradeBucketID = F, returnHasAcademicStandards = F, returnHasAcademicStandardWeighting = F, returnHasCategoryWeighting = F, returnHasGradeBucketWeighting = F, returnHasSubjects = F, returnHasSubjectWeighting = F, returnInnerCalculationGroupGradeBucketsCount = F, returnInUseBySections = F, returnIsAHistoricRecord = F, returnIsMissingStudentGradeBucketAcademicStandards = F, returnIsMissingStudentGradeBucketSubjects = F, returnModifiedTime = F, returnNumberOfCategories = F, returnRoundBucketPercent = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercentTotal = 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("Gradebook", "CalculationGroupGradeBucket", CalculationGroupGradeBucketID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupGradeBucket
#'
#' This function modifies fields for a CalculationGroupGradeBucket.
#'
#' @param CalculationGroupGradeBucketID The id of the CalculationGroupGradeBucket to be modified.\cr Run \code{\link{getAllCalculationGroupGradeBuckets}} for a list of CalculationGroupGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupGradeBucket <- function(CalculationGroupGradeBucketID, EntityID = 1, setAllowCalculationTypeOverride = NULL, setAllowWeightOverride = NULL, setCalculationGroupGradeBucketIDClonedFrom = NULL, setCalculationGroupID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = NULL, setGetCopySectionLengthXMLFilter = NULL, setGradeMarkScoringType = NULL, setGradeMarkScoringTypeCode = NULL, setGradingPeriodGradeBucketID = NULL, setRoundBucketPercent = 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("Gradebook", "CalculationGroupGradeBucket", CalculationGroupGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupGradeBucket.
#'
#' This function creates a new CalculationGroupGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupGradeBucket <- function(EntityID = 1, setAllowCalculationTypeOverride = NULL, setAllowWeightOverride = NULL, setCalculationGroupGradeBucketIDClonedFrom = NULL, setCalculationGroupID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = NULL, setGetCopySectionLengthXMLFilter = NULL, setGradeMarkScoringType = NULL, setGradeMarkScoringTypeCode = NULL, setGradingPeriodGradeBucketID = NULL, setRoundBucketPercent = 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("Gradebook", "CalculationGroupGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupGradeBucket
#'
#' This function deletes a CalculationGroupGradeBucket.
#'
#' @param CalculationGroupGradeBucketID The id of the CalculationGroupGradeBucket.\cr Run \code{\link{getAllCalculationGroupGradeBuckets}} for a list of CalculationGroupGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupGradeBucket <- function(CalculationGroupGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupGradeBucket", CalculationGroupGradeBucketID, EntityID)
}
#' Get all CalculationGroupHierarchyDepths.
#'
#' This function returns a dataframe of all CalculationGroupHierarchyDepths 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 Gradebook
#' @return All CalculationGroupHierarchyDepths in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupHierarchyDepths <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupHierarchyDepthID = F, returnCalculationGroupHierarchyDepthIDClonedFrom = F, returnCalculationGroupID = F, returnCode = F, returnCreatedTime = F, returnDepthLevel = F, returnDescription = F, returnDynamicRelationshipID = F, returnEntityGroupKey = 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("Gradebook", "CalculationGroupHierarchyDepth", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupHierarchyDepth
#'
#' This function returns fields for a CalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupHierarchyDepthID The id of the CalculationGroupHierarchyDepth.\cr Run \code{\link{getAllCalculationGroupHierarchyDepths}} for a list of CalculationGroupHierarchyDepths.
#' @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 Gradebook
#' @return Details for the CalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupHierarchyDepth <- function(CalculationGroupHierarchyDepthID, EntityID = 1, returnCalculationGroupHierarchyDepthID = F, returnCalculationGroupHierarchyDepthIDClonedFrom = F, returnCalculationGroupID = F, returnCode = F, returnCreatedTime = F, returnDepthLevel = F, returnDescription = F, returnDynamicRelationshipID = F, returnEntityGroupKey = 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("Gradebook", "CalculationGroupHierarchyDepth", CalculationGroupHierarchyDepthID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupHierarchyDepth
#'
#' This function modifies fields for a CalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupHierarchyDepthID The id of the CalculationGroupHierarchyDepth to be modified.\cr Run \code{\link{getAllCalculationGroupHierarchyDepths}} for a list of CalculationGroupHierarchyDepths.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupHierarchyDepth <- function(CalculationGroupHierarchyDepthID, EntityID = 1, setCalculationGroupHierarchyDepthIDClonedFrom = NULL, setCalculationGroupID = NULL, setCode = NULL, setDepthLevel = NULL, setDescription = NULL, setDynamicRelationshipID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupHierarchyDepth", CalculationGroupHierarchyDepthID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupHierarchyDepth.
#'
#' This function creates a new CalculationGroupHierarchyDepth.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupHierarchyDepth <- function(EntityID = 1, setCalculationGroupHierarchyDepthIDClonedFrom = NULL, setCalculationGroupID = NULL, setCode = NULL, setDepthLevel = NULL, setDescription = NULL, setDynamicRelationshipID = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupHierarchyDepth", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupHierarchyDepth
#'
#' This function deletes a CalculationGroupHierarchyDepth.
#'
#' @param CalculationGroupHierarchyDepthID The id of the CalculationGroupHierarchyDepth.\cr Run \code{\link{getAllCalculationGroupHierarchyDepths}} for a list of CalculationGroupHierarchyDepths.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupHierarchyDepth.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupHierarchyDepth <- function(CalculationGroupHierarchyDepthID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupHierarchyDepth", CalculationGroupHierarchyDepthID, EntityID)
}
#' Get all CalculationGroupSubjects.
#'
#' This function returns a dataframe of all CalculationGroupSubjects 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 Gradebook
#' @return All CalculationGroupSubjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupSubjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupSubjectID = F, returnCalculationGroupID = F, returnCalculationGroupSubjectIDClonedFrom = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasGradingScale = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnOrder = F, returnSubjectID = F, returnTopLevelAcademicStandardHierarchyDepthDescription = 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("Gradebook", "CalculationGroupSubject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupSubject
#'
#' This function returns fields for a CalculationGroupSubject.
#'
#' @param CalculationGroupSubjectID The id of the CalculationGroupSubject.\cr Run \code{\link{getAllCalculationGroupSubjects}} for a list of CalculationGroupSubjects.
#' @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 Gradebook
#' @return Details for the CalculationGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupSubject <- function(CalculationGroupSubjectID, EntityID = 1, returnCalculationGroupSubjectID = F, returnCalculationGroupID = F, returnCalculationGroupSubjectIDClonedFrom = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasGradingScale = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnOrder = F, returnSubjectID = F, returnTopLevelAcademicStandardHierarchyDepthDescription = 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("Gradebook", "CalculationGroupSubject", CalculationGroupSubjectID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupSubject
#'
#' This function modifies fields for a CalculationGroupSubject.
#'
#' @param CalculationGroupSubjectID The id of the CalculationGroupSubject to be modified.\cr Run \code{\link{getAllCalculationGroupSubjects}} for a list of CalculationGroupSubjects.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupSubject <- function(CalculationGroupSubjectID, EntityID = 1, setCalculationGroupID = NULL, setCalculationGroupSubjectIDClonedFrom = NULL, setEntityGroupKey = NULL, setOrder = NULL, setSubjectID = 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("Gradebook", "CalculationGroupSubject", CalculationGroupSubjectID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupSubject.
#'
#' This function creates a new CalculationGroupSubject.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupSubject <- function(EntityID = 1, setCalculationGroupID = NULL, setCalculationGroupSubjectIDClonedFrom = NULL, setEntityGroupKey = NULL, setOrder = NULL, setSubjectID = 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("Gradebook", "CalculationGroupSubject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupSubject
#'
#' This function deletes a CalculationGroupSubject.
#'
#' @param CalculationGroupSubjectID The id of the CalculationGroupSubject.\cr Run \code{\link{getAllCalculationGroupSubjects}} for a list of CalculationGroupSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupSubject <- function(CalculationGroupSubjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupSubject", CalculationGroupSubjectID, EntityID)
}
#' Get all CalculationGroupSubjectAcademicStandards.
#'
#' This function returns a dataframe of all CalculationGroupSubjectAcademicStandards 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 Gradebook
#' @return All CalculationGroupSubjectAcademicStandards in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupSubjectAcademicStandards <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupSubjectAcademicStandardID = F, returnAcademicStandardID = F, returnCalculationGroupID = F, returnCalculationGroupSubjectAcademicStandardIDClonedFrom = F, returnCreatedTime = F, returnEntityGroupKey = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSubjectID = 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("Gradebook", "CalculationGroupSubjectAcademicStandard", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupSubjectAcademicStandard
#'
#' This function returns fields for a CalculationGroupSubjectAcademicStandard.
#'
#' @param CalculationGroupSubjectAcademicStandardID The id of the CalculationGroupSubjectAcademicStandard.\cr Run \code{\link{getAllCalculationGroupSubjectAcademicStandards}} for a list of CalculationGroupSubjectAcademicStandards.
#' @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 Gradebook
#' @return Details for the CalculationGroupSubjectAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupSubjectAcademicStandard <- function(CalculationGroupSubjectAcademicStandardID, EntityID = 1, returnCalculationGroupSubjectAcademicStandardID = F, returnAcademicStandardID = F, returnCalculationGroupID = F, returnCalculationGroupSubjectAcademicStandardIDClonedFrom = F, returnCreatedTime = F, returnEntityGroupKey = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSubjectID = 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("Gradebook", "CalculationGroupSubjectAcademicStandard", CalculationGroupSubjectAcademicStandardID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupSubjectAcademicStandard
#'
#' This function modifies fields for a CalculationGroupSubjectAcademicStandard.
#'
#' @param CalculationGroupSubjectAcademicStandardID The id of the CalculationGroupSubjectAcademicStandard to be modified.\cr Run \code{\link{getAllCalculationGroupSubjectAcademicStandards}} for a list of CalculationGroupSubjectAcademicStandards.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupSubjectAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupSubjectAcademicStandard <- function(CalculationGroupSubjectAcademicStandardID, EntityID = 1, setAcademicStandardID = NULL, setCalculationGroupID = NULL, setCalculationGroupSubjectAcademicStandardIDClonedFrom = NULL, setEntityGroupKey = NULL, setSubjectID = 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("Gradebook", "CalculationGroupSubjectAcademicStandard", CalculationGroupSubjectAcademicStandardID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupSubjectAcademicStandard.
#'
#' This function creates a new CalculationGroupSubjectAcademicStandard.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupSubjectAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupSubjectAcademicStandard <- function(EntityID = 1, setAcademicStandardID = NULL, setCalculationGroupID = NULL, setCalculationGroupSubjectAcademicStandardIDClonedFrom = NULL, setEntityGroupKey = NULL, setSubjectID = 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("Gradebook", "CalculationGroupSubjectAcademicStandard", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupSubjectAcademicStandard
#'
#' This function deletes a CalculationGroupSubjectAcademicStandard.
#'
#' @param CalculationGroupSubjectAcademicStandardID The id of the CalculationGroupSubjectAcademicStandard.\cr Run \code{\link{getAllCalculationGroupSubjectAcademicStandards}} for a list of CalculationGroupSubjectAcademicStandards.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupSubjectAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupSubjectAcademicStandard <- function(CalculationGroupSubjectAcademicStandardID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupSubjectAcademicStandard", CalculationGroupSubjectAcademicStandardID, EntityID)
}
#' Get all CalculationGroupSubjectGradeBuckets.
#'
#' This function returns a dataframe of all CalculationGroupSubjectGradeBuckets 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 Gradebook
#' @return All CalculationGroupSubjectGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupSubjectGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupSubjectGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupSubjectGradeBucketIDClonedFrom = F, returnCalculationGroupSubjectID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasCalculationGroupWeight = F, returnHasCategoryWeighting = F, returnHasSubjectAcademicStandards = F, returnIsAHistoricRecord = 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("Gradebook", "CalculationGroupSubjectGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupSubjectGradeBucket
#'
#' This function returns fields for a CalculationGroupSubjectGradeBucket.
#'
#' @param CalculationGroupSubjectGradeBucketID The id of the CalculationGroupSubjectGradeBucket.\cr Run \code{\link{getAllCalculationGroupSubjectGradeBuckets}} for a list of CalculationGroupSubjectGradeBuckets.
#' @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 Gradebook
#' @return Details for the CalculationGroupSubjectGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupSubjectGradeBucket <- function(CalculationGroupSubjectGradeBucketID, EntityID = 1, returnCalculationGroupSubjectGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupSubjectGradeBucketIDClonedFrom = F, returnCalculationGroupSubjectID = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnHasCalculationGroupWeight = F, returnHasCategoryWeighting = F, returnHasSubjectAcademicStandards = F, returnIsAHistoricRecord = 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("Gradebook", "CalculationGroupSubjectGradeBucket", CalculationGroupSubjectGradeBucketID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupSubjectGradeBucket
#'
#' This function modifies fields for a CalculationGroupSubjectGradeBucket.
#'
#' @param CalculationGroupSubjectGradeBucketID The id of the CalculationGroupSubjectGradeBucket to be modified.\cr Run \code{\link{getAllCalculationGroupSubjectGradeBuckets}} for a list of CalculationGroupSubjectGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupSubjectGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupSubjectGradeBucket <- function(CalculationGroupSubjectGradeBucketID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationGroupSubjectGradeBucketIDClonedFrom = NULL, setCalculationGroupSubjectID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupSubjectGradeBucket", CalculationGroupSubjectGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupSubjectGradeBucket.
#'
#' This function creates a new CalculationGroupSubjectGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupSubjectGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupSubjectGradeBucket <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationGroupSubjectGradeBucketIDClonedFrom = NULL, setCalculationGroupSubjectID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setEntityGroupKey = 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("Gradebook", "CalculationGroupSubjectGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupSubjectGradeBucket
#'
#' This function deletes a CalculationGroupSubjectGradeBucket.
#'
#' @param CalculationGroupSubjectGradeBucketID The id of the CalculationGroupSubjectGradeBucket.\cr Run \code{\link{getAllCalculationGroupSubjectGradeBuckets}} for a list of CalculationGroupSubjectGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupSubjectGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupSubjectGradeBucket <- function(CalculationGroupSubjectGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupSubjectGradeBucket", CalculationGroupSubjectGradeBucketID, EntityID)
}
#' Get all CalculationGroupSubjectWeightings.
#'
#' This function returns a dataframe of all CalculationGroupSubjectWeightings 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 Gradebook
#' @return All CalculationGroupSubjectWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupSubjectWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupSubjectWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardAdjustedWeightFormula = F, returnAcademicStandardIDToWeight = F, returnAdjustedWeightPercent = F, returnCalculationGroupSubjectGradeBucketID = F, returnCalculationGroupSubjectWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryAdjustedWeightFormula = F, returnCategoryIDToWeight = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedCategory = F, returnPointsEarnedCategory = F, returnUseForWeightSum = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupSubjectWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupSubjectWeighting
#'
#' This function returns fields for a CalculationGroupSubjectWeighting.
#'
#' @param CalculationGroupSubjectWeightingID The id of the CalculationGroupSubjectWeighting.\cr Run \code{\link{getAllCalculationGroupSubjectWeightings}} for a list of CalculationGroupSubjectWeightings.
#' @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 Gradebook
#' @return Details for the CalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupSubjectWeighting <- function(CalculationGroupSubjectWeightingID, EntityID = 1, returnCalculationGroupSubjectWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardAdjustedWeightFormula = F, returnAcademicStandardIDToWeight = F, returnAdjustedWeightPercent = F, returnCalculationGroupSubjectGradeBucketID = F, returnCalculationGroupSubjectWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryAdjustedWeightFormula = F, returnCategoryIDToWeight = F, returnCreatedTime = F, returnEntityGroupKey = F, returnHasAssignments = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedCategory = F, returnPointsEarnedCategory = F, returnUseForWeightSum = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupSubjectWeighting", CalculationGroupSubjectWeightingID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupSubjectWeighting
#'
#' This function modifies fields for a CalculationGroupSubjectWeighting.
#'
#' @param CalculationGroupSubjectWeightingID The id of the CalculationGroupSubjectWeighting to be modified.\cr Run \code{\link{getAllCalculationGroupSubjectWeightings}} for a list of CalculationGroupSubjectWeightings.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupSubjectWeighting <- function(CalculationGroupSubjectWeightingID, EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupSubjectGradeBucketID = NULL, setCalculationGroupSubjectWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupSubjectWeighting", CalculationGroupSubjectWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupSubjectWeighting.
#'
#' This function creates a new CalculationGroupSubjectWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupSubjectWeighting <- function(EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupSubjectGradeBucketID = NULL, setCalculationGroupSubjectWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupSubjectWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupSubjectWeighting
#'
#' This function deletes a CalculationGroupSubjectWeighting.
#'
#' @param CalculationGroupSubjectWeightingID The id of the CalculationGroupSubjectWeighting.\cr Run \code{\link{getAllCalculationGroupSubjectWeightings}} for a list of CalculationGroupSubjectWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupSubjectWeighting <- function(CalculationGroupSubjectWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupSubjectWeighting", CalculationGroupSubjectWeightingID, EntityID)
}
#' Get all CalculationGroupWeightings.
#'
#' This function returns a dataframe of all CalculationGroupWeightings 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 Gradebook
#' @return All CalculationGroupWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalculationGroupWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalculationGroupWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardIDToWeight = F, returnAcademicStandardWeightFormula = F, returnAdjustedAcademicStandardWeightPercent = F, returnAdjustedCategoryWeightPercent = F, returnAdjustedGradeBucketWeightPercent = F, returnAdjustedSubjectWeightPercent = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryIDToWeight = F, returnCategoryWeightFormula = F, returnCreatedTime = F, returnEntityGroupKey = F, returnGradeBucketAdjustedPercentEarned = F, returnGradeBucketAdjustedPointsEarned = F, returnGradeBucketWeightFormula = F, returnGradingPeriodGradeBucketIDToWeight = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedForCategory = F, returnPointsEarnedForCategory = F, returnRequiredGrade = F, returnRoundBucketPercent = F, returnSubjectAdjustedPercentEarned = F, returnSubjectAdjustedPointsEarned = F, returnSubjectIDToWeight = F, returnSubjectWeightFormula = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalculationGroupWeighting
#'
#' This function returns fields for a CalculationGroupWeighting.
#'
#' @param CalculationGroupWeightingID The id of the CalculationGroupWeighting.\cr Run \code{\link{getAllCalculationGroupWeightings}} for a list of CalculationGroupWeightings.
#' @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 Gradebook
#' @return Details for the CalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalculationGroupWeighting <- function(CalculationGroupWeightingID, EntityID = 1, returnCalculationGroupWeightingID = F, returnAcademicStandardAdjustedPercentEarned = F, returnAcademicStandardAdjustedPointsEarned = F, returnAcademicStandardIDToWeight = F, returnAcademicStandardWeightFormula = F, returnAdjustedAcademicStandardWeightPercent = F, returnAdjustedCategoryWeightPercent = F, returnAdjustedGradeBucketWeightPercent = F, returnAdjustedSubjectWeightPercent = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupWeightingIDClonedFrom = F, returnCategoryAdjustedPercentEarned = F, returnCategoryAdjustedPointsEarned = F, returnCategoryIDToWeight = F, returnCategoryWeightFormula = F, returnCreatedTime = F, returnEntityGroupKey = F, returnGradeBucketAdjustedPercentEarned = F, returnGradeBucketAdjustedPointsEarned = F, returnGradeBucketWeightFormula = F, returnGradingPeriodGradeBucketIDToWeight = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnPercentEarnedForCategory = F, returnPointsEarnedForCategory = F, returnRequiredGrade = F, returnRoundBucketPercent = F, returnSubjectAdjustedPercentEarned = F, returnSubjectAdjustedPointsEarned = F, returnSubjectIDToWeight = F, returnSubjectWeightFormula = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "CalculationGroupWeighting", CalculationGroupWeightingID, searchFields, EntityID)
}
#' Modify a specific CalculationGroupWeighting
#'
#' This function modifies fields for a CalculationGroupWeighting.
#'
#' @param CalculationGroupWeightingID The id of the CalculationGroupWeighting to be modified.\cr Run \code{\link{getAllCalculationGroupWeightings}} for a list of CalculationGroupWeightings.
#' @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 Gradebook
#' @return Details of the modified CalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalculationGroupWeighting <- function(CalculationGroupWeightingID, EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupGradeBucketID = NULL, setCalculationGroupWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setGradingPeriodGradeBucketIDToWeight = NULL, setRequiredGrade = NULL, setRoundBucketPercent = NULL, setSubjectIDToWeight = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupWeighting", CalculationGroupWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new CalculationGroupWeighting.
#'
#' This function creates a new CalculationGroupWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalculationGroupWeighting <- function(EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupGradeBucketID = NULL, setCalculationGroupWeightingIDClonedFrom = NULL, setCategoryIDToWeight = NULL, setEntityGroupKey = NULL, setGradingPeriodGradeBucketIDToWeight = NULL, setRequiredGrade = NULL, setRoundBucketPercent = NULL, setSubjectIDToWeight = NULL, setWeightPercent = 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("Gradebook", "CalculationGroupWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalculationGroupWeighting
#'
#' This function deletes a CalculationGroupWeighting.
#'
#' @param CalculationGroupWeightingID The id of the CalculationGroupWeighting.\cr Run \code{\link{getAllCalculationGroupWeightings}} for a list of CalculationGroupWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalculationGroupWeighting <- function(CalculationGroupWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CalculationGroupWeighting", CalculationGroupWeightingID, EntityID)
}
#' Get all Categories.
#'
#' This function returns a dataframe of all Categories 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 Gradebook
#' @return All Categories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCategoryID = F, returnAssignmentCount = F, returnAverageStudentAssignmentScoreForCategoryAndStudentSection = F, returnBackgroundColor = F, returnCalculationGroupAllowCategoryOverride = F, returnCategoryIDClonedFrom = F, returnCategoryUsedInCategoryWeightingDefaultSetup = F, returnCategoryUsedInTotalPointsDefaultCalculationSetup = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDescriptionWithCategoryWeightPercent = F, returnDistrictGroupKey = F, returnDistrictID = F, returnGradeBucketTypeCategory = F, returnHasAssignments = F, returnHasSpecificCalculationGroupAcademicStandardWeight = F, returnHasSpecificCalculationGroupSubjectWeight = F, returnHasSpecificCalculationGroupWeight = F, returnIsAHistoricRecord = F, returnIsValidInCalculationGroup = F, returnModifiedTime = F, returnSchoolYearID = F, returnTextColor = F, returnUseForSpecificGradeBucketType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightingAllowedForGradeBucketType = 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("Gradebook", "Category", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Category
#'
#' This function returns fields for a Category.
#'
#' @param CategoryID The id of the Category.\cr Run \code{\link{getAllCategories}} for a list of Categories.
#' @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 Gradebook
#' @return Details for the Category.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCategory <- function(CategoryID, EntityID = 1, returnCategoryID = F, returnAssignmentCount = F, returnAverageStudentAssignmentScoreForCategoryAndStudentSection = F, returnBackgroundColor = F, returnCalculationGroupAllowCategoryOverride = F, returnCategoryIDClonedFrom = F, returnCategoryUsedInCategoryWeightingDefaultSetup = F, returnCategoryUsedInTotalPointsDefaultCalculationSetup = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnDescriptionWithCategoryWeightPercent = F, returnDistrictGroupKey = F, returnDistrictID = F, returnGradeBucketTypeCategory = F, returnHasAssignments = F, returnHasSpecificCalculationGroupAcademicStandardWeight = F, returnHasSpecificCalculationGroupSubjectWeight = F, returnHasSpecificCalculationGroupWeight = F, returnIsAHistoricRecord = F, returnIsValidInCalculationGroup = F, returnModifiedTime = F, returnSchoolYearID = F, returnTextColor = F, returnUseForSpecificGradeBucketType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightingAllowedForGradeBucketType = 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("Gradebook", "Category", CategoryID, searchFields, EntityID)
}
#' Modify a specific Category
#'
#' This function modifies fields for a Category.
#'
#' @param CategoryID The id of the Category to be modified.\cr Run \code{\link{getAllCategories}} for a list of Categorys.
#' @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 Gradebook
#' @return Details of the modified Category.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCategory <- function(CategoryID, EntityID = 1, setBackgroundColor = NULL, setCategoryIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setDistrictGroupKey = NULL, setDistrictID = NULL, setSchoolYearID = NULL, setTextColor = NULL, setUseForSpecificGradeBucketType = 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("Gradebook", "Category", CategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new Category.
#'
#' This function creates a new Category.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created Category.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCategory <- function(EntityID = 1, setBackgroundColor = NULL, setCategoryIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setDistrictGroupKey = NULL, setDistrictID = NULL, setSchoolYearID = NULL, setTextColor = NULL, setUseForSpecificGradeBucketType = 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("Gradebook", "Category", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Category
#'
#' This function deletes a Category.
#'
#' @param CategoryID The id of the Category.\cr Run \code{\link{getAllCategories}} for a list of Categories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted Category.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCategory <- function(CategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "Category", CategoryID, EntityID)
}
#' Get all CategoryGradeBucketTypes.
#'
#' This function returns a dataframe of all CategoryGradeBucketTypes 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 Gradebook
#' @return All CategoryGradeBucketTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCategoryGradeBucketTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCategoryGradeBucketTypeID = F, returnCategoryGradeBucketTypeIDClonedFrom = F, returnCategoryID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnGradeBucketTypeID = 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("Gradebook", "CategoryGradeBucketType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CategoryGradeBucketType
#'
#' This function returns fields for a CategoryGradeBucketType.
#'
#' @param CategoryGradeBucketTypeID The id of the CategoryGradeBucketType.\cr Run \code{\link{getAllCategoryGradeBucketTypes}} for a list of CategoryGradeBucketTypes.
#' @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 Gradebook
#' @return Details for the CategoryGradeBucketType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCategoryGradeBucketType <- function(CategoryGradeBucketTypeID, EntityID = 1, returnCategoryGradeBucketTypeID = F, returnCategoryGradeBucketTypeIDClonedFrom = F, returnCategoryID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnGradeBucketTypeID = 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("Gradebook", "CategoryGradeBucketType", CategoryGradeBucketTypeID, searchFields, EntityID)
}
#' Modify a specific CategoryGradeBucketType
#'
#' This function modifies fields for a CategoryGradeBucketType.
#'
#' @param CategoryGradeBucketTypeID The id of the CategoryGradeBucketType to be modified.\cr Run \code{\link{getAllCategoryGradeBucketTypes}} for a list of CategoryGradeBucketTypes.
#' @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 Gradebook
#' @return Details of the modified CategoryGradeBucketType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCategoryGradeBucketType <- function(CategoryGradeBucketTypeID, EntityID = 1, setCategoryGradeBucketTypeIDClonedFrom = NULL, setCategoryID = NULL, setEntityGroupKey = NULL, setGradeBucketTypeID = 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("Gradebook", "CategoryGradeBucketType", CategoryGradeBucketTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new CategoryGradeBucketType.
#'
#' This function creates a new CategoryGradeBucketType.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CategoryGradeBucketType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCategoryGradeBucketType <- function(EntityID = 1, setCategoryGradeBucketTypeIDClonedFrom = NULL, setCategoryID = NULL, setEntityGroupKey = NULL, setGradeBucketTypeID = 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("Gradebook", "CategoryGradeBucketType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CategoryGradeBucketType
#'
#' This function deletes a CategoryGradeBucketType.
#'
#' @param CategoryGradeBucketTypeID The id of the CategoryGradeBucketType.\cr Run \code{\link{getAllCategoryGradeBucketTypes}} for a list of CategoryGradeBucketTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CategoryGradeBucketType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCategoryGradeBucketType <- function(CategoryGradeBucketTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CategoryGradeBucketType", CategoryGradeBucketTypeID, EntityID)
}
#' Get all ClassGroups.
#'
#' This function returns a dataframe of all ClassGroups 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 Gradebook
#' @return All ClassGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllClassGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnClassGroupID = F, returnCreatedTime = F, returnEntityID = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnName = F, returnSchoolYearID = F, returnStaffID = 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("Gradebook", "ClassGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ClassGroup
#'
#' This function returns fields for a ClassGroup.
#'
#' @param ClassGroupID The id of the ClassGroup.\cr Run \code{\link{getAllClassGroups}} for a list of ClassGroups.
#' @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 Gradebook
#' @return Details for the ClassGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getClassGroup <- function(ClassGroupID, EntityID = 1, returnClassGroupID = F, returnCreatedTime = F, returnEntityID = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnName = F, returnSchoolYearID = F, returnStaffID = 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("Gradebook", "ClassGroup", ClassGroupID, searchFields, EntityID)
}
#' Modify a specific ClassGroup
#'
#' This function modifies fields for a ClassGroup.
#'
#' @param ClassGroupID The id of the ClassGroup to be modified.\cr Run \code{\link{getAllClassGroups}} for a list of ClassGroups.
#' @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 Gradebook
#' @return Details of the modified ClassGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyClassGroup <- function(ClassGroupID, EntityID = 1, setEntityID = NULL, setName = NULL, setSchoolYearID = NULL, setStaffID = 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("Gradebook", "ClassGroup", ClassGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new ClassGroup.
#'
#' This function creates a new ClassGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ClassGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createClassGroup <- function(EntityID = 1, setEntityID = NULL, setName = NULL, setSchoolYearID = NULL, setStaffID = 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("Gradebook", "ClassGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ClassGroup
#'
#' This function deletes a ClassGroup.
#'
#' @param ClassGroupID The id of the ClassGroup.\cr Run \code{\link{getAllClassGroups}} for a list of ClassGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ClassGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteClassGroup <- function(ClassGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ClassGroup", ClassGroupID, EntityID)
}
#' Get all ClassGroupSections.
#'
#' This function returns a dataframe of all ClassGroupSections 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 Gradebook
#' @return All ClassGroupSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllClassGroupSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnClassGroupSectionID = F, returnClassGroupID = F, returnCreatedTime = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "ClassGroupSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ClassGroupSection
#'
#' This function returns fields for a ClassGroupSection.
#'
#' @param ClassGroupSectionID The id of the ClassGroupSection.\cr Run \code{\link{getAllClassGroupSections}} for a list of ClassGroupSections.
#' @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 Gradebook
#' @return Details for the ClassGroupSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getClassGroupSection <- function(ClassGroupSectionID, EntityID = 1, returnClassGroupSectionID = F, returnClassGroupID = F, returnCreatedTime = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "ClassGroupSection", ClassGroupSectionID, searchFields, EntityID)
}
#' Modify a specific ClassGroupSection
#'
#' This function modifies fields for a ClassGroupSection.
#'
#' @param ClassGroupSectionID The id of the ClassGroupSection to be modified.\cr Run \code{\link{getAllClassGroupSections}} for a list of ClassGroupSections.
#' @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 Gradebook
#' @return Details of the modified ClassGroupSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyClassGroupSection <- function(ClassGroupSectionID, EntityID = 1, setClassGroupID = NULL, setSectionID = 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("Gradebook", "ClassGroupSection", ClassGroupSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new ClassGroupSection.
#'
#' This function creates a new ClassGroupSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ClassGroupSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createClassGroupSection <- function(EntityID = 1, setClassGroupID = NULL, setSectionID = 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("Gradebook", "ClassGroupSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ClassGroupSection
#'
#' This function deletes a ClassGroupSection.
#'
#' @param ClassGroupSectionID The id of the ClassGroupSection.\cr Run \code{\link{getAllClassGroupSections}} for a list of ClassGroupSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ClassGroupSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteClassGroupSection <- function(ClassGroupSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ClassGroupSection", ClassGroupSectionID, EntityID)
}
#' Get all ClosedGradingPeriodGradeChanges.
#'
#' This function returns a dataframe of all ClosedGradingPeriodGradeChanges 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 Gradebook
#' @return All ClosedGradingPeriodGradeChanges in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllClosedGradingPeriodGradeChanges <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnClosedGradingPeriodGradeChangeID = F, returnCalculatedCompletedTime = F, returnCompletedTime = F, returnCreatedTime = F, returnDisplayCompleteButton = F, returnDisplayMassReviewDenyButton = F, returnGradingPeriodID = F, returnModifiedTime = F, returnReason = F, returnSectionID = 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("Gradebook", "ClosedGradingPeriodGradeChange", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ClosedGradingPeriodGradeChange
#'
#' This function returns fields for a ClosedGradingPeriodGradeChange.
#'
#' @param ClosedGradingPeriodGradeChangeID The id of the ClosedGradingPeriodGradeChange.\cr Run \code{\link{getAllClosedGradingPeriodGradeChanges}} for a list of ClosedGradingPeriodGradeChanges.
#' @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 Gradebook
#' @return Details for the ClosedGradingPeriodGradeChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getClosedGradingPeriodGradeChange <- function(ClosedGradingPeriodGradeChangeID, EntityID = 1, returnClosedGradingPeriodGradeChangeID = F, returnCalculatedCompletedTime = F, returnCompletedTime = F, returnCreatedTime = F, returnDisplayCompleteButton = F, returnDisplayMassReviewDenyButton = F, returnGradingPeriodID = F, returnModifiedTime = F, returnReason = F, returnSectionID = 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("Gradebook", "ClosedGradingPeriodGradeChange", ClosedGradingPeriodGradeChangeID, searchFields, EntityID)
}
#' Modify a specific ClosedGradingPeriodGradeChange
#'
#' This function modifies fields for a ClosedGradingPeriodGradeChange.
#'
#' @param ClosedGradingPeriodGradeChangeID The id of the ClosedGradingPeriodGradeChange to be modified.\cr Run \code{\link{getAllClosedGradingPeriodGradeChanges}} for a list of ClosedGradingPeriodGradeChanges.
#' @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 Gradebook
#' @return Details of the modified ClosedGradingPeriodGradeChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyClosedGradingPeriodGradeChange <- function(ClosedGradingPeriodGradeChangeID, EntityID = 1, setCalculatedCompletedTime = NULL, setCompletedTime = NULL, setDisplayMassReviewDenyButton = NULL, setGradingPeriodID = NULL, setReason = NULL, setSectionID = 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("Gradebook", "ClosedGradingPeriodGradeChange", ClosedGradingPeriodGradeChangeID, names(functionParams), functionParams, EntityID)
}
#' Create new ClosedGradingPeriodGradeChange.
#'
#' This function creates a new ClosedGradingPeriodGradeChange.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ClosedGradingPeriodGradeChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createClosedGradingPeriodGradeChange <- function(EntityID = 1, setCalculatedCompletedTime = NULL, setCompletedTime = NULL, setDisplayMassReviewDenyButton = NULL, setGradingPeriodID = NULL, setReason = NULL, setSectionID = 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("Gradebook", "ClosedGradingPeriodGradeChange", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ClosedGradingPeriodGradeChange
#'
#' This function deletes a ClosedGradingPeriodGradeChange.
#'
#' @param ClosedGradingPeriodGradeChangeID The id of the ClosedGradingPeriodGradeChange.\cr Run \code{\link{getAllClosedGradingPeriodGradeChanges}} for a list of ClosedGradingPeriodGradeChanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ClosedGradingPeriodGradeChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteClosedGradingPeriodGradeChange <- function(ClosedGradingPeriodGradeChangeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ClosedGradingPeriodGradeChange", ClosedGradingPeriodGradeChangeID, EntityID)
}
#' Get all ClosedGradingPeriodStudentGradeBucketChanges.
#'
#' This function returns a dataframe of all ClosedGradingPeriodStudentGradeBucketChanges 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 Gradebook
#' @return All ClosedGradingPeriodStudentGradeBucketChanges in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllClosedGradingPeriodStudentGradeBucketChanges <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnClosedGradingPeriodStudentGradeBucketChangeID = F, returnCalculatedClosedGradingPeriodGradeChangeStatus = F, returnClosedGradingPeriodGradeChangeID = F, returnClosedGradingPeriodGradeChangeStatus = F, returnClosedGradingPeriodGradeChangeStatusCode = F, returnCreatedTime = F, returnGradeMarkIDNew = F, returnGradeMarkIDOriginal = F, returnHasSnapshot = F, returnIsDisabled = F, returnIsGradeChangePastDueAndInProgress = F, returnModifiedTime = F, returnNewPercent = F, returnOriginalPercent = F, returnStaffMeetID = F, returnStudentGradeBucketID = 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("Gradebook", "ClosedGradingPeriodStudentGradeBucketChange", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ClosedGradingPeriodStudentGradeBucketChange
#'
#' This function returns fields for a ClosedGradingPeriodStudentGradeBucketChange.
#'
#' @param ClosedGradingPeriodStudentGradeBucketChangeID The id of the ClosedGradingPeriodStudentGradeBucketChange.\cr Run \code{\link{getAllClosedGradingPeriodStudentGradeBucketChanges}} for a list of ClosedGradingPeriodStudentGradeBucketChanges.
#' @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 Gradebook
#' @return Details for the ClosedGradingPeriodStudentGradeBucketChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getClosedGradingPeriodStudentGradeBucketChange <- function(ClosedGradingPeriodStudentGradeBucketChangeID, EntityID = 1, returnClosedGradingPeriodStudentGradeBucketChangeID = F, returnCalculatedClosedGradingPeriodGradeChangeStatus = F, returnClosedGradingPeriodGradeChangeID = F, returnClosedGradingPeriodGradeChangeStatus = F, returnClosedGradingPeriodGradeChangeStatusCode = F, returnCreatedTime = F, returnGradeMarkIDNew = F, returnGradeMarkIDOriginal = F, returnHasSnapshot = F, returnIsDisabled = F, returnIsGradeChangePastDueAndInProgress = F, returnModifiedTime = F, returnNewPercent = F, returnOriginalPercent = F, returnStaffMeetID = F, returnStudentGradeBucketID = 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("Gradebook", "ClosedGradingPeriodStudentGradeBucketChange", ClosedGradingPeriodStudentGradeBucketChangeID, searchFields, EntityID)
}
#' Modify a specific ClosedGradingPeriodStudentGradeBucketChange
#'
#' This function modifies fields for a ClosedGradingPeriodStudentGradeBucketChange.
#'
#' @param ClosedGradingPeriodStudentGradeBucketChangeID The id of the ClosedGradingPeriodStudentGradeBucketChange to be modified.\cr Run \code{\link{getAllClosedGradingPeriodStudentGradeBucketChanges}} for a list of ClosedGradingPeriodStudentGradeBucketChanges.
#' @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 Gradebook
#' @return Details of the modified ClosedGradingPeriodStudentGradeBucketChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyClosedGradingPeriodStudentGradeBucketChange <- function(ClosedGradingPeriodStudentGradeBucketChangeID, EntityID = 1, setClosedGradingPeriodGradeChangeID = NULL, setClosedGradingPeriodGradeChangeStatus = NULL, setClosedGradingPeriodGradeChangeStatusCode = NULL, setGradeMarkIDNew = NULL, setGradeMarkIDOriginal = NULL, setHasSnapshot = NULL, setNewPercent = NULL, setOriginalPercent = NULL, setStaffMeetID = NULL, setStudentGradeBucketID = 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("Gradebook", "ClosedGradingPeriodStudentGradeBucketChange", ClosedGradingPeriodStudentGradeBucketChangeID, names(functionParams), functionParams, EntityID)
}
#' Create new ClosedGradingPeriodStudentGradeBucketChange.
#'
#' This function creates a new ClosedGradingPeriodStudentGradeBucketChange.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ClosedGradingPeriodStudentGradeBucketChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createClosedGradingPeriodStudentGradeBucketChange <- function(EntityID = 1, setClosedGradingPeriodGradeChangeID = NULL, setClosedGradingPeriodGradeChangeStatus = NULL, setClosedGradingPeriodGradeChangeStatusCode = NULL, setGradeMarkIDNew = NULL, setGradeMarkIDOriginal = NULL, setHasSnapshot = NULL, setNewPercent = NULL, setOriginalPercent = NULL, setStaffMeetID = NULL, setStudentGradeBucketID = 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("Gradebook", "ClosedGradingPeriodStudentGradeBucketChange", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ClosedGradingPeriodStudentGradeBucketChange
#'
#' This function deletes a ClosedGradingPeriodStudentGradeBucketChange.
#'
#' @param ClosedGradingPeriodStudentGradeBucketChangeID The id of the ClosedGradingPeriodStudentGradeBucketChange.\cr Run \code{\link{getAllClosedGradingPeriodStudentGradeBucketChanges}} for a list of ClosedGradingPeriodStudentGradeBucketChanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ClosedGradingPeriodStudentGradeBucketChange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteClosedGradingPeriodStudentGradeBucketChange <- function(ClosedGradingPeriodStudentGradeBucketChangeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ClosedGradingPeriodStudentGradeBucketChange", ClosedGradingPeriodStudentGradeBucketChangeID, EntityID)
}
#' Get all ConfigDistricts.
#'
#' This function returns a dataframe of all ConfigDistricts in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Gradebook
#' @return All ConfigDistricts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigDistrictsGradebook <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigDistrictID = F, returnCreatedTime = 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("Gradebook", "ConfigDistrict", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigDistrict
#'
#' This function returns fields for a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept Gradebook
#' @return Details for the ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigDistrictGradebook <- function(ConfigDistrictID, EntityID = 1, returnConfigDistrictID = F, returnCreatedTime = 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("Gradebook", "ConfigDistrict", ConfigDistrictID, searchFields, EntityID)
}
#' Modify a specific ConfigDistrict
#'
#' This function modifies fields for a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict to be modified.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Gradebook
#' @return Details of the modified ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigDistrictGradebook <- function(ConfigDistrictID, EntityID = 1, 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("Gradebook", "ConfigDistrict", ConfigDistrictID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigDistrict.
#'
#' This function creates a new ConfigDistrict.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Gradebook
#' @return The fields used to define the newly created ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigDistrictGradebook <- function(EntityID = 1, 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("Gradebook", "ConfigDistrict", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigDistrict
#'
#' This function deletes a ConfigDistrict.
#'
#' @param ConfigDistrictID The id of the ConfigDistrict.\cr Run \code{\link{getAllConfigDistricts}} for a list of ConfigDistricts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ConfigDistrict.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigDistrictGradebook <- function(ConfigDistrictID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ConfigDistrict", ConfigDistrictID, EntityID)
}
#' Get all ConfigDistrictYears.
#'
#' This function returns a dataframe of all ConfigDistrictYears 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 Gradebook
#' @return All ConfigDistrictYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigDistrictYearsGradebook <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigDistrictYearID = F, returnConfigDistrictYearIDClonedFrom = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUseCurriculumSubjectsInGradebook = 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("Gradebook", "ConfigDistrictYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigDistrictYear
#'
#' This function returns fields for a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @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 Gradebook
#' @return Details for the ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigDistrictYearGradebook <- function(ConfigDistrictYearID, EntityID = 1, returnConfigDistrictYearID = F, returnConfigDistrictYearIDClonedFrom = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUseCurriculumSubjectsInGradebook = 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("Gradebook", "ConfigDistrictYear", ConfigDistrictYearID, searchFields, EntityID)
}
#' Modify a specific ConfigDistrictYear
#'
#' This function modifies fields for a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear to be modified.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @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 Gradebook
#' @return Details of the modified ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigDistrictYearGradebook <- function(ConfigDistrictYearID, EntityID = 1, setConfigDistrictYearIDClonedFrom = NULL, setDistrictID = NULL, setSchoolYearID = NULL, setUseCurriculumSubjectsInGradebook = 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("Gradebook", "ConfigDistrictYear", ConfigDistrictYearID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigDistrictYear.
#'
#' This function creates a new ConfigDistrictYear.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigDistrictYearGradebook <- function(EntityID = 1, setConfigDistrictYearIDClonedFrom = NULL, setDistrictID = NULL, setSchoolYearID = NULL, setUseCurriculumSubjectsInGradebook = 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("Gradebook", "ConfigDistrictYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigDistrictYear
#'
#' This function deletes a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigDistrictYearGradebook <- function(ConfigDistrictYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ConfigDistrictYear", ConfigDistrictYearID, EntityID)
}
#' Get all ConfigEntities.
#'
#' This function returns a dataframe of all ConfigEntities 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 Gradebook
#' @return All ConfigEntities in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigEntities <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigEntityID = F, returnCreatedTime = F, returnEntityID = F, returnModifiedTime = F, returnRunInMonitorByScheduledTask = 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("Gradebook", "ConfigEntity", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigEntity
#'
#' This function returns fields for a ConfigEntity.
#'
#' @param ConfigEntityID The id of the ConfigEntity.\cr Run \code{\link{getAllConfigEntities}} for a list of ConfigEntities.
#' @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 Gradebook
#' @return Details for the ConfigEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigEntity <- function(ConfigEntityID, EntityID = 1, returnConfigEntityID = F, returnCreatedTime = F, returnEntityID = F, returnModifiedTime = F, returnRunInMonitorByScheduledTask = 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("Gradebook", "ConfigEntity", ConfigEntityID, searchFields, EntityID)
}
#' Modify a specific ConfigEntity
#'
#' This function modifies fields for a ConfigEntity.
#'
#' @param ConfigEntityID The id of the ConfigEntity to be modified.\cr Run \code{\link{getAllConfigEntities}} for a list of ConfigEntitys.
#' @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 Gradebook
#' @return Details of the modified ConfigEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigEntity <- function(ConfigEntityID, EntityID = 1, setEntityID = NULL, setRunInMonitorByScheduledTask = 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("Gradebook", "ConfigEntity", ConfigEntityID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigEntity.
#'
#' This function creates a new ConfigEntity.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ConfigEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigEntity <- function(EntityID = 1, setEntityID = NULL, setRunInMonitorByScheduledTask = 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("Gradebook", "ConfigEntity", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigEntity
#'
#' This function deletes a ConfigEntity.
#'
#' @param ConfigEntityID The id of the ConfigEntity.\cr Run \code{\link{getAllConfigEntities}} for a list of ConfigEntities.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ConfigEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigEntity <- function(ConfigEntityID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ConfigEntity", ConfigEntityID, EntityID)
}
#' Get all ConfigEntityGroupYears.
#'
#' This function returns a dataframe of all ConfigEntityGroupYears 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 Gradebook
#' @return All ConfigEntityGroupYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigEntityGroupYearsGradebook <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigEntityGroupYearID = F, returnAllowClosedGradingPeriodGradeChangeRequestsToUpdateSnapshotGrades = F, returnAllowGracePeriodAtEndOfGradingPeriod = F, returnAllowMultipleAssignmentAttempts = F, returnAllowNegativePercentAdjustment = F, returnAllowOnlineAssignments = F, returnAllowPercentAdjustment = F, returnAllowRetainedFutureScoring = F, returnAllowStudentGroups = F, returnAllowTeacherComments = F, returnAllowTeachersToAddStudentNotes = F, returnAllowTeachersToOverrideDefaultMaxScore = F, returnAllowTeachersToOverrideDefaultMaxWeight = F, returnAllowTeachersToTransferGrades = F, returnAssignmentMaxScore = F, returnAssignmentMaxWeight = F, returnAutoApproveGradeChangeRequest = F, returnCapCalculationAt100Percent = F, returnCapWeightedCategoryCalculationAt100Percent = F, returnClosedGradingPeriodGradeChangeCutOff = F, returnClosedGradingPeriodGradeChangePermissionType = F, returnClosedGradingPeriodGradeChangePermissionTypeCode = F, returnConfigEntityGroupYearIDClonedFrom = F, returnCreatedTime = F, returnDisplayNonGradedClassesForTeachers = F, returnEntityGroupKey = F, returnEntityID = F, returnFailingGradeThresholdPercent = F, returnGradingPeriodEditExtensionDays = F, returnGradingPeriodEditExtensionEndTime = F, returnModifiedTime = F, returnNumberOfDaysUntilNewStudentIconAppears = F, returnNumberOfDaysUntilUnscoredAssignmentsAreMissing = F, returnOnlyShowGradebooksWithActiveStudentSectionTransactions = F, returnSchoolYearID = F, returnScoreClarifierIDFailing = F, returnUseFailingGradeScoreClarifier = 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("Gradebook", "ConfigEntityGroupYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigEntityGroupYear
#'
#' This function returns fields for a ConfigEntityGroupYear.
#'
#' @param ConfigEntityGroupYearID The id of the ConfigEntityGroupYear.\cr Run \code{\link{getAllConfigEntityGroupYears}} for a list of ConfigEntityGroupYears.
#' @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 Gradebook
#' @return Details for the ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigEntityGroupYearGradebook <- function(ConfigEntityGroupYearID, EntityID = 1, returnConfigEntityGroupYearID = F, returnAllowClosedGradingPeriodGradeChangeRequestsToUpdateSnapshotGrades = F, returnAllowGracePeriodAtEndOfGradingPeriod = F, returnAllowMultipleAssignmentAttempts = F, returnAllowNegativePercentAdjustment = F, returnAllowOnlineAssignments = F, returnAllowPercentAdjustment = F, returnAllowRetainedFutureScoring = F, returnAllowStudentGroups = F, returnAllowTeacherComments = F, returnAllowTeachersToAddStudentNotes = F, returnAllowTeachersToOverrideDefaultMaxScore = F, returnAllowTeachersToOverrideDefaultMaxWeight = F, returnAllowTeachersToTransferGrades = F, returnAssignmentMaxScore = F, returnAssignmentMaxWeight = F, returnAutoApproveGradeChangeRequest = F, returnCapCalculationAt100Percent = F, returnCapWeightedCategoryCalculationAt100Percent = F, returnClosedGradingPeriodGradeChangeCutOff = F, returnClosedGradingPeriodGradeChangePermissionType = F, returnClosedGradingPeriodGradeChangePermissionTypeCode = F, returnConfigEntityGroupYearIDClonedFrom = F, returnCreatedTime = F, returnDisplayNonGradedClassesForTeachers = F, returnEntityGroupKey = F, returnEntityID = F, returnFailingGradeThresholdPercent = F, returnGradingPeriodEditExtensionDays = F, returnGradingPeriodEditExtensionEndTime = F, returnModifiedTime = F, returnNumberOfDaysUntilNewStudentIconAppears = F, returnNumberOfDaysUntilUnscoredAssignmentsAreMissing = F, returnOnlyShowGradebooksWithActiveStudentSectionTransactions = F, returnSchoolYearID = F, returnScoreClarifierIDFailing = F, returnUseFailingGradeScoreClarifier = 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("Gradebook", "ConfigEntityGroupYear", ConfigEntityGroupYearID, searchFields, EntityID)
}
#' Modify a specific ConfigEntityGroupYear
#'
#' This function modifies fields for a ConfigEntityGroupYear.
#'
#' @param ConfigEntityGroupYearID The id of the ConfigEntityGroupYear to be modified.\cr Run \code{\link{getAllConfigEntityGroupYears}} for a list of ConfigEntityGroupYears.
#' @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 Gradebook
#' @return Details of the modified ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigEntityGroupYearGradebook <- function(ConfigEntityGroupYearID, EntityID = 1, setAllowClosedGradingPeriodGradeChangeRequestsToUpdateSnapshotGrades = NULL, setAllowGracePeriodAtEndOfGradingPeriod = NULL, setAllowMultipleAssignmentAttempts = NULL, setAllowNegativePercentAdjustment = NULL, setAllowOnlineAssignments = NULL, setAllowPercentAdjustment = NULL, setAllowRetainedFutureScoring = NULL, setAllowStudentGroups = NULL, setAllowTeacherComments = NULL, setAllowTeachersToAddStudentNotes = NULL, setAllowTeachersToOverrideDefaultMaxScore = NULL, setAllowTeachersToOverrideDefaultMaxWeight = NULL, setAllowTeachersToTransferGrades = NULL, setAssignmentMaxScore = NULL, setAssignmentMaxWeight = NULL, setAutoApproveGradeChangeRequest = NULL, setCapCalculationAt100Percent = NULL, setCapWeightedCategoryCalculationAt100Percent = NULL, setClosedGradingPeriodGradeChangeCutOff = NULL, setClosedGradingPeriodGradeChangePermissionType = NULL, setClosedGradingPeriodGradeChangePermissionTypeCode = NULL, setConfigEntityGroupYearIDClonedFrom = NULL, setDisplayNonGradedClassesForTeachers = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFailingGradeThresholdPercent = NULL, setGradingPeriodEditExtensionDays = NULL, setGradingPeriodEditExtensionEndTime = NULL, setNumberOfDaysUntilNewStudentIconAppears = NULL, setNumberOfDaysUntilUnscoredAssignmentsAreMissing = NULL, setOnlyShowGradebooksWithActiveStudentSectionTransactions = NULL, setSchoolYearID = NULL, setScoreClarifierIDFailing = NULL, setUseFailingGradeScoreClarifier = 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("Gradebook", "ConfigEntityGroupYear", ConfigEntityGroupYearID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigEntityGroupYear.
#'
#' This function creates a new ConfigEntityGroupYear.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigEntityGroupYearGradebook <- function(EntityID = 1, setAllowClosedGradingPeriodGradeChangeRequestsToUpdateSnapshotGrades = NULL, setAllowGracePeriodAtEndOfGradingPeriod = NULL, setAllowMultipleAssignmentAttempts = NULL, setAllowNegativePercentAdjustment = NULL, setAllowOnlineAssignments = NULL, setAllowPercentAdjustment = NULL, setAllowRetainedFutureScoring = NULL, setAllowStudentGroups = NULL, setAllowTeacherComments = NULL, setAllowTeachersToAddStudentNotes = NULL, setAllowTeachersToOverrideDefaultMaxScore = NULL, setAllowTeachersToOverrideDefaultMaxWeight = NULL, setAllowTeachersToTransferGrades = NULL, setAssignmentMaxScore = NULL, setAssignmentMaxWeight = NULL, setAutoApproveGradeChangeRequest = NULL, setCapCalculationAt100Percent = NULL, setCapWeightedCategoryCalculationAt100Percent = NULL, setClosedGradingPeriodGradeChangeCutOff = NULL, setClosedGradingPeriodGradeChangePermissionType = NULL, setClosedGradingPeriodGradeChangePermissionTypeCode = NULL, setConfigEntityGroupYearIDClonedFrom = NULL, setDisplayNonGradedClassesForTeachers = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFailingGradeThresholdPercent = NULL, setGradingPeriodEditExtensionDays = NULL, setGradingPeriodEditExtensionEndTime = NULL, setNumberOfDaysUntilNewStudentIconAppears = NULL, setNumberOfDaysUntilUnscoredAssignmentsAreMissing = NULL, setOnlyShowGradebooksWithActiveStudentSectionTransactions = NULL, setSchoolYearID = NULL, setScoreClarifierIDFailing = NULL, setUseFailingGradeScoreClarifier = 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("Gradebook", "ConfigEntityGroupYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigEntityGroupYear
#'
#' This function deletes a ConfigEntityGroupYear.
#'
#' @param ConfigEntityGroupYearID The id of the ConfigEntityGroupYear.\cr Run \code{\link{getAllConfigEntityGroupYears}} for a list of ConfigEntityGroupYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigEntityGroupYearGradebook <- function(ConfigEntityGroupYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ConfigEntityGroupYear", ConfigEntityGroupYearID, EntityID)
}
#' Get all CourseGradingScaleGroups.
#'
#' This function returns a dataframe of all CourseGradingScaleGroups 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 Gradebook
#' @return All CourseGradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCourseGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCourseGradingScaleGroupID = F, returnAllowSectionOverride = F, returnCourseGradingScaleGroupIDClonedFrom = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnFilter = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnLimitTeacherOverridesToGradeMarksInGroup = F, returnModifiedTime = F, returnRank = F, returnSchoolYearID = F, returnSearchConditionFilter = 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("Gradebook", "CourseGradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CourseGradingScaleGroup
#'
#' This function returns fields for a CourseGradingScaleGroup.
#'
#' @param CourseGradingScaleGroupID The id of the CourseGradingScaleGroup.\cr Run \code{\link{getAllCourseGradingScaleGroups}} for a list of CourseGradingScaleGroups.
#' @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 Gradebook
#' @return Details for the CourseGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCourseGradingScaleGroup <- function(CourseGradingScaleGroupID, EntityID = 1, returnCourseGradingScaleGroupID = F, returnAllowSectionOverride = F, returnCourseGradingScaleGroupIDClonedFrom = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnFilter = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnLimitTeacherOverridesToGradeMarksInGroup = F, returnModifiedTime = F, returnRank = F, returnSchoolYearID = F, returnSearchConditionFilter = 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("Gradebook", "CourseGradingScaleGroup", CourseGradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific CourseGradingScaleGroup
#'
#' This function modifies fields for a CourseGradingScaleGroup.
#'
#' @param CourseGradingScaleGroupID The id of the CourseGradingScaleGroup to be modified.\cr Run \code{\link{getAllCourseGradingScaleGroups}} for a list of CourseGradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified CourseGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCourseGradingScaleGroup <- function(CourseGradingScaleGroupID, EntityID = 1, setAllowSectionOverride = NULL, setCourseGradingScaleGroupIDClonedFrom = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFilter = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = NULL, setLimitTeacherOverridesToGradeMarksInGroup = NULL, setRank = NULL, setSchoolYearID = NULL, setSearchConditionFilter = 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("Gradebook", "CourseGradingScaleGroup", CourseGradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new CourseGradingScaleGroup.
#'
#' This function creates a new CourseGradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CourseGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCourseGradingScaleGroup <- function(EntityID = 1, setAllowSectionOverride = NULL, setCourseGradingScaleGroupIDClonedFrom = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setFilter = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = NULL, setLimitTeacherOverridesToGradeMarksInGroup = NULL, setRank = NULL, setSchoolYearID = NULL, setSearchConditionFilter = 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("Gradebook", "CourseGradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CourseGradingScaleGroup
#'
#' This function deletes a CourseGradingScaleGroup.
#'
#' @param CourseGradingScaleGroupID The id of the CourseGradingScaleGroup.\cr Run \code{\link{getAllCourseGradingScaleGroups}} for a list of CourseGradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CourseGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCourseGradingScaleGroup <- function(CourseGradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CourseGradingScaleGroup", CourseGradingScaleGroupID, EntityID)
}
#' Get all CourseGradingScaleGroupCourses.
#'
#' This function returns a dataframe of all CourseGradingScaleGroupCourses 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 Gradebook
#' @return All CourseGradingScaleGroupCourses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCourseGradingScaleGroupCourses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCourseGradingScaleGroupCourseID = F, returnCourseGradingScaleGroupID = F, returnCourseID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Gradebook", "CourseGradingScaleGroupCourse", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CourseGradingScaleGroupCourse
#'
#' This function returns fields for a CourseGradingScaleGroupCourse.
#'
#' @param CourseGradingScaleGroupCourseID The id of the CourseGradingScaleGroupCourse.\cr Run \code{\link{getAllCourseGradingScaleGroupCourses}} for a list of CourseGradingScaleGroupCourses.
#' @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 Gradebook
#' @return Details for the CourseGradingScaleGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCourseGradingScaleGroupCourse <- function(CourseGradingScaleGroupCourseID, EntityID = 1, returnCourseGradingScaleGroupCourseID = F, returnCourseGradingScaleGroupID = F, returnCourseID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Gradebook", "CourseGradingScaleGroupCourse", CourseGradingScaleGroupCourseID, searchFields, EntityID)
}
#' Modify a specific CourseGradingScaleGroupCourse
#'
#' This function modifies fields for a CourseGradingScaleGroupCourse.
#'
#' @param CourseGradingScaleGroupCourseID The id of the CourseGradingScaleGroupCourse to be modified.\cr Run \code{\link{getAllCourseGradingScaleGroupCourses}} for a list of CourseGradingScaleGroupCourses.
#' @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 Gradebook
#' @return Details of the modified CourseGradingScaleGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCourseGradingScaleGroupCourse <- function(CourseGradingScaleGroupCourseID, EntityID = 1, setCourseGradingScaleGroupID = NULL, setCourseID = 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("Gradebook", "CourseGradingScaleGroupCourse", CourseGradingScaleGroupCourseID, names(functionParams), functionParams, EntityID)
}
#' Create new CourseGradingScaleGroupCourse.
#'
#' This function creates a new CourseGradingScaleGroupCourse.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created CourseGradingScaleGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCourseGradingScaleGroupCourse <- function(EntityID = 1, setCourseGradingScaleGroupID = NULL, setCourseID = 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("Gradebook", "CourseGradingScaleGroupCourse", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CourseGradingScaleGroupCourse
#'
#' This function deletes a CourseGradingScaleGroupCourse.
#'
#' @param CourseGradingScaleGroupCourseID The id of the CourseGradingScaleGroupCourse.\cr Run \code{\link{getAllCourseGradingScaleGroupCourses}} for a list of CourseGradingScaleGroupCourses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted CourseGradingScaleGroupCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCourseGradingScaleGroupCourse <- function(CourseGradingScaleGroupCourseID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "CourseGradingScaleGroupCourse", CourseGradingScaleGroupCourseID, EntityID)
}
#' Get all DropLowScoreRuns.
#'
#' This function returns a dataframe of all DropLowScoreRuns 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 Gradebook
#' @return All DropLowScoreRuns in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDropLowScoreRuns <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDropLowScoreRunID = F, returnAffectedStudentAssignmentCount = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnIsEffective = F, returnModifiedTime = F, returnRunTime = F, returnSectionID = 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("Gradebook", "DropLowScoreRun", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DropLowScoreRun
#'
#' This function returns fields for a DropLowScoreRun.
#'
#' @param DropLowScoreRunID The id of the DropLowScoreRun.\cr Run \code{\link{getAllDropLowScoreRuns}} for a list of DropLowScoreRuns.
#' @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 Gradebook
#' @return Details for the DropLowScoreRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDropLowScoreRun <- function(DropLowScoreRunID, EntityID = 1, returnDropLowScoreRunID = F, returnAffectedStudentAssignmentCount = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnIsEffective = F, returnModifiedTime = F, returnRunTime = F, returnSectionID = 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("Gradebook", "DropLowScoreRun", DropLowScoreRunID, searchFields, EntityID)
}
#' Modify a specific DropLowScoreRun
#'
#' This function modifies fields for a DropLowScoreRun.
#'
#' @param DropLowScoreRunID The id of the DropLowScoreRun to be modified.\cr Run \code{\link{getAllDropLowScoreRuns}} for a list of DropLowScoreRuns.
#' @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 Gradebook
#' @return Details of the modified DropLowScoreRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDropLowScoreRun <- function(DropLowScoreRunID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setIsEffective = NULL, setRunTime = NULL, setSectionID = 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("Gradebook", "DropLowScoreRun", DropLowScoreRunID, names(functionParams), functionParams, EntityID)
}
#' Create new DropLowScoreRun.
#'
#' This function creates a new DropLowScoreRun.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created DropLowScoreRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDropLowScoreRun <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setIsEffective = NULL, setRunTime = NULL, setSectionID = 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("Gradebook", "DropLowScoreRun", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DropLowScoreRun
#'
#' This function deletes a DropLowScoreRun.
#'
#' @param DropLowScoreRunID The id of the DropLowScoreRun.\cr Run \code{\link{getAllDropLowScoreRuns}} for a list of DropLowScoreRuns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted DropLowScoreRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDropLowScoreRun <- function(DropLowScoreRunID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "DropLowScoreRun", DropLowScoreRunID, EntityID)
}
#' Get all DropLowScoreRunStudentAssignments.
#'
#' This function returns a dataframe of all DropLowScoreRunStudentAssignments 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 Gradebook
#' @return All DropLowScoreRunStudentAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDropLowScoreRunStudentAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDropLowScoreRunStudentAssignmentID = F, returnCreatedTime = F, returnDropActionType = F, returnDropActionTypeCode = F, returnDropLowScoreRunID = F, returnModifiedTime = F, returnStudentAssignmentID = 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("Gradebook", "DropLowScoreRunStudentAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DropLowScoreRunStudentAssignment
#'
#' This function returns fields for a DropLowScoreRunStudentAssignment.
#'
#' @param DropLowScoreRunStudentAssignmentID The id of the DropLowScoreRunStudentAssignment.\cr Run \code{\link{getAllDropLowScoreRunStudentAssignments}} for a list of DropLowScoreRunStudentAssignments.
#' @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 Gradebook
#' @return Details for the DropLowScoreRunStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDropLowScoreRunStudentAssignment <- function(DropLowScoreRunStudentAssignmentID, EntityID = 1, returnDropLowScoreRunStudentAssignmentID = F, returnCreatedTime = F, returnDropActionType = F, returnDropActionTypeCode = F, returnDropLowScoreRunID = F, returnModifiedTime = F, returnStudentAssignmentID = 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("Gradebook", "DropLowScoreRunStudentAssignment", DropLowScoreRunStudentAssignmentID, searchFields, EntityID)
}
#' Modify a specific DropLowScoreRunStudentAssignment
#'
#' This function modifies fields for a DropLowScoreRunStudentAssignment.
#'
#' @param DropLowScoreRunStudentAssignmentID The id of the DropLowScoreRunStudentAssignment to be modified.\cr Run \code{\link{getAllDropLowScoreRunStudentAssignments}} for a list of DropLowScoreRunStudentAssignments.
#' @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 Gradebook
#' @return Details of the modified DropLowScoreRunStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDropLowScoreRunStudentAssignment <- function(DropLowScoreRunStudentAssignmentID, EntityID = 1, setDropActionType = NULL, setDropActionTypeCode = NULL, setDropLowScoreRunID = NULL, setStudentAssignmentID = 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("Gradebook", "DropLowScoreRunStudentAssignment", DropLowScoreRunStudentAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new DropLowScoreRunStudentAssignment.
#'
#' This function creates a new DropLowScoreRunStudentAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created DropLowScoreRunStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDropLowScoreRunStudentAssignment <- function(EntityID = 1, setDropActionType = NULL, setDropActionTypeCode = NULL, setDropLowScoreRunID = NULL, setStudentAssignmentID = 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("Gradebook", "DropLowScoreRunStudentAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DropLowScoreRunStudentAssignment
#'
#' This function deletes a DropLowScoreRunStudentAssignment.
#'
#' @param DropLowScoreRunStudentAssignmentID The id of the DropLowScoreRunStudentAssignment.\cr Run \code{\link{getAllDropLowScoreRunStudentAssignments}} for a list of DropLowScoreRunStudentAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted DropLowScoreRunStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDropLowScoreRunStudentAssignment <- function(DropLowScoreRunStudentAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "DropLowScoreRunStudentAssignment", DropLowScoreRunStudentAssignmentID, EntityID)
}
#' Get all GradesheetAssignmentSettings.
#'
#' This function returns a dataframe of all GradesheetAssignmentSettings 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 Gradebook
#' @return All GradesheetAssignmentSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllGradesheetAssignmentSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnGradesheetAssignmentSettingID = F, returnCreatedTime = F, returnDefaultAttemptType = F, returnDefaultAttemptTypeCode = F, returnIsDateAscending = F, returnMaxScoreDefault = F, returnModifiedTime = F, returnSortBy = F, returnSortByCode = F, returnTeacherSectionSettingID = 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("Gradebook", "GradesheetAssignmentSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific GradesheetAssignmentSetting
#'
#' This function returns fields for a GradesheetAssignmentSetting.
#'
#' @param GradesheetAssignmentSettingID The id of the GradesheetAssignmentSetting.\cr Run \code{\link{getAllGradesheetAssignmentSettings}} for a list of GradesheetAssignmentSettings.
#' @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 Gradebook
#' @return Details for the GradesheetAssignmentSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getGradesheetAssignmentSetting <- function(GradesheetAssignmentSettingID, EntityID = 1, returnGradesheetAssignmentSettingID = F, returnCreatedTime = F, returnDefaultAttemptType = F, returnDefaultAttemptTypeCode = F, returnIsDateAscending = F, returnMaxScoreDefault = F, returnModifiedTime = F, returnSortBy = F, returnSortByCode = F, returnTeacherSectionSettingID = 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("Gradebook", "GradesheetAssignmentSetting", GradesheetAssignmentSettingID, searchFields, EntityID)
}
#' Modify a specific GradesheetAssignmentSetting
#'
#' This function modifies fields for a GradesheetAssignmentSetting.
#'
#' @param GradesheetAssignmentSettingID The id of the GradesheetAssignmentSetting to be modified.\cr Run \code{\link{getAllGradesheetAssignmentSettings}} for a list of GradesheetAssignmentSettings.
#' @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 Gradebook
#' @return Details of the modified GradesheetAssignmentSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyGradesheetAssignmentSetting <- function(GradesheetAssignmentSettingID, EntityID = 1, setDefaultAttemptType = NULL, setDefaultAttemptTypeCode = NULL, setIsDateAscending = NULL, setMaxScoreDefault = NULL, setSortBy = NULL, setSortByCode = NULL, setTeacherSectionSettingID = 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("Gradebook", "GradesheetAssignmentSetting", GradesheetAssignmentSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new GradesheetAssignmentSetting.
#'
#' This function creates a new GradesheetAssignmentSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created GradesheetAssignmentSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createGradesheetAssignmentSetting <- function(EntityID = 1, setDefaultAttemptType = NULL, setDefaultAttemptTypeCode = NULL, setIsDateAscending = NULL, setMaxScoreDefault = NULL, setSortBy = NULL, setSortByCode = NULL, setTeacherSectionSettingID = 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("Gradebook", "GradesheetAssignmentSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific GradesheetAssignmentSetting
#'
#' This function deletes a GradesheetAssignmentSetting.
#'
#' @param GradesheetAssignmentSettingID The id of the GradesheetAssignmentSetting.\cr Run \code{\link{getAllGradesheetAssignmentSettings}} for a list of GradesheetAssignmentSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted GradesheetAssignmentSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteGradesheetAssignmentSetting <- function(GradesheetAssignmentSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "GradesheetAssignmentSetting", GradesheetAssignmentSettingID, EntityID)
}
#' Get all GradingScaleGroups.
#'
#' This function returns a dataframe of all GradingScaleGroups 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 Gradebook
#' @return All GradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnGradingScaleGroupID = F, returnCreatedTime = F, returnDescription = F, returnDisplayGradeMarkPercentages = F, returnEntityGroupKey = F, returnEntityID = F, returnGradeMarkIDMastered = F, returnGradingScaleGroupExistsInSpecifcEntity = F, returnGradingScaleGroupIDClonedFrom = F, returnGradingScaleType = F, returnGradingScaleTypeCode = F, returnHasAcademicStandardGradingScaleGroups = F, returnHasCourseGradingScaleGroups = F, returnHasSectionGradingScaleGroups = F, returnHasStudentGradingScaleGroups = F, returnHasSubjectGradingScaleGroups = F, returnIsAHistoricRecord = F, returnIsDefaultAcademicStandardGradingScaleGroup = F, returnIsDefaultSubjectGradingScaleGroup = F, returnIsDummySectionContainer = F, returnIsPointsBasedScale = F, returnIsSectionRelatedGradingScaleGroup = F, returnMaxScore = F, returnModifiedTime = F, returnSchoolYearID = F, returnSectionIDTeacherOverride = F, returnUseAsMastery = 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("Gradebook", "GradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific GradingScaleGroup
#'
#' This function returns fields for a GradingScaleGroup.
#'
#' @param GradingScaleGroupID The id of the GradingScaleGroup.\cr Run \code{\link{getAllGradingScaleGroups}} for a list of GradingScaleGroups.
#' @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 Gradebook
#' @return Details for the GradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getGradingScaleGroup <- function(GradingScaleGroupID, EntityID = 1, returnGradingScaleGroupID = F, returnCreatedTime = F, returnDescription = F, returnDisplayGradeMarkPercentages = F, returnEntityGroupKey = F, returnEntityID = F, returnGradeMarkIDMastered = F, returnGradingScaleGroupExistsInSpecifcEntity = F, returnGradingScaleGroupIDClonedFrom = F, returnGradingScaleType = F, returnGradingScaleTypeCode = F, returnHasAcademicStandardGradingScaleGroups = F, returnHasCourseGradingScaleGroups = F, returnHasSectionGradingScaleGroups = F, returnHasStudentGradingScaleGroups = F, returnHasSubjectGradingScaleGroups = F, returnIsAHistoricRecord = F, returnIsDefaultAcademicStandardGradingScaleGroup = F, returnIsDefaultSubjectGradingScaleGroup = F, returnIsDummySectionContainer = F, returnIsPointsBasedScale = F, returnIsSectionRelatedGradingScaleGroup = F, returnMaxScore = F, returnModifiedTime = F, returnSchoolYearID = F, returnSectionIDTeacherOverride = F, returnUseAsMastery = 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("Gradebook", "GradingScaleGroup", GradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific GradingScaleGroup
#'
#' This function modifies fields for a GradingScaleGroup.
#'
#' @param GradingScaleGroupID The id of the GradingScaleGroup to be modified.\cr Run \code{\link{getAllGradingScaleGroups}} for a list of GradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified GradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyGradingScaleGroup <- function(GradingScaleGroupID, EntityID = 1, setDescription = NULL, setDisplayGradeMarkPercentages = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setGradeMarkIDMastered = NULL, setGradingScaleGroupIDClonedFrom = NULL, setGradingScaleType = NULL, setGradingScaleTypeCode = NULL, setIsDefaultAcademicStandardGradingScaleGroup = NULL, setIsDefaultSubjectGradingScaleGroup = NULL, setIsPointsBasedScale = NULL, setMaxScore = NULL, setSchoolYearID = NULL, setSectionIDTeacherOverride = NULL, setUseAsMastery = 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("Gradebook", "GradingScaleGroup", GradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new GradingScaleGroup.
#'
#' This function creates a new GradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created GradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createGradingScaleGroup <- function(EntityID = 1, setDescription = NULL, setDisplayGradeMarkPercentages = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setGradeMarkIDMastered = NULL, setGradingScaleGroupIDClonedFrom = NULL, setGradingScaleType = NULL, setGradingScaleTypeCode = NULL, setIsDefaultAcademicStandardGradingScaleGroup = NULL, setIsDefaultSubjectGradingScaleGroup = NULL, setIsPointsBasedScale = NULL, setMaxScore = NULL, setSchoolYearID = NULL, setSectionIDTeacherOverride = NULL, setUseAsMastery = 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("Gradebook", "GradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific GradingScaleGroup
#'
#' This function deletes a GradingScaleGroup.
#'
#' @param GradingScaleGroupID The id of the GradingScaleGroup.\cr Run \code{\link{getAllGradingScaleGroups}} for a list of GradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted GradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteGradingScaleGroup <- function(GradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "GradingScaleGroup", GradingScaleGroupID, EntityID)
}
#' Get all GradingScaleGroupGradeMarks.
#'
#' This function returns a dataframe of all GradingScaleGroupGradeMarks 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 Gradebook
#' @return All GradingScaleGroupGradeMarks in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllGradingScaleGroupGradeMarks <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnGradingScaleGroupGradeMarkID = F, returnAllowSubjective = F, returnColor = F, returnCreatedTime = F, returnDefaultCalculationPercent = F, returnDefaultCalculationPoints = F, returnEntityGroupKey = F, returnGradeMarkID = F, returnGradingScaleGroupGradeMarkIDClonedFrom = F, returnGradingScaleGroupID = F, returnModifiedTime = F, returnPercentHigh = F, returnPercentLow = F, returnPointsHigh = F, returnPointsLow = 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("Gradebook", "GradingScaleGroupGradeMark", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific GradingScaleGroupGradeMark
#'
#' This function returns fields for a GradingScaleGroupGradeMark.
#'
#' @param GradingScaleGroupGradeMarkID The id of the GradingScaleGroupGradeMark.\cr Run \code{\link{getAllGradingScaleGroupGradeMarks}} for a list of GradingScaleGroupGradeMarks.
#' @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 Gradebook
#' @return Details for the GradingScaleGroupGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getGradingScaleGroupGradeMark <- function(GradingScaleGroupGradeMarkID, EntityID = 1, returnGradingScaleGroupGradeMarkID = F, returnAllowSubjective = F, returnColor = F, returnCreatedTime = F, returnDefaultCalculationPercent = F, returnDefaultCalculationPoints = F, returnEntityGroupKey = F, returnGradeMarkID = F, returnGradingScaleGroupGradeMarkIDClonedFrom = F, returnGradingScaleGroupID = F, returnModifiedTime = F, returnPercentHigh = F, returnPercentLow = F, returnPointsHigh = F, returnPointsLow = 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("Gradebook", "GradingScaleGroupGradeMark", GradingScaleGroupGradeMarkID, searchFields, EntityID)
}
#' Modify a specific GradingScaleGroupGradeMark
#'
#' This function modifies fields for a GradingScaleGroupGradeMark.
#'
#' @param GradingScaleGroupGradeMarkID The id of the GradingScaleGroupGradeMark to be modified.\cr Run \code{\link{getAllGradingScaleGroupGradeMarks}} for a list of GradingScaleGroupGradeMarks.
#' @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 Gradebook
#' @return Details of the modified GradingScaleGroupGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyGradingScaleGroupGradeMark <- function(GradingScaleGroupGradeMarkID, EntityID = 1, setAllowSubjective = NULL, setColor = NULL, setDefaultCalculationPercent = NULL, setDefaultCalculationPoints = NULL, setEntityGroupKey = NULL, setGradeMarkID = NULL, setGradingScaleGroupGradeMarkIDClonedFrom = NULL, setGradingScaleGroupID = NULL, setPercentHigh = NULL, setPercentLow = NULL, setPointsHigh = NULL, setPointsLow = 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("Gradebook", "GradingScaleGroupGradeMark", GradingScaleGroupGradeMarkID, names(functionParams), functionParams, EntityID)
}
#' Create new GradingScaleGroupGradeMark.
#'
#' This function creates a new GradingScaleGroupGradeMark.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created GradingScaleGroupGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createGradingScaleGroupGradeMark <- function(EntityID = 1, setAllowSubjective = NULL, setColor = NULL, setDefaultCalculationPercent = NULL, setDefaultCalculationPoints = NULL, setEntityGroupKey = NULL, setGradeMarkID = NULL, setGradingScaleGroupGradeMarkIDClonedFrom = NULL, setGradingScaleGroupID = NULL, setPercentHigh = NULL, setPercentLow = NULL, setPointsHigh = NULL, setPointsLow = 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("Gradebook", "GradingScaleGroupGradeMark", names(functionParams), functionParams, EntityID)
}
#' Delete a specific GradingScaleGroupGradeMark
#'
#' This function deletes a GradingScaleGroupGradeMark.
#'
#' @param GradingScaleGroupGradeMarkID The id of the GradingScaleGroupGradeMark.\cr Run \code{\link{getAllGradingScaleGroupGradeMarks}} for a list of GradingScaleGroupGradeMarks.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted GradingScaleGroupGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteGradingScaleGroupGradeMark <- function(GradingScaleGroupGradeMarkID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "GradingScaleGroupGradeMark", GradingScaleGroupGradeMarkID, EntityID)
}
#' Get all MonitorSummaryByClasses.
#'
#' This function returns a dataframe of all MonitorSummaryByClasses 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 Gradebook
#' @return All MonitorSummaryByClasses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllMonitorSummaryByClasses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMonitorSummaryByClassID = F, returnAssignmentCountForTerm = F, returnAssignmentCountYTD = F, returnClosedGradingPeriodGradeChangeCount = F, returnCreatedTime = F, returnCurrentGradingPeriod = F, returnExcusedAbsencesYTD = F, returnFutureAssignmentCountForTerm = F, returnGradedAssignmentCountForTerm = F, returnLastAccessedGradebookTime = F, returnLastScoredGradebookTime = F, returnLastUpdatedTime = F, returnMissingAssignmentCountForTerm = F, returnModifiedTime = F, returnNoCountAssignmentCountForTerm = F, returnNonGradedAssignmentCountForTerm = F, returnOffenseCountYTD = F, returnOtherAbsencesYTD = F, returnScoreClarifierAssignmentCountForTerm = F, returnScoredAssignmentRange0CurrentTerm = F, returnScoredAssignmentRange100to90CurrentTerm = F, returnScoredAssignmentRange49to1CurrentTerm = F, returnScoredAssignmentRange59to50CurrentTerm = F, returnScoredAssignmentRange69to60CurrentTerm = F, returnScoredAssignmentRange79to70CurrentTerm = F, returnScoredAssignmentRange89to80CurrentTerm = F, returnStaffMeetID = F, returnStudentCountForTerm = F, returnTardiesYTD = F, returnUnexcusedAbsencesYTD = 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("Gradebook", "MonitorSummaryByClass", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific MonitorSummaryByClass
#'
#' This function returns fields for a MonitorSummaryByClass.
#'
#' @param MonitorSummaryByClassID The id of the MonitorSummaryByClass.\cr Run \code{\link{getAllMonitorSummaryByClasses}} for a list of MonitorSummaryByClasses.
#' @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 Gradebook
#' @return Details for the MonitorSummaryByClass.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getMonitorSummaryByClass <- function(MonitorSummaryByClassID, EntityID = 1, returnMonitorSummaryByClassID = F, returnAssignmentCountForTerm = F, returnAssignmentCountYTD = F, returnClosedGradingPeriodGradeChangeCount = F, returnCreatedTime = F, returnCurrentGradingPeriod = F, returnExcusedAbsencesYTD = F, returnFutureAssignmentCountForTerm = F, returnGradedAssignmentCountForTerm = F, returnLastAccessedGradebookTime = F, returnLastScoredGradebookTime = F, returnLastUpdatedTime = F, returnMissingAssignmentCountForTerm = F, returnModifiedTime = F, returnNoCountAssignmentCountForTerm = F, returnNonGradedAssignmentCountForTerm = F, returnOffenseCountYTD = F, returnOtherAbsencesYTD = F, returnScoreClarifierAssignmentCountForTerm = F, returnScoredAssignmentRange0CurrentTerm = F, returnScoredAssignmentRange100to90CurrentTerm = F, returnScoredAssignmentRange49to1CurrentTerm = F, returnScoredAssignmentRange59to50CurrentTerm = F, returnScoredAssignmentRange69to60CurrentTerm = F, returnScoredAssignmentRange79to70CurrentTerm = F, returnScoredAssignmentRange89to80CurrentTerm = F, returnStaffMeetID = F, returnStudentCountForTerm = F, returnTardiesYTD = F, returnUnexcusedAbsencesYTD = 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("Gradebook", "MonitorSummaryByClass", MonitorSummaryByClassID, searchFields, EntityID)
}
#' Modify a specific MonitorSummaryByClass
#'
#' This function modifies fields for a MonitorSummaryByClass.
#'
#' @param MonitorSummaryByClassID The id of the MonitorSummaryByClass to be modified.\cr Run \code{\link{getAllMonitorSummaryByClasses}} for a list of MonitorSummaryByClass.
#' @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 Gradebook
#' @return Details of the modified MonitorSummaryByClass.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyMonitorSummaryByClass <- function(MonitorSummaryByClassID, EntityID = 1, setAssignmentCountForTerm = NULL, setAssignmentCountYTD = NULL, setClosedGradingPeriodGradeChangeCount = NULL, setCurrentGradingPeriod = NULL, setExcusedAbsencesYTD = NULL, setFutureAssignmentCountForTerm = NULL, setGradedAssignmentCountForTerm = NULL, setLastAccessedGradebookTime = NULL, setLastScoredGradebookTime = NULL, setMissingAssignmentCountForTerm = NULL, setNoCountAssignmentCountForTerm = NULL, setNonGradedAssignmentCountForTerm = NULL, setOffenseCountYTD = NULL, setOtherAbsencesYTD = NULL, setScoreClarifierAssignmentCountForTerm = NULL, setScoredAssignmentRange0CurrentTerm = NULL, setScoredAssignmentRange100to90CurrentTerm = NULL, setScoredAssignmentRange49to1CurrentTerm = NULL, setScoredAssignmentRange59to50CurrentTerm = NULL, setScoredAssignmentRange69to60CurrentTerm = NULL, setScoredAssignmentRange79to70CurrentTerm = NULL, setScoredAssignmentRange89to80CurrentTerm = NULL, setStudentCountForTerm = NULL, setTardiesYTD = NULL, setUnexcusedAbsencesYTD = 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("Gradebook", "MonitorSummaryByClass", MonitorSummaryByClassID, names(functionParams), functionParams, EntityID)
}
#' Create new MonitorSummaryByClass.
#'
#' This function creates a new MonitorSummaryByClass.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created MonitorSummaryByClass.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createMonitorSummaryByClass <- function(EntityID = 1, setAssignmentCountForTerm = NULL, setAssignmentCountYTD = NULL, setClosedGradingPeriodGradeChangeCount = NULL, setCurrentGradingPeriod = NULL, setExcusedAbsencesYTD = NULL, setFutureAssignmentCountForTerm = NULL, setGradedAssignmentCountForTerm = NULL, setLastAccessedGradebookTime = NULL, setLastScoredGradebookTime = NULL, setMissingAssignmentCountForTerm = NULL, setNoCountAssignmentCountForTerm = NULL, setNonGradedAssignmentCountForTerm = NULL, setOffenseCountYTD = NULL, setOtherAbsencesYTD = NULL, setScoreClarifierAssignmentCountForTerm = NULL, setScoredAssignmentRange0CurrentTerm = NULL, setScoredAssignmentRange100to90CurrentTerm = NULL, setScoredAssignmentRange49to1CurrentTerm = NULL, setScoredAssignmentRange59to50CurrentTerm = NULL, setScoredAssignmentRange69to60CurrentTerm = NULL, setScoredAssignmentRange79to70CurrentTerm = NULL, setScoredAssignmentRange89to80CurrentTerm = NULL, setStudentCountForTerm = NULL, setTardiesYTD = NULL, setUnexcusedAbsencesYTD = 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("Gradebook", "MonitorSummaryByClass", names(functionParams), functionParams, EntityID)
}
#' Delete a specific MonitorSummaryByClass
#'
#' This function deletes a MonitorSummaryByClass.
#'
#' @param MonitorSummaryByClassID The id of the MonitorSummaryByClass.\cr Run \code{\link{getAllMonitorSummaryByClasses}} for a list of MonitorSummaryByClasses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted MonitorSummaryByClass.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteMonitorSummaryByClass <- function(MonitorSummaryByClassID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "MonitorSummaryByClass", MonitorSummaryByClassID, EntityID)
}
#' Get all MonitorSummaryByTeachers.
#'
#' This function returns a dataframe of all MonitorSummaryByTeachers 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 Gradebook
#' @return All MonitorSummaryByTeachers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllMonitorSummaryByTeachers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMonitorSummaryByTeacherID = F, returnActiveStudentCount = F, returnAssignmentCountForTerm = F, returnCreatedTime = F, returnFutureAssignmentCountForTerm = F, returnGradedAssignmentCountForTerm = F, returnLastAccessedGradebookTime = F, returnLastAssignmentScoredDueDate = F, returnLastScoredAssignmentTime = F, returnLastUpdatedTime = F, returnMissingAssignmentCountForTerm = F, returnModifiedTime = F, returnNoCountAssignmentCountForTerm = F, returnNonGradedAssignmentCountForTerm = F, returnNonGradedAssignmentCountNoStudentAssignmentsForTerm = F, returnSchoolYearID = F, returnScoreClarifierAssignmentCountForTerm = F, returnStaffID = F, returnStaffMeetCount = 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("Gradebook", "MonitorSummaryByTeacher", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific MonitorSummaryByTeacher
#'
#' This function returns fields for a MonitorSummaryByTeacher.
#'
#' @param MonitorSummaryByTeacherID The id of the MonitorSummaryByTeacher.\cr Run \code{\link{getAllMonitorSummaryByTeachers}} for a list of MonitorSummaryByTeachers.
#' @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 Gradebook
#' @return Details for the MonitorSummaryByTeacher.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getMonitorSummaryByTeacher <- function(MonitorSummaryByTeacherID, EntityID = 1, returnMonitorSummaryByTeacherID = F, returnActiveStudentCount = F, returnAssignmentCountForTerm = F, returnCreatedTime = F, returnFutureAssignmentCountForTerm = F, returnGradedAssignmentCountForTerm = F, returnLastAccessedGradebookTime = F, returnLastAssignmentScoredDueDate = F, returnLastScoredAssignmentTime = F, returnLastUpdatedTime = F, returnMissingAssignmentCountForTerm = F, returnModifiedTime = F, returnNoCountAssignmentCountForTerm = F, returnNonGradedAssignmentCountForTerm = F, returnNonGradedAssignmentCountNoStudentAssignmentsForTerm = F, returnSchoolYearID = F, returnScoreClarifierAssignmentCountForTerm = F, returnStaffID = F, returnStaffMeetCount = 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("Gradebook", "MonitorSummaryByTeacher", MonitorSummaryByTeacherID, searchFields, EntityID)
}
#' Modify a specific MonitorSummaryByTeacher
#'
#' This function modifies fields for a MonitorSummaryByTeacher.
#'
#' @param MonitorSummaryByTeacherID The id of the MonitorSummaryByTeacher to be modified.\cr Run \code{\link{getAllMonitorSummaryByTeachers}} for a list of MonitorSummaryByTeachers.
#' @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 Gradebook
#' @return Details of the modified MonitorSummaryByTeacher.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyMonitorSummaryByTeacher <- function(MonitorSummaryByTeacherID, EntityID = 1, setActiveStudentCount = NULL, setAssignmentCountForTerm = NULL, setFutureAssignmentCountForTerm = NULL, setGradedAssignmentCountForTerm = NULL, setLastAccessedGradebookTime = NULL, setLastAssignmentScoredDueDate = NULL, setLastScoredAssignmentTime = NULL, setMissingAssignmentCountForTerm = NULL, setNoCountAssignmentCountForTerm = NULL, setNonGradedAssignmentCountForTerm = NULL, setNonGradedAssignmentCountNoStudentAssignmentsForTerm = NULL, setScoreClarifierAssignmentCountForTerm = NULL, setStaffID = NULL, setStaffMeetCount = 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("Gradebook", "MonitorSummaryByTeacher", MonitorSummaryByTeacherID, names(functionParams), functionParams, EntityID)
}
#' Create new MonitorSummaryByTeacher.
#'
#' This function creates a new MonitorSummaryByTeacher.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created MonitorSummaryByTeacher.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createMonitorSummaryByTeacher <- function(EntityID = 1, setActiveStudentCount = NULL, setAssignmentCountForTerm = NULL, setFutureAssignmentCountForTerm = NULL, setGradedAssignmentCountForTerm = NULL, setLastAccessedGradebookTime = NULL, setLastAssignmentScoredDueDate = NULL, setLastScoredAssignmentTime = NULL, setMissingAssignmentCountForTerm = NULL, setNoCountAssignmentCountForTerm = NULL, setNonGradedAssignmentCountForTerm = NULL, setNonGradedAssignmentCountNoStudentAssignmentsForTerm = NULL, setScoreClarifierAssignmentCountForTerm = NULL, setStaffID = NULL, setStaffMeetCount = 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("Gradebook", "MonitorSummaryByTeacher", names(functionParams), functionParams, EntityID)
}
#' Delete a specific MonitorSummaryByTeacher
#'
#' This function deletes a MonitorSummaryByTeacher.
#'
#' @param MonitorSummaryByTeacherID The id of the MonitorSummaryByTeacher.\cr Run \code{\link{getAllMonitorSummaryByTeachers}} for a list of MonitorSummaryByTeachers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted MonitorSummaryByTeacher.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteMonitorSummaryByTeacher <- function(MonitorSummaryByTeacherID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "MonitorSummaryByTeacher", MonitorSummaryByTeacherID, EntityID)
}
#' Get all Questions.
#'
#' This function returns a dataframe of all Questions 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 Gradebook
#' @return All Questions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQuestions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQuestionID = F, returnAllowStudentAttachments = F, returnAssignmentCount = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCreatedTime = F, returnDescription = F, returnHasAssignmentPastEndTime = F, returnHasAutoScoredAssignment = F, returnHasInstructions = F, returnHasMultipleAssignments = F, returnHasQuestionMedias = F, returnInstructions = F, returnIsEssay = F, returnIsMatching = F, returnIsMultipleChoice = F, returnIsShortAnswer = F, returnIsTrueFalse = F, returnModifiedTime = F, returnStaffID = F, returnType = F, returnTypeCode = F, returnUseAnswers = 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("Gradebook", "Question", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Question
#'
#' This function returns fields for a Question.
#'
#' @param QuestionID The id of the Question.\cr Run \code{\link{getAllQuestions}} for a list of Questions.
#' @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 Gradebook
#' @return Details for the Question.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQuestion <- function(QuestionID, EntityID = 1, returnQuestionID = F, returnAllowStudentAttachments = F, returnAssignmentCount = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCreatedTime = F, returnDescription = F, returnHasAssignmentPastEndTime = F, returnHasAutoScoredAssignment = F, returnHasInstructions = F, returnHasMultipleAssignments = F, returnHasQuestionMedias = F, returnInstructions = F, returnIsEssay = F, returnIsMatching = F, returnIsMultipleChoice = F, returnIsShortAnswer = F, returnIsTrueFalse = F, returnModifiedTime = F, returnStaffID = F, returnType = F, returnTypeCode = F, returnUseAnswers = 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("Gradebook", "Question", QuestionID, searchFields, EntityID)
}
#' Modify a specific Question
#'
#' This function modifies fields for a Question.
#'
#' @param QuestionID The id of the Question to be modified.\cr Run \code{\link{getAllQuestions}} for a list of Questions.
#' @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 Gradebook
#' @return Details of the modified Question.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQuestion <- function(QuestionID, EntityID = 1, setAllowStudentAttachments = NULL, setDescription = NULL, setInstructions = NULL, setStaffID = NULL, setType = NULL, setTypeCode = 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("Gradebook", "Question", QuestionID, names(functionParams), functionParams, EntityID)
}
#' Create new Question.
#'
#' This function creates a new Question.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created Question.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQuestion <- function(EntityID = 1, setAllowStudentAttachments = NULL, setDescription = NULL, setInstructions = NULL, setStaffID = NULL, setType = NULL, setTypeCode = 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("Gradebook", "Question", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Question
#'
#' This function deletes a Question.
#'
#' @param QuestionID The id of the Question.\cr Run \code{\link{getAllQuestions}} for a list of Questions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted Question.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQuestion <- function(QuestionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "Question", QuestionID, EntityID)
}
#' Get all QuestionAnswers.
#'
#' This function returns a dataframe of all QuestionAnswers 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 Gradebook
#' @return All QuestionAnswers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQuestionAnswers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQuestionAnswerID = F, returnChoice = F, returnChoiceOrder = F, returnCreatedTime = F, returnHasAttachedChoiceMedia = F, returnHasAttachedChoiceMediaSafe = F, returnHasAttachedMedia = F, returnHasAttachedMediaSafe = F, returnIsCorrect = F, returnIsEssay = F, returnIsMultipleChoice = F, returnIsShortAnswer = F, returnIsTrueFalse = F, returnModifiedTime = F, returnQuestionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnValue = F, returnValueOrder = 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("Gradebook", "QuestionAnswer", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific QuestionAnswer
#'
#' This function returns fields for a QuestionAnswer.
#'
#' @param QuestionAnswerID The id of the QuestionAnswer.\cr Run \code{\link{getAllQuestionAnswers}} for a list of QuestionAnswers.
#' @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 Gradebook
#' @return Details for the QuestionAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQuestionAnswer <- function(QuestionAnswerID, EntityID = 1, returnQuestionAnswerID = F, returnChoice = F, returnChoiceOrder = F, returnCreatedTime = F, returnHasAttachedChoiceMedia = F, returnHasAttachedChoiceMediaSafe = F, returnHasAttachedMedia = F, returnHasAttachedMediaSafe = F, returnIsCorrect = F, returnIsEssay = F, returnIsMultipleChoice = F, returnIsShortAnswer = F, returnIsTrueFalse = F, returnModifiedTime = F, returnQuestionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnValue = F, returnValueOrder = 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("Gradebook", "QuestionAnswer", QuestionAnswerID, searchFields, EntityID)
}
#' Modify a specific QuestionAnswer
#'
#' This function modifies fields for a QuestionAnswer.
#'
#' @param QuestionAnswerID The id of the QuestionAnswer to be modified.\cr Run \code{\link{getAllQuestionAnswers}} for a list of QuestionAnswers.
#' @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 Gradebook
#' @return Details of the modified QuestionAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQuestionAnswer <- function(QuestionAnswerID, EntityID = 1, setChoice = NULL, setChoiceOrder = NULL, setIsCorrect = NULL, setQuestionID = NULL, setValue = NULL, setValueOrder = 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("Gradebook", "QuestionAnswer", QuestionAnswerID, names(functionParams), functionParams, EntityID)
}
#' Create new QuestionAnswer.
#'
#' This function creates a new QuestionAnswer.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created QuestionAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQuestionAnswer <- function(EntityID = 1, setChoice = NULL, setChoiceOrder = NULL, setIsCorrect = NULL, setQuestionID = NULL, setValue = NULL, setValueOrder = 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("Gradebook", "QuestionAnswer", names(functionParams), functionParams, EntityID)
}
#' Delete a specific QuestionAnswer
#'
#' This function deletes a QuestionAnswer.
#'
#' @param QuestionAnswerID The id of the QuestionAnswer.\cr Run \code{\link{getAllQuestionAnswers}} for a list of QuestionAnswers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted QuestionAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQuestionAnswer <- function(QuestionAnswerID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "QuestionAnswer", QuestionAnswerID, EntityID)
}
#' Get all QuestionAnswerMedias.
#'
#' This function returns a dataframe of all QuestionAnswerMedias 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 Gradebook
#' @return All QuestionAnswerMedias in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQuestionAnswerMedias <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQuestionAnswerMediaID = F, returnCreatedTime = F, returnDisplayFor = F, returnDisplayForCode = F, returnMediaID = F, returnModifiedTime = F, returnQuestionAnswerID = 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("Gradebook", "QuestionAnswerMedia", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific QuestionAnswerMedia
#'
#' This function returns fields for a QuestionAnswerMedia.
#'
#' @param QuestionAnswerMediaID The id of the QuestionAnswerMedia.\cr Run \code{\link{getAllQuestionAnswerMedias}} for a list of QuestionAnswerMedias.
#' @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 Gradebook
#' @return Details for the QuestionAnswerMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQuestionAnswerMedia <- function(QuestionAnswerMediaID, EntityID = 1, returnQuestionAnswerMediaID = F, returnCreatedTime = F, returnDisplayFor = F, returnDisplayForCode = F, returnMediaID = F, returnModifiedTime = F, returnQuestionAnswerID = 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("Gradebook", "QuestionAnswerMedia", QuestionAnswerMediaID, searchFields, EntityID)
}
#' Modify a specific QuestionAnswerMedia
#'
#' This function modifies fields for a QuestionAnswerMedia.
#'
#' @param QuestionAnswerMediaID The id of the QuestionAnswerMedia to be modified.\cr Run \code{\link{getAllQuestionAnswerMedias}} for a list of QuestionAnswerMedias.
#' @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 Gradebook
#' @return Details of the modified QuestionAnswerMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQuestionAnswerMedia <- function(QuestionAnswerMediaID, EntityID = 1, setDisplayFor = NULL, setDisplayForCode = NULL, setMediaID = NULL, setQuestionAnswerID = 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("Gradebook", "QuestionAnswerMedia", QuestionAnswerMediaID, names(functionParams), functionParams, EntityID)
}
#' Create new QuestionAnswerMedia.
#'
#' This function creates a new QuestionAnswerMedia.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created QuestionAnswerMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQuestionAnswerMedia <- function(EntityID = 1, setDisplayFor = NULL, setDisplayForCode = NULL, setMediaID = NULL, setQuestionAnswerID = 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("Gradebook", "QuestionAnswerMedia", names(functionParams), functionParams, EntityID)
}
#' Delete a specific QuestionAnswerMedia
#'
#' This function deletes a QuestionAnswerMedia.
#'
#' @param QuestionAnswerMediaID The id of the QuestionAnswerMedia.\cr Run \code{\link{getAllQuestionAnswerMedias}} for a list of QuestionAnswerMedias.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted QuestionAnswerMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQuestionAnswerMedia <- function(QuestionAnswerMediaID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "QuestionAnswerMedia", QuestionAnswerMediaID, EntityID)
}
#' Get all QuestionMedias.
#'
#' This function returns a dataframe of all QuestionMedias 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 Gradebook
#' @return All QuestionMedias in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQuestionMedias <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQuestionMediaID = F, returnCreatedTime = F, returnMediaID = F, returnModifiedTime = F, returnQuestionID = 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("Gradebook", "QuestionMedia", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific QuestionMedia
#'
#' This function returns fields for a QuestionMedia.
#'
#' @param QuestionMediaID The id of the QuestionMedia.\cr Run \code{\link{getAllQuestionMedias}} for a list of QuestionMedias.
#' @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 Gradebook
#' @return Details for the QuestionMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQuestionMedia <- function(QuestionMediaID, EntityID = 1, returnQuestionMediaID = F, returnCreatedTime = F, returnMediaID = F, returnModifiedTime = F, returnQuestionID = 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("Gradebook", "QuestionMedia", QuestionMediaID, searchFields, EntityID)
}
#' Modify a specific QuestionMedia
#'
#' This function modifies fields for a QuestionMedia.
#'
#' @param QuestionMediaID The id of the QuestionMedia to be modified.\cr Run \code{\link{getAllQuestionMedias}} for a list of QuestionMedias.
#' @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 Gradebook
#' @return Details of the modified QuestionMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQuestionMedia <- function(QuestionMediaID, EntityID = 1, setMediaID = NULL, setQuestionID = 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("Gradebook", "QuestionMedia", QuestionMediaID, names(functionParams), functionParams, EntityID)
}
#' Create new QuestionMedia.
#'
#' This function creates a new QuestionMedia.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created QuestionMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQuestionMedia <- function(EntityID = 1, setMediaID = NULL, setQuestionID = 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("Gradebook", "QuestionMedia", names(functionParams), functionParams, EntityID)
}
#' Delete a specific QuestionMedia
#'
#' This function deletes a QuestionMedia.
#'
#' @param QuestionMediaID The id of the QuestionMedia.\cr Run \code{\link{getAllQuestionMedias}} for a list of QuestionMedias.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted QuestionMedia.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQuestionMedia <- function(QuestionMediaID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "QuestionMedia", QuestionMediaID, EntityID)
}
#' Get all ScoreClarifiers.
#'
#' This function returns a dataframe of all ScoreClarifiers 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 Gradebook
#' @return All ScoreClarifiers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllScoreClarifiers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnScoreClarifierID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnIsAHistoricRecord = F, returnIsMissing = F, returnModifiedTime = F, returnNoCount = F, returnSchoolYearID = F, returnScoreClarifierIDClonedFrom = 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("Gradebook", "ScoreClarifier", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ScoreClarifier
#'
#' This function returns fields for a ScoreClarifier.
#'
#' @param ScoreClarifierID The id of the ScoreClarifier.\cr Run \code{\link{getAllScoreClarifiers}} for a list of ScoreClarifiers.
#' @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 Gradebook
#' @return Details for the ScoreClarifier.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getScoreClarifier <- function(ScoreClarifierID, EntityID = 1, returnScoreClarifierID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnIsAHistoricRecord = F, returnIsMissing = F, returnModifiedTime = F, returnNoCount = F, returnSchoolYearID = F, returnScoreClarifierIDClonedFrom = 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("Gradebook", "ScoreClarifier", ScoreClarifierID, searchFields, EntityID)
}
#' Modify a specific ScoreClarifier
#'
#' This function modifies fields for a ScoreClarifier.
#'
#' @param ScoreClarifierID The id of the ScoreClarifier to be modified.\cr Run \code{\link{getAllScoreClarifiers}} for a list of ScoreClarifiers.
#' @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 Gradebook
#' @return Details of the modified ScoreClarifier.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyScoreClarifier <- function(ScoreClarifierID, EntityID = 1, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIsMissing = NULL, setNoCount = NULL, setSchoolYearID = NULL, setScoreClarifierIDClonedFrom = 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("Gradebook", "ScoreClarifier", ScoreClarifierID, names(functionParams), functionParams, EntityID)
}
#' Create new ScoreClarifier.
#'
#' This function creates a new ScoreClarifier.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created ScoreClarifier.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createScoreClarifier <- function(EntityID = 1, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIsMissing = NULL, setNoCount = NULL, setSchoolYearID = NULL, setScoreClarifierIDClonedFrom = 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("Gradebook", "ScoreClarifier", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ScoreClarifier
#'
#' This function deletes a ScoreClarifier.
#'
#' @param ScoreClarifierID The id of the ScoreClarifier.\cr Run \code{\link{getAllScoreClarifiers}} for a list of ScoreClarifiers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted ScoreClarifier.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteScoreClarifier <- function(ScoreClarifierID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "ScoreClarifier", ScoreClarifierID, EntityID)
}
#' Get all SectionAcademicStandardWeights.
#'
#' This function returns a dataframe of all SectionAcademicStandardWeights 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 Gradebook
#' @return All SectionAcademicStandardWeights in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionAcademicStandardWeights <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionAcademicStandardWeightID = F, returnAcademicStandardID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnSectionGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionAcademicStandardWeight", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionAcademicStandardWeight
#'
#' This function returns fields for a SectionAcademicStandardWeight.
#'
#' @param SectionAcademicStandardWeightID The id of the SectionAcademicStandardWeight.\cr Run \code{\link{getAllSectionAcademicStandardWeights}} for a list of SectionAcademicStandardWeights.
#' @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 Gradebook
#' @return Details for the SectionAcademicStandardWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionAcademicStandardWeight <- function(SectionAcademicStandardWeightID, EntityID = 1, returnSectionAcademicStandardWeightID = F, returnAcademicStandardID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnSectionGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionAcademicStandardWeight", SectionAcademicStandardWeightID, searchFields, EntityID)
}
#' Modify a specific SectionAcademicStandardWeight
#'
#' This function modifies fields for a SectionAcademicStandardWeight.
#'
#' @param SectionAcademicStandardWeightID The id of the SectionAcademicStandardWeight to be modified.\cr Run \code{\link{getAllSectionAcademicStandardWeights}} for a list of SectionAcademicStandardWeights.
#' @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 Gradebook
#' @return Details of the modified SectionAcademicStandardWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionAcademicStandardWeight <- function(SectionAcademicStandardWeightID, EntityID = 1, setAcademicStandardID = NULL, setSectionGradeBucketID = NULL, setWeightPercent = 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("Gradebook", "SectionAcademicStandardWeight", SectionAcademicStandardWeightID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionAcademicStandardWeight.
#'
#' This function creates a new SectionAcademicStandardWeight.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionAcademicStandardWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionAcademicStandardWeight <- function(EntityID = 1, setAcademicStandardID = NULL, setSectionGradeBucketID = NULL, setWeightPercent = 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("Gradebook", "SectionAcademicStandardWeight", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionAcademicStandardWeight
#'
#' This function deletes a SectionAcademicStandardWeight.
#'
#' @param SectionAcademicStandardWeightID The id of the SectionAcademicStandardWeight.\cr Run \code{\link{getAllSectionAcademicStandardWeights}} for a list of SectionAcademicStandardWeights.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionAcademicStandardWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionAcademicStandardWeight <- function(SectionAcademicStandardWeightID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionAcademicStandardWeight", SectionAcademicStandardWeightID, EntityID)
}
#' Get all SectionCategories.
#'
#' This function returns a dataframe of all SectionCategories 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 Gradebook
#' @return All SectionCategories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionCategoryID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCategoryID = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnPercentEarnedForCategory = F, returnPointsEarnedForCategory = F, returnSectionGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionCategory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionCategory
#'
#' This function returns fields for a SectionCategory.
#'
#' @param SectionCategoryID The id of the SectionCategory.\cr Run \code{\link{getAllSectionCategories}} for a list of SectionCategories.
#' @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 Gradebook
#' @return Details for the SectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionCategory <- function(SectionCategoryID, EntityID = 1, returnSectionCategoryID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCategoryID = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnPercentEarnedForCategory = F, returnPointsEarnedForCategory = F, returnSectionGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionCategory", SectionCategoryID, searchFields, EntityID)
}
#' Modify a specific SectionCategory
#'
#' This function modifies fields for a SectionCategory.
#'
#' @param SectionCategoryID The id of the SectionCategory to be modified.\cr Run \code{\link{getAllSectionCategories}} for a list of SectionCategorys.
#' @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 Gradebook
#' @return Details of the modified SectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionCategory <- function(SectionCategoryID, EntityID = 1, setCategoryID = NULL, setSectionGradeBucketID = NULL, setWeightPercent = 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("Gradebook", "SectionCategory", SectionCategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionCategory.
#'
#' This function creates a new SectionCategory.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionCategory <- function(EntityID = 1, setCategoryID = NULL, setSectionGradeBucketID = NULL, setWeightPercent = 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("Gradebook", "SectionCategory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionCategory
#'
#' This function deletes a SectionCategory.
#'
#' @param SectionCategoryID The id of the SectionCategory.\cr Run \code{\link{getAllSectionCategories}} for a list of SectionCategories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionCategory <- function(SectionCategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionCategory", SectionCategoryID, EntityID)
}
#' Get all SectionGradeBuckets.
#'
#' This function returns a dataframe of all SectionGradeBuckets 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 Gradebook
#' @return All SectionGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCalculationModifiedTime = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEffectiveCalculationType = F, returnEffectiveCalculationTypeCode = F, returnHasSectionAcademicStandardWeights = F, returnHasSectionCategories = F, returnHasSectionGradeBucketWeights = F, returnHasSectionSubjectWeights = F, returnIsAHistoricRecord = F, returnIsCalculationTypeOverridden = F, returnIsOverridden = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "SectionGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionGradeBucket
#'
#' This function returns fields for a SectionGradeBucket.
#'
#' @param SectionGradeBucketID The id of the SectionGradeBucket.\cr Run \code{\link{getAllSectionGradeBuckets}} for a list of SectionGradeBuckets.
#' @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 Gradebook
#' @return Details for the SectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionGradeBucket <- function(SectionGradeBucketID, EntityID = 1, returnSectionGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCalculationModifiedTime = F, returnCalculationType = F, returnCalculationTypeCode = F, returnCreatedTime = F, returnEffectiveCalculationType = F, returnEffectiveCalculationTypeCode = F, returnHasSectionAcademicStandardWeights = F, returnHasSectionCategories = F, returnHasSectionGradeBucketWeights = F, returnHasSectionSubjectWeights = F, returnIsAHistoricRecord = F, returnIsCalculationTypeOverridden = F, returnIsOverridden = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "SectionGradeBucket", SectionGradeBucketID, searchFields, EntityID)
}
#' Modify a specific SectionGradeBucket
#'
#' This function modifies fields for a SectionGradeBucket.
#'
#' @param SectionGradeBucketID The id of the SectionGradeBucket to be modified.\cr Run \code{\link{getAllSectionGradeBuckets}} for a list of SectionGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified SectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionGradeBucket <- function(SectionGradeBucketID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setIsCalculationTypeOverridden = NULL, setSectionID = 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("Gradebook", "SectionGradeBucket", SectionGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionGradeBucket.
#'
#' This function creates a new SectionGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionGradeBucket <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationType = NULL, setCalculationTypeCode = NULL, setIsCalculationTypeOverridden = NULL, setSectionID = 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("Gradebook", "SectionGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionGradeBucket
#'
#' This function deletes a SectionGradeBucket.
#'
#' @param SectionGradeBucketID The id of the SectionGradeBucket.\cr Run \code{\link{getAllSectionGradeBuckets}} for a list of SectionGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionGradeBucket <- function(SectionGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionGradeBucket", SectionGradeBucketID, EntityID)
}
#' Get all SectionGradeBucketSettings.
#'
#' This function returns a dataframe of all SectionGradeBucketSettings 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 Gradebook
#' @return All SectionGradeBucketSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionGradeBucketSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionGradeBucketSettingID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnMaxExtraCredit = F, returnModifiedTime = F, returnSectionID = F, returnUseMaxExtraCredit = 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("Gradebook", "SectionGradeBucketSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionGradeBucketSetting
#'
#' This function returns fields for a SectionGradeBucketSetting.
#'
#' @param SectionGradeBucketSettingID The id of the SectionGradeBucketSetting.\cr Run \code{\link{getAllSectionGradeBucketSettings}} for a list of SectionGradeBucketSettings.
#' @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 Gradebook
#' @return Details for the SectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionGradeBucketSetting <- function(SectionGradeBucketSettingID, EntityID = 1, returnSectionGradeBucketSettingID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnMaxExtraCredit = F, returnModifiedTime = F, returnSectionID = F, returnUseMaxExtraCredit = 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("Gradebook", "SectionGradeBucketSetting", SectionGradeBucketSettingID, searchFields, EntityID)
}
#' Modify a specific SectionGradeBucketSetting
#'
#' This function modifies fields for a SectionGradeBucketSetting.
#'
#' @param SectionGradeBucketSettingID The id of the SectionGradeBucketSetting to be modified.\cr Run \code{\link{getAllSectionGradeBucketSettings}} for a list of SectionGradeBucketSettings.
#' @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 Gradebook
#' @return Details of the modified SectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionGradeBucketSetting <- function(SectionGradeBucketSettingID, EntityID = 1, setGradingPeriodGradeBucketID = NULL, setMaxExtraCredit = NULL, setSectionID = NULL, setUseMaxExtraCredit = 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("Gradebook", "SectionGradeBucketSetting", SectionGradeBucketSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionGradeBucketSetting.
#'
#' This function creates a new SectionGradeBucketSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionGradeBucketSetting <- function(EntityID = 1, setGradingPeriodGradeBucketID = NULL, setMaxExtraCredit = NULL, setSectionID = NULL, setUseMaxExtraCredit = 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("Gradebook", "SectionGradeBucketSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionGradeBucketSetting
#'
#' This function deletes a SectionGradeBucketSetting.
#'
#' @param SectionGradeBucketSettingID The id of the SectionGradeBucketSetting.\cr Run \code{\link{getAllSectionGradeBucketSettings}} for a list of SectionGradeBucketSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionGradeBucketSetting <- function(SectionGradeBucketSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionGradeBucketSetting", SectionGradeBucketSettingID, EntityID)
}
#' Get all SectionGradeBucketWeights.
#'
#' This function returns a dataframe of all SectionGradeBucketWeights 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 Gradebook
#' @return All SectionGradeBucketWeights in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionGradeBucketWeights <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionGradeBucketWeightID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnModifiedTime = F, returnRoundBucketPercent = F, returnSectionGradeBucketIDComposite = F, returnSectionGradeBucketIDFeeder = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionGradeBucketWeight", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionGradeBucketWeight
#'
#' This function returns fields for a SectionGradeBucketWeight.
#'
#' @param SectionGradeBucketWeightID The id of the SectionGradeBucketWeight.\cr Run \code{\link{getAllSectionGradeBucketWeights}} for a list of SectionGradeBucketWeights.
#' @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 Gradebook
#' @return Details for the SectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionGradeBucketWeight <- function(SectionGradeBucketWeightID, EntityID = 1, returnSectionGradeBucketWeightID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnModifiedTime = F, returnRoundBucketPercent = F, returnSectionGradeBucketIDComposite = F, returnSectionGradeBucketIDFeeder = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionGradeBucketWeight", SectionGradeBucketWeightID, searchFields, EntityID)
}
#' Modify a specific SectionGradeBucketWeight
#'
#' This function modifies fields for a SectionGradeBucketWeight.
#'
#' @param SectionGradeBucketWeightID The id of the SectionGradeBucketWeight to be modified.\cr Run \code{\link{getAllSectionGradeBucketWeights}} for a list of SectionGradeBucketWeights.
#' @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 Gradebook
#' @return Details of the modified SectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionGradeBucketWeight <- function(SectionGradeBucketWeightID, EntityID = 1, setSectionGradeBucketIDComposite = NULL, setSectionGradeBucketIDFeeder = NULL, setWeightPercent = 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("Gradebook", "SectionGradeBucketWeight", SectionGradeBucketWeightID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionGradeBucketWeight.
#'
#' This function creates a new SectionGradeBucketWeight.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionGradeBucketWeight <- function(EntityID = 1, setSectionGradeBucketIDComposite = NULL, setSectionGradeBucketIDFeeder = NULL, setWeightPercent = 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("Gradebook", "SectionGradeBucketWeight", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionGradeBucketWeight
#'
#' This function deletes a SectionGradeBucketWeight.
#'
#' @param SectionGradeBucketWeightID The id of the SectionGradeBucketWeight.\cr Run \code{\link{getAllSectionGradeBucketWeights}} for a list of SectionGradeBucketWeights.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionGradeBucketWeight <- function(SectionGradeBucketWeightID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionGradeBucketWeight", SectionGradeBucketWeightID, EntityID)
}
#' Get all SectionGradingPeriodDatas.
#'
#' This function returns a dataframe of all SectionGradingPeriodDatas 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 Gradebook
#' @return All SectionGradingPeriodDatas in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionGradingPeriodDatas <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionGradingPeriodDataID = F, returnCreatedTime = F, returnGradingPeriodID = F, returnIsCompleted = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "SectionGradingPeriodData", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionGradingPeriodData
#'
#' This function returns fields for a SectionGradingPeriodData.
#'
#' @param SectionGradingPeriodDataID The id of the SectionGradingPeriodData.\cr Run \code{\link{getAllSectionGradingPeriodDatas}} for a list of SectionGradingPeriodDatas.
#' @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 Gradebook
#' @return Details for the SectionGradingPeriodData.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionGradingPeriodData <- function(SectionGradingPeriodDataID, EntityID = 1, returnSectionGradingPeriodDataID = F, returnCreatedTime = F, returnGradingPeriodID = F, returnIsCompleted = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "SectionGradingPeriodData", SectionGradingPeriodDataID, searchFields, EntityID)
}
#' Modify a specific SectionGradingPeriodData
#'
#' This function modifies fields for a SectionGradingPeriodData.
#'
#' @param SectionGradingPeriodDataID The id of the SectionGradingPeriodData to be modified.\cr Run \code{\link{getAllSectionGradingPeriodDatas}} for a list of SectionGradingPeriodDatas.
#' @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 Gradebook
#' @return Details of the modified SectionGradingPeriodData.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionGradingPeriodData <- function(SectionGradingPeriodDataID, EntityID = 1, setGradingPeriodID = NULL, setIsCompleted = NULL, setSectionID = 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("Gradebook", "SectionGradingPeriodData", SectionGradingPeriodDataID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionGradingPeriodData.
#'
#' This function creates a new SectionGradingPeriodData.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionGradingPeriodData.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionGradingPeriodData <- function(EntityID = 1, setGradingPeriodID = NULL, setIsCompleted = NULL, setSectionID = 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("Gradebook", "SectionGradingPeriodData", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionGradingPeriodData
#'
#' This function deletes a SectionGradingPeriodData.
#'
#' @param SectionGradingPeriodDataID The id of the SectionGradingPeriodData.\cr Run \code{\link{getAllSectionGradingPeriodDatas}} for a list of SectionGradingPeriodDatas.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionGradingPeriodData.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionGradingPeriodData <- function(SectionGradingPeriodDataID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionGradingPeriodData", SectionGradingPeriodDataID, EntityID)
}
#' Get all SectionGradingScaleGroups.
#'
#' This function returns a dataframe of all SectionGradingScaleGroups 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 Gradebook
#' @return All SectionGradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionGradingScaleGroupID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSectionGradingScaleGroupIDClonedFrom = F, returnSectionID = 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("Gradebook", "SectionGradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionGradingScaleGroup
#'
#' This function returns fields for a SectionGradingScaleGroup.
#'
#' @param SectionGradingScaleGroupID The id of the SectionGradingScaleGroup.\cr Run \code{\link{getAllSectionGradingScaleGroups}} for a list of SectionGradingScaleGroups.
#' @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 Gradebook
#' @return Details for the SectionGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionGradingScaleGroup <- function(SectionGradingScaleGroupID, EntityID = 1, returnSectionGradingScaleGroupID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSectionGradingScaleGroupIDClonedFrom = F, returnSectionID = 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("Gradebook", "SectionGradingScaleGroup", SectionGradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific SectionGradingScaleGroup
#'
#' This function modifies fields for a SectionGradingScaleGroup.
#'
#' @param SectionGradingScaleGroupID The id of the SectionGradingScaleGroup to be modified.\cr Run \code{\link{getAllSectionGradingScaleGroups}} for a list of SectionGradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified SectionGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionGradingScaleGroup <- function(SectionGradingScaleGroupID, EntityID = 1, setGradingPeriodGradeBucketID = NULL, setGradingScaleGroupID = NULL, setSectionGradingScaleGroupIDClonedFrom = NULL, setSectionID = 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("Gradebook", "SectionGradingScaleGroup", SectionGradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionGradingScaleGroup.
#'
#' This function creates a new SectionGradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionGradingScaleGroup <- function(EntityID = 1, setGradingPeriodGradeBucketID = NULL, setGradingScaleGroupID = NULL, setSectionGradingScaleGroupIDClonedFrom = NULL, setSectionID = 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("Gradebook", "SectionGradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionGradingScaleGroup
#'
#' This function deletes a SectionGradingScaleGroup.
#'
#' @param SectionGradingScaleGroupID The id of the SectionGradingScaleGroup.\cr Run \code{\link{getAllSectionGradingScaleGroups}} for a list of SectionGradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionGradingScaleGroup <- function(SectionGradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionGradingScaleGroup", SectionGradingScaleGroupID, EntityID)
}
#' Get all SectionSubjectWeights.
#'
#' This function returns a dataframe of all SectionSubjectWeights 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 Gradebook
#' @return All SectionSubjectWeights in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSectionSubjectWeights <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSectionSubjectWeightID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnSectionGradeBucketID = F, returnSubjectID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionSubjectWeight", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SectionSubjectWeight
#'
#' This function returns fields for a SectionSubjectWeight.
#'
#' @param SectionSubjectWeightID The id of the SectionSubjectWeight.\cr Run \code{\link{getAllSectionSubjectWeights}} for a list of SectionSubjectWeights.
#' @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 Gradebook
#' @return Details for the SectionSubjectWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSectionSubjectWeight <- function(SectionSubjectWeightID, EntityID = 1, returnSectionSubjectWeightID = F, returnAdjustedPercentEarned = F, returnAdjustedPointsEarned = F, returnAdjustedWeightPercent = F, returnCreatedTime = F, returnHasAssignments = F, returnModifiedTime = F, returnSectionGradeBucketID = F, returnSubjectID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightFormula = F, returnWeightPercent = 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("Gradebook", "SectionSubjectWeight", SectionSubjectWeightID, searchFields, EntityID)
}
#' Modify a specific SectionSubjectWeight
#'
#' This function modifies fields for a SectionSubjectWeight.
#'
#' @param SectionSubjectWeightID The id of the SectionSubjectWeight to be modified.\cr Run \code{\link{getAllSectionSubjectWeights}} for a list of SectionSubjectWeights.
#' @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 Gradebook
#' @return Details of the modified SectionSubjectWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySectionSubjectWeight <- function(SectionSubjectWeightID, EntityID = 1, setSectionGradeBucketID = NULL, setSubjectID = NULL, setWeightPercent = 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("Gradebook", "SectionSubjectWeight", SectionSubjectWeightID, names(functionParams), functionParams, EntityID)
}
#' Create new SectionSubjectWeight.
#'
#' This function creates a new SectionSubjectWeight.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SectionSubjectWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSectionSubjectWeight <- function(EntityID = 1, setSectionGradeBucketID = NULL, setSubjectID = NULL, setWeightPercent = 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("Gradebook", "SectionSubjectWeight", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SectionSubjectWeight
#'
#' This function deletes a SectionSubjectWeight.
#'
#' @param SectionSubjectWeightID The id of the SectionSubjectWeight.\cr Run \code{\link{getAllSectionSubjectWeights}} for a list of SectionSubjectWeights.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SectionSubjectWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSectionSubjectWeight <- function(SectionSubjectWeightID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SectionSubjectWeight", SectionSubjectWeightID, EntityID)
}
#' Get all StaffMeetLastScoreds.
#'
#' This function returns a dataframe of all StaffMeetLastScoreds 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 Gradebook
#' @return All StaffMeetLastScoreds in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStaffMeetLastScoreds <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStaffMeetLastScoredID = F, returnCreatedTime = F, returnModifiedTime = F, returnStaffMeetID = F, returnStudentAssignmentIDLastScored = F, returnTimeLastScored = 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("Gradebook", "StaffMeetLastScored", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StaffMeetLastScored
#'
#' This function returns fields for a StaffMeetLastScored.
#'
#' @param StaffMeetLastScoredID The id of the StaffMeetLastScored.\cr Run \code{\link{getAllStaffMeetLastScoreds}} for a list of StaffMeetLastScoreds.
#' @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 Gradebook
#' @return Details for the StaffMeetLastScored.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStaffMeetLastScored <- function(StaffMeetLastScoredID, EntityID = 1, returnStaffMeetLastScoredID = F, returnCreatedTime = F, returnModifiedTime = F, returnStaffMeetID = F, returnStudentAssignmentIDLastScored = F, returnTimeLastScored = 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("Gradebook", "StaffMeetLastScored", StaffMeetLastScoredID, searchFields, EntityID)
}
#' Modify a specific StaffMeetLastScored
#'
#' This function modifies fields for a StaffMeetLastScored.
#'
#' @param StaffMeetLastScoredID The id of the StaffMeetLastScored to be modified.\cr Run \code{\link{getAllStaffMeetLastScoreds}} for a list of StaffMeetLastScoreds.
#' @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 Gradebook
#' @return Details of the modified StaffMeetLastScored.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStaffMeetLastScored <- function(StaffMeetLastScoredID, EntityID = 1, setStaffMeetID = NULL, setStudentAssignmentIDLastScored = NULL, setTimeLastScored = 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("Gradebook", "StaffMeetLastScored", StaffMeetLastScoredID, names(functionParams), functionParams, EntityID)
}
#' Create new StaffMeetLastScored.
#'
#' This function creates a new StaffMeetLastScored.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StaffMeetLastScored.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStaffMeetLastScored <- function(EntityID = 1, setStaffMeetID = NULL, setStudentAssignmentIDLastScored = NULL, setTimeLastScored = 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("Gradebook", "StaffMeetLastScored", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StaffMeetLastScored
#'
#' This function deletes a StaffMeetLastScored.
#'
#' @param StaffMeetLastScoredID The id of the StaffMeetLastScored.\cr Run \code{\link{getAllStaffMeetLastScoreds}} for a list of StaffMeetLastScoreds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StaffMeetLastScored.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStaffMeetLastScored <- function(StaffMeetLastScoredID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StaffMeetLastScored", StaffMeetLastScoredID, EntityID)
}
#' Get all StudentAnswers.
#'
#' This function returns a dataframe of all StudentAnswers 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 Gradebook
#' @return All StudentAnswers in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAnswers <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAnswerID = F, returnCreatedTime = F, returnModifiedTime = F, returnQuestionAnswerID = F, returnStudentQuestionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnValue = 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("Gradebook", "StudentAnswer", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAnswer
#'
#' This function returns fields for a StudentAnswer.
#'
#' @param StudentAnswerID The id of the StudentAnswer.\cr Run \code{\link{getAllStudentAnswers}} for a list of StudentAnswers.
#' @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 Gradebook
#' @return Details for the StudentAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAnswer <- function(StudentAnswerID, EntityID = 1, returnStudentAnswerID = F, returnCreatedTime = F, returnModifiedTime = F, returnQuestionAnswerID = F, returnStudentQuestionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnValue = 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("Gradebook", "StudentAnswer", StudentAnswerID, searchFields, EntityID)
}
#' Modify a specific StudentAnswer
#'
#' This function modifies fields for a StudentAnswer.
#'
#' @param StudentAnswerID The id of the StudentAnswer to be modified.\cr Run \code{\link{getAllStudentAnswers}} for a list of StudentAnswers.
#' @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 Gradebook
#' @return Details of the modified StudentAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAnswer <- function(StudentAnswerID, EntityID = 1, setQuestionAnswerID = NULL, setStudentQuestionID = NULL, setValue = 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("Gradebook", "StudentAnswer", StudentAnswerID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAnswer.
#'
#' This function creates a new StudentAnswer.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAnswer <- function(EntityID = 1, setQuestionAnswerID = NULL, setStudentQuestionID = NULL, setValue = 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("Gradebook", "StudentAnswer", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAnswer
#'
#' This function deletes a StudentAnswer.
#'
#' @param StudentAnswerID The id of the StudentAnswer.\cr Run \code{\link{getAllStudentAnswers}} for a list of StudentAnswers.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentAnswer.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAnswer <- function(StudentAnswerID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentAnswer", StudentAnswerID, EntityID)
}
#' Get all StudentAssignments.
#'
#' This function returns a dataframe of all StudentAssignments 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 Gradebook
#' @return All StudentAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAssignmentID = F, returnAllQuestionsScored = F, returnAnsweredQuestionCount = F, returnAnswerKeyIsAvailableAndAssignmentIsScored = F, returnAnswerKeyIsAvailableToView = F, returnAssignmentDueDateAttendance = F, returnAssignmentID = F, returnAttemptCount = F, returnCalculatedPoints = F, returnCannotBeTakenByStudent = F, returnComments = F, returnCreatedTime = F, returnCurrentQuestionNumber = F, returnFormattedPointsEarnedPercent = F, returnFormattedPointsEarnedPercentCheckDisplay = F, returnGradeMarkCode = F, returnGradeMarkID = F, returnHasAnswers = F, returnHasStudentSectionTransaction = F, returnIsDropped = F, returnIsExpired = F, returnIsFutureRetainedScore = F, returnIsGraded = F, returnIsMissing = F, returnIsMissingHasChangedWithinSpecifiedAmountOfTime = F, returnIsScored = F, returnIsTransferredScore = F, returnModifiedTime = F, returnNoCount = F, returnOnlineAssignmentNotificationSent = F, returnOnlineAssignmentReviewNotificationSent = F, returnPointsEarned = F, returnPointsEarnedPercent = F, returnPointsEarnedWithSlash = F, returnPointsEarnedWithSlashCheckDisplay = F, returnScore = F, returnScoreClarifierID = F, returnScoreDisplayValue = F, returnScoreDisplayValueNoGradeMark = F, returnScoreHasChangedWithinSpecifiedAmountOfTime = F, returnSectionID = F, returnStudentOnlineAssignmentDisplayPointsEarned = F, returnStudentOnlineAssignmentDisplayPointsEarnedWithSlash = F, returnStudentQuestionCount = F, returnStudentSectionID = F, returnSubmissionStatus = F, returnSubmissionStatusCode = F, returnSubmissionStatusCodeToUse = F, returnSubmissionStatusToUse = F, returnSubmissionTime = F, returnTimeLastScored = 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("Gradebook", "StudentAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAssignment
#'
#' This function returns fields for a StudentAssignment.
#'
#' @param StudentAssignmentID The id of the StudentAssignment.\cr Run \code{\link{getAllStudentAssignments}} for a list of StudentAssignments.
#' @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 Gradebook
#' @return Details for the StudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAssignment <- function(StudentAssignmentID, EntityID = 1, returnStudentAssignmentID = F, returnAllQuestionsScored = F, returnAnsweredQuestionCount = F, returnAnswerKeyIsAvailableAndAssignmentIsScored = F, returnAnswerKeyIsAvailableToView = F, returnAssignmentDueDateAttendance = F, returnAssignmentID = F, returnAttemptCount = F, returnCalculatedPoints = F, returnCannotBeTakenByStudent = F, returnComments = F, returnCreatedTime = F, returnCurrentQuestionNumber = F, returnFormattedPointsEarnedPercent = F, returnFormattedPointsEarnedPercentCheckDisplay = F, returnGradeMarkCode = F, returnGradeMarkID = F, returnHasAnswers = F, returnHasStudentSectionTransaction = F, returnIsDropped = F, returnIsExpired = F, returnIsFutureRetainedScore = F, returnIsGraded = F, returnIsMissing = F, returnIsMissingHasChangedWithinSpecifiedAmountOfTime = F, returnIsScored = F, returnIsTransferredScore = F, returnModifiedTime = F, returnNoCount = F, returnOnlineAssignmentNotificationSent = F, returnOnlineAssignmentReviewNotificationSent = F, returnPointsEarned = F, returnPointsEarnedPercent = F, returnPointsEarnedWithSlash = F, returnPointsEarnedWithSlashCheckDisplay = F, returnScore = F, returnScoreClarifierID = F, returnScoreDisplayValue = F, returnScoreDisplayValueNoGradeMark = F, returnScoreHasChangedWithinSpecifiedAmountOfTime = F, returnSectionID = F, returnStudentOnlineAssignmentDisplayPointsEarned = F, returnStudentOnlineAssignmentDisplayPointsEarnedWithSlash = F, returnStudentQuestionCount = F, returnStudentSectionID = F, returnSubmissionStatus = F, returnSubmissionStatusCode = F, returnSubmissionStatusCodeToUse = F, returnSubmissionStatusToUse = F, returnSubmissionTime = F, returnTimeLastScored = 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("Gradebook", "StudentAssignment", StudentAssignmentID, searchFields, EntityID)
}
#' Modify a specific StudentAssignment
#'
#' This function modifies fields for a StudentAssignment.
#'
#' @param StudentAssignmentID The id of the StudentAssignment to be modified.\cr Run \code{\link{getAllStudentAssignments}} for a list of StudentAssignments.
#' @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 Gradebook
#' @return Details of the modified StudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAssignment <- function(StudentAssignmentID, EntityID = 1, setAssignmentID = NULL, setCalculatedPoints = NULL, setComments = NULL, setGradeMarkID = NULL, setIsDropped = NULL, setIsGraded = NULL, setIsMissing = NULL, setNoCount = NULL, setOnlineAssignmentNotificationSent = NULL, setOnlineAssignmentReviewNotificationSent = NULL, setScore = NULL, setScoreClarifierID = NULL, setSectionID = NULL, setStudentSectionID = NULL, setSubmissionStatus = NULL, setSubmissionStatusCode = NULL, setSubmissionTime = NULL, setTimeLastScored = 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("Gradebook", "StudentAssignment", StudentAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAssignment.
#'
#' This function creates a new StudentAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAssignment <- function(EntityID = 1, setAssignmentID = NULL, setCalculatedPoints = NULL, setComments = NULL, setGradeMarkID = NULL, setIsDropped = NULL, setIsGraded = NULL, setIsMissing = NULL, setNoCount = NULL, setOnlineAssignmentNotificationSent = NULL, setOnlineAssignmentReviewNotificationSent = NULL, setScore = NULL, setScoreClarifierID = NULL, setSectionID = NULL, setStudentSectionID = NULL, setSubmissionStatus = NULL, setSubmissionStatusCode = NULL, setSubmissionTime = NULL, setTimeLastScored = 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("Gradebook", "StudentAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAssignment
#'
#' This function deletes a StudentAssignment.
#'
#' @param StudentAssignmentID The id of the StudentAssignment.\cr Run \code{\link{getAllStudentAssignments}} for a list of StudentAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAssignment <- function(StudentAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentAssignment", StudentAssignmentID, EntityID)
}
#' Get all StudentAssignmentAttempts.
#'
#' This function returns a dataframe of all StudentAssignmentAttempts 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 Gradebook
#' @return All StudentAssignmentAttempts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAssignmentAttempts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAssignmentAttemptID = F, returnComments = F, returnCreatedTime = F, returnDateAttempted = F, returnGradeMarkID = F, returnIsUsed = F, returnModifiedTime = F, returnScore = F, returnStudentAssignmentID = 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("Gradebook", "StudentAssignmentAttempt", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAssignmentAttempt
#'
#' This function returns fields for a StudentAssignmentAttempt.
#'
#' @param StudentAssignmentAttemptID The id of the StudentAssignmentAttempt.\cr Run \code{\link{getAllStudentAssignmentAttempts}} for a list of StudentAssignmentAttempts.
#' @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 Gradebook
#' @return Details for the StudentAssignmentAttempt.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAssignmentAttempt <- function(StudentAssignmentAttemptID, EntityID = 1, returnStudentAssignmentAttemptID = F, returnComments = F, returnCreatedTime = F, returnDateAttempted = F, returnGradeMarkID = F, returnIsUsed = F, returnModifiedTime = F, returnScore = F, returnStudentAssignmentID = 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("Gradebook", "StudentAssignmentAttempt", StudentAssignmentAttemptID, searchFields, EntityID)
}
#' Modify a specific StudentAssignmentAttempt
#'
#' This function modifies fields for a StudentAssignmentAttempt.
#'
#' @param StudentAssignmentAttemptID The id of the StudentAssignmentAttempt to be modified.\cr Run \code{\link{getAllStudentAssignmentAttempts}} for a list of StudentAssignmentAttempts.
#' @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 Gradebook
#' @return Details of the modified StudentAssignmentAttempt.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAssignmentAttempt <- function(StudentAssignmentAttemptID, EntityID = 1, setComments = NULL, setDateAttempted = NULL, setGradeMarkID = NULL, setIsUsed = NULL, setScore = NULL, setStudentAssignmentID = 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("Gradebook", "StudentAssignmentAttempt", StudentAssignmentAttemptID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAssignmentAttempt.
#'
#' This function creates a new StudentAssignmentAttempt.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentAssignmentAttempt.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAssignmentAttempt <- function(EntityID = 1, setComments = NULL, setDateAttempted = NULL, setGradeMarkID = NULL, setIsUsed = NULL, setScore = NULL, setStudentAssignmentID = 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("Gradebook", "StudentAssignmentAttempt", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAssignmentAttempt
#'
#' This function deletes a StudentAssignmentAttempt.
#'
#' @param StudentAssignmentAttemptID The id of the StudentAssignmentAttempt.\cr Run \code{\link{getAllStudentAssignmentAttempts}} for a list of StudentAssignmentAttempts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentAssignmentAttempt.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAssignmentAttempt <- function(StudentAssignmentAttemptID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentAssignmentAttempt", StudentAssignmentAttemptID, EntityID)
}
#' Get all StudentGradeBucketAcademicStandards.
#'
#' This function returns a dataframe of all StudentGradeBucketAcademicStandards 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 Gradebook
#' @return All StudentGradeBucketAcademicStandards in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGradeBucketAcademicStandards <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGradeBucketAcademicStandardID = F, returnAcademicStandardID = F, returnCalculatedPoints = F, returnCreatedTime = F, returnEarnedPoints = F, returnGradeMarkExists = F, returnGradeMarkID = F, returnGradeMarkIDOverride = F, returnGradeMarkOverrideComment = F, returnGradeMarkToUse = F, returnIsAdminOverride = F, returnIsUsingPointsBasedScale = F, returnModifiedTime = F, returnPercent = F, returnPercentAdjustment = F, returnPercentAdjustmentComment = F, returnPercentFormatted = F, returnPercentWithAdjustment = F, returnPercentWithAdjustmentFormatted = F, returnPercentWithAdjustmentWithGradeMarkToUse = F, returnPercentWithGradeMark = F, returnPossiblePoints = F, returnSectionID = F, returnStudentGradeBucketID = 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("Gradebook", "StudentGradeBucketAcademicStandard", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGradeBucketAcademicStandard
#'
#' This function returns fields for a StudentGradeBucketAcademicStandard.
#'
#' @param StudentGradeBucketAcademicStandardID The id of the StudentGradeBucketAcademicStandard.\cr Run \code{\link{getAllStudentGradeBucketAcademicStandards}} for a list of StudentGradeBucketAcademicStandards.
#' @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 Gradebook
#' @return Details for the StudentGradeBucketAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGradeBucketAcademicStandard <- function(StudentGradeBucketAcademicStandardID, EntityID = 1, returnStudentGradeBucketAcademicStandardID = F, returnAcademicStandardID = F, returnCalculatedPoints = F, returnCreatedTime = F, returnEarnedPoints = F, returnGradeMarkExists = F, returnGradeMarkID = F, returnGradeMarkIDOverride = F, returnGradeMarkOverrideComment = F, returnGradeMarkToUse = F, returnIsAdminOverride = F, returnIsUsingPointsBasedScale = F, returnModifiedTime = F, returnPercent = F, returnPercentAdjustment = F, returnPercentAdjustmentComment = F, returnPercentFormatted = F, returnPercentWithAdjustment = F, returnPercentWithAdjustmentFormatted = F, returnPercentWithAdjustmentWithGradeMarkToUse = F, returnPercentWithGradeMark = F, returnPossiblePoints = F, returnSectionID = F, returnStudentGradeBucketID = 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("Gradebook", "StudentGradeBucketAcademicStandard", StudentGradeBucketAcademicStandardID, searchFields, EntityID)
}
#' Modify a specific StudentGradeBucketAcademicStandard
#'
#' This function modifies fields for a StudentGradeBucketAcademicStandard.
#'
#' @param StudentGradeBucketAcademicStandardID The id of the StudentGradeBucketAcademicStandard to be modified.\cr Run \code{\link{getAllStudentGradeBucketAcademicStandards}} for a list of StudentGradeBucketAcademicStandards.
#' @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 Gradebook
#' @return Details of the modified StudentGradeBucketAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGradeBucketAcademicStandard <- function(StudentGradeBucketAcademicStandardID, EntityID = 1, setAcademicStandardID = NULL, setCalculatedPoints = NULL, setEarnedPoints = NULL, setGradeMarkID = NULL, setGradeMarkIDOverride = NULL, setGradeMarkOverrideComment = NULL, setGradeMarkToUse = NULL, setIsAdminOverride = NULL, setIsUsingPointsBasedScale = NULL, setPercent = NULL, setPercentAdjustment = NULL, setPercentAdjustmentComment = NULL, setPercentWithAdjustment = NULL, setPossiblePoints = NULL, setSectionID = NULL, setStudentGradeBucketID = 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("Gradebook", "StudentGradeBucketAcademicStandard", StudentGradeBucketAcademicStandardID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGradeBucketAcademicStandard.
#'
#' This function creates a new StudentGradeBucketAcademicStandard.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGradeBucketAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGradeBucketAcademicStandard <- function(EntityID = 1, setAcademicStandardID = NULL, setCalculatedPoints = NULL, setEarnedPoints = NULL, setGradeMarkID = NULL, setGradeMarkIDOverride = NULL, setGradeMarkOverrideComment = NULL, setGradeMarkToUse = NULL, setIsAdminOverride = NULL, setIsUsingPointsBasedScale = NULL, setPercent = NULL, setPercentAdjustment = NULL, setPercentAdjustmentComment = NULL, setPercentWithAdjustment = NULL, setPossiblePoints = NULL, setSectionID = NULL, setStudentGradeBucketID = 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("Gradebook", "StudentGradeBucketAcademicStandard", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGradeBucketAcademicStandard
#'
#' This function deletes a StudentGradeBucketAcademicStandard.
#'
#' @param StudentGradeBucketAcademicStandardID The id of the StudentGradeBucketAcademicStandard.\cr Run \code{\link{getAllStudentGradeBucketAcademicStandards}} for a list of StudentGradeBucketAcademicStandards.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGradeBucketAcademicStandard.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGradeBucketAcademicStandard <- function(StudentGradeBucketAcademicStandardID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGradeBucketAcademicStandard", StudentGradeBucketAcademicStandardID, EntityID)
}
#' Get all StudentGradeBucketSubjects.
#'
#' This function returns a dataframe of all StudentGradeBucketSubjects 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 Gradebook
#' @return All StudentGradeBucketSubjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGradeBucketSubjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGradeBucketSubjectID = F, returnCalculatedPoints = F, returnCreatedTime = F, returnEarnedPoints = F, returnGradeMarkExists = F, returnGradeMarkID = F, returnGradeMarkIDOverride = F, returnGradeMarkOverrideComment = F, returnGradeMarkToUse = F, returnIsAdminOverride = F, returnIsUsingPointsBasedScale = F, returnModifiedTime = F, returnPercent = F, returnPercentAdjustment = F, returnPercentAdjustmentComment = F, returnPercentFormatted = F, returnPercentWithAdjustment = F, returnPercentWithAdjustmentFormatted = F, returnPercentWithAdjustmentWithGradeMarkToUse = F, returnPercentWithGradeMark = F, returnPossiblePoints = F, returnSectionID = F, returnStudentGradeBucketID = F, returnSubjectID = 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("Gradebook", "StudentGradeBucketSubject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGradeBucketSubject
#'
#' This function returns fields for a StudentGradeBucketSubject.
#'
#' @param StudentGradeBucketSubjectID The id of the StudentGradeBucketSubject.\cr Run \code{\link{getAllStudentGradeBucketSubjects}} for a list of StudentGradeBucketSubjects.
#' @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 Gradebook
#' @return Details for the StudentGradeBucketSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGradeBucketSubject <- function(StudentGradeBucketSubjectID, EntityID = 1, returnStudentGradeBucketSubjectID = F, returnCalculatedPoints = F, returnCreatedTime = F, returnEarnedPoints = F, returnGradeMarkExists = F, returnGradeMarkID = F, returnGradeMarkIDOverride = F, returnGradeMarkOverrideComment = F, returnGradeMarkToUse = F, returnIsAdminOverride = F, returnIsUsingPointsBasedScale = F, returnModifiedTime = F, returnPercent = F, returnPercentAdjustment = F, returnPercentAdjustmentComment = F, returnPercentFormatted = F, returnPercentWithAdjustment = F, returnPercentWithAdjustmentFormatted = F, returnPercentWithAdjustmentWithGradeMarkToUse = F, returnPercentWithGradeMark = F, returnPossiblePoints = F, returnSectionID = F, returnStudentGradeBucketID = F, returnSubjectID = 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("Gradebook", "StudentGradeBucketSubject", StudentGradeBucketSubjectID, searchFields, EntityID)
}
#' Modify a specific StudentGradeBucketSubject
#'
#' This function modifies fields for a StudentGradeBucketSubject.
#'
#' @param StudentGradeBucketSubjectID The id of the StudentGradeBucketSubject to be modified.\cr Run \code{\link{getAllStudentGradeBucketSubjects}} for a list of StudentGradeBucketSubjects.
#' @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 Gradebook
#' @return Details of the modified StudentGradeBucketSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGradeBucketSubject <- function(StudentGradeBucketSubjectID, EntityID = 1, setCalculatedPoints = NULL, setEarnedPoints = NULL, setGradeMarkID = NULL, setGradeMarkIDOverride = NULL, setGradeMarkOverrideComment = NULL, setGradeMarkToUse = NULL, setIsAdminOverride = NULL, setIsUsingPointsBasedScale = NULL, setPercent = NULL, setPercentAdjustment = NULL, setPercentAdjustmentComment = NULL, setPercentWithAdjustment = NULL, setPossiblePoints = NULL, setSectionID = NULL, setStudentGradeBucketID = NULL, setSubjectID = 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("Gradebook", "StudentGradeBucketSubject", StudentGradeBucketSubjectID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGradeBucketSubject.
#'
#' This function creates a new StudentGradeBucketSubject.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGradeBucketSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGradeBucketSubject <- function(EntityID = 1, setCalculatedPoints = NULL, setEarnedPoints = NULL, setGradeMarkID = NULL, setGradeMarkIDOverride = NULL, setGradeMarkOverrideComment = NULL, setGradeMarkToUse = NULL, setIsAdminOverride = NULL, setIsUsingPointsBasedScale = NULL, setPercent = NULL, setPercentAdjustment = NULL, setPercentAdjustmentComment = NULL, setPercentWithAdjustment = NULL, setPossiblePoints = NULL, setSectionID = NULL, setStudentGradeBucketID = NULL, setSubjectID = 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("Gradebook", "StudentGradeBucketSubject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGradeBucketSubject
#'
#' This function deletes a StudentGradeBucketSubject.
#'
#' @param StudentGradeBucketSubjectID The id of the StudentGradeBucketSubject.\cr Run \code{\link{getAllStudentGradeBucketSubjects}} for a list of StudentGradeBucketSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGradeBucketSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGradeBucketSubject <- function(StudentGradeBucketSubjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGradeBucketSubject", StudentGradeBucketSubjectID, EntityID)
}
#' Get all StudentGradingScaleGroups.
#'
#' This function returns a dataframe of all StudentGradingScaleGroups 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 Gradebook
#' @return All StudentGradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGradingScaleGroupID = F, returnAllowTeachersToModify = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnGradingScaleGroupID = F, returnHasAttachedStudentSections = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSchoolYearID = F, returnStudentGradingScaleGroupIDClonedFrom = F, returnStudentGradingScaleGroupStudentSectionCount = 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("Gradebook", "StudentGradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGradingScaleGroup
#'
#' This function returns fields for a StudentGradingScaleGroup.
#'
#' @param StudentGradingScaleGroupID The id of the StudentGradingScaleGroup.\cr Run \code{\link{getAllStudentGradingScaleGroups}} for a list of StudentGradingScaleGroups.
#' @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 Gradebook
#' @return Details for the StudentGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGradingScaleGroup <- function(StudentGradingScaleGroupID, EntityID = 1, returnStudentGradingScaleGroupID = F, returnAllowTeachersToModify = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnGradingScaleGroupID = F, returnHasAttachedStudentSections = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnSchoolYearID = F, returnStudentGradingScaleGroupIDClonedFrom = F, returnStudentGradingScaleGroupStudentSectionCount = 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("Gradebook", "StudentGradingScaleGroup", StudentGradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific StudentGradingScaleGroup
#'
#' This function modifies fields for a StudentGradingScaleGroup.
#'
#' @param StudentGradingScaleGroupID The id of the StudentGradingScaleGroup to be modified.\cr Run \code{\link{getAllStudentGradingScaleGroups}} for a list of StudentGradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified StudentGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGradingScaleGroup <- function(StudentGradingScaleGroupID, EntityID = 1, setAllowTeachersToModify = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setGradingScaleGroupID = NULL, setSchoolYearID = NULL, setStudentGradingScaleGroupIDClonedFrom = 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("Gradebook", "StudentGradingScaleGroup", StudentGradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGradingScaleGroup.
#'
#' This function creates a new StudentGradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGradingScaleGroup <- function(EntityID = 1, setAllowTeachersToModify = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setGradingScaleGroupID = NULL, setSchoolYearID = NULL, setStudentGradingScaleGroupIDClonedFrom = 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("Gradebook", "StudentGradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGradingScaleGroup
#'
#' This function deletes a StudentGradingScaleGroup.
#'
#' @param StudentGradingScaleGroupID The id of the StudentGradingScaleGroup.\cr Run \code{\link{getAllStudentGradingScaleGroups}} for a list of StudentGradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGradingScaleGroup <- function(StudentGradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGradingScaleGroup", StudentGradingScaleGroupID, EntityID)
}
#' Get all StudentGradingScaleGroupStudentSections.
#'
#' This function returns a dataframe of all StudentGradingScaleGroupStudentSections 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 Gradebook
#' @return All StudentGradingScaleGroupStudentSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGradingScaleGroupStudentSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGradingScaleGroupStudentSectionID = F, returnCreatedTime = F, returnGradeBuckets = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnStudentGradingScaleGroupID = F, returnStudentSectionID = 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("Gradebook", "StudentGradingScaleGroupStudentSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGradingScaleGroupStudentSection
#'
#' This function returns fields for a StudentGradingScaleGroupStudentSection.
#'
#' @param StudentGradingScaleGroupStudentSectionID The id of the StudentGradingScaleGroupStudentSection.\cr Run \code{\link{getAllStudentGradingScaleGroupStudentSections}} for a list of StudentGradingScaleGroupStudentSections.
#' @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 Gradebook
#' @return Details for the StudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGradingScaleGroupStudentSection <- function(StudentGradingScaleGroupStudentSectionID, EntityID = 1, returnStudentGradingScaleGroupStudentSectionID = F, returnCreatedTime = F, returnGradeBuckets = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnStudentGradingScaleGroupID = F, returnStudentSectionID = 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("Gradebook", "StudentGradingScaleGroupStudentSection", StudentGradingScaleGroupStudentSectionID, searchFields, EntityID)
}
#' Modify a specific StudentGradingScaleGroupStudentSection
#'
#' This function modifies fields for a StudentGradingScaleGroupStudentSection.
#'
#' @param StudentGradingScaleGroupStudentSectionID The id of the StudentGradingScaleGroupStudentSection to be modified.\cr Run \code{\link{getAllStudentGradingScaleGroupStudentSections}} for a list of StudentGradingScaleGroupStudentSections.
#' @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 Gradebook
#' @return Details of the modified StudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGradingScaleGroupStudentSection <- function(StudentGradingScaleGroupStudentSectionID, EntityID = 1, setStudentGradingScaleGroupID = NULL, setStudentSectionID = 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("Gradebook", "StudentGradingScaleGroupStudentSection", StudentGradingScaleGroupStudentSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGradingScaleGroupStudentSection.
#'
#' This function creates a new StudentGradingScaleGroupStudentSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGradingScaleGroupStudentSection <- function(EntityID = 1, setStudentGradingScaleGroupID = NULL, setStudentSectionID = 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("Gradebook", "StudentGradingScaleGroupStudentSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGradingScaleGroupStudentSection
#'
#' This function deletes a StudentGradingScaleGroupStudentSection.
#'
#' @param StudentGradingScaleGroupStudentSectionID The id of the StudentGradingScaleGroupStudentSection.\cr Run \code{\link{getAllStudentGradingScaleGroupStudentSections}} for a list of StudentGradingScaleGroupStudentSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGradingScaleGroupStudentSection <- function(StudentGradingScaleGroupStudentSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGradingScaleGroupStudentSection", StudentGradingScaleGroupStudentSectionID, EntityID)
}
#' Get all StudentGroups.
#'
#' This function returns a dataframe of all StudentGroups 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 Gradebook
#' @return All StudentGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGroupID = F, returnAssignmentCount = F, returnCanBeDeleted = F, returnCreatedTime = F, returnEndDate = F, returnIsActive = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnName = F, returnSectionID = F, returnStartDate = F, returnStudentCount = F, returnStudentGroupSyncKey = 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("Gradebook", "StudentGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGroup
#'
#' This function returns fields for a StudentGroup.
#'
#' @param StudentGroupID The id of the StudentGroup.\cr Run \code{\link{getAllStudentGroups}} for a list of StudentGroups.
#' @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 Gradebook
#' @return Details for the StudentGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGroup <- function(StudentGroupID, EntityID = 1, returnStudentGroupID = F, returnAssignmentCount = F, returnCanBeDeleted = F, returnCreatedTime = F, returnEndDate = F, returnIsActive = F, returnIsAHistoricRecord = F, returnModifiedTime = F, returnName = F, returnSectionID = F, returnStartDate = F, returnStudentCount = F, returnStudentGroupSyncKey = 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("Gradebook", "StudentGroup", StudentGroupID, searchFields, EntityID)
}
#' Modify a specific StudentGroup
#'
#' This function modifies fields for a StudentGroup.
#'
#' @param StudentGroupID The id of the StudentGroup to be modified.\cr Run \code{\link{getAllStudentGroups}} for a list of StudentGroups.
#' @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 Gradebook
#' @return Details of the modified StudentGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGroup <- function(StudentGroupID, EntityID = 1, setEndDate = NULL, setName = NULL, setSectionID = NULL, setStartDate = NULL, setStudentGroupSyncKey = 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("Gradebook", "StudentGroup", StudentGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGroup.
#'
#' This function creates a new StudentGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGroup <- function(EntityID = 1, setEndDate = NULL, setName = NULL, setSectionID = NULL, setStartDate = NULL, setStudentGroupSyncKey = 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("Gradebook", "StudentGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGroup
#'
#' This function deletes a StudentGroup.
#'
#' @param StudentGroupID The id of the StudentGroup.\cr Run \code{\link{getAllStudentGroups}} for a list of StudentGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGroup <- function(StudentGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGroup", StudentGroupID, EntityID)
}
#' Get all StudentGroupAssignments.
#'
#' This function returns a dataframe of all StudentGroupAssignments 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 Gradebook
#' @return All StudentGroupAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGroupAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGroupAssignmentID = F, returnAssignmentID = F, returnCreatedTime = F, returnDeleteErrorMessage = F, returnModifiedTime = F, returnStudentGroupID = 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("Gradebook", "StudentGroupAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGroupAssignment
#'
#' This function returns fields for a StudentGroupAssignment.
#'
#' @param StudentGroupAssignmentID The id of the StudentGroupAssignment.\cr Run \code{\link{getAllStudentGroupAssignments}} for a list of StudentGroupAssignments.
#' @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 Gradebook
#' @return Details for the StudentGroupAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGroupAssignment <- function(StudentGroupAssignmentID, EntityID = 1, returnStudentGroupAssignmentID = F, returnAssignmentID = F, returnCreatedTime = F, returnDeleteErrorMessage = F, returnModifiedTime = F, returnStudentGroupID = 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("Gradebook", "StudentGroupAssignment", StudentGroupAssignmentID, searchFields, EntityID)
}
#' Modify a specific StudentGroupAssignment
#'
#' This function modifies fields for a StudentGroupAssignment.
#'
#' @param StudentGroupAssignmentID The id of the StudentGroupAssignment to be modified.\cr Run \code{\link{getAllStudentGroupAssignments}} for a list of StudentGroupAssignments.
#' @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 Gradebook
#' @return Details of the modified StudentGroupAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGroupAssignment <- function(StudentGroupAssignmentID, EntityID = 1, setAssignmentID = NULL, setStudentGroupID = 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("Gradebook", "StudentGroupAssignment", StudentGroupAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGroupAssignment.
#'
#' This function creates a new StudentGroupAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGroupAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGroupAssignment <- function(EntityID = 1, setAssignmentID = NULL, setStudentGroupID = 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("Gradebook", "StudentGroupAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGroupAssignment
#'
#' This function deletes a StudentGroupAssignment.
#'
#' @param StudentGroupAssignmentID The id of the StudentGroupAssignment.\cr Run \code{\link{getAllStudentGroupAssignments}} for a list of StudentGroupAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGroupAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGroupAssignment <- function(StudentGroupAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGroupAssignment", StudentGroupAssignmentID, EntityID)
}
#' Get all StudentGroupStudentSections.
#'
#' This function returns a dataframe of all StudentGroupStudentSections 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 Gradebook
#' @return All StudentGroupStudentSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGroupStudentSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGroupStudentSectionID = F, returnAssignmentCount = F, returnCanBeDeleted = F, returnCreatedTime = F, returnEndDate = F, returnIsActive = F, returnModifiedTime = F, returnScoredAssignmentCount = F, returnStartDate = F, returnStudentGroupID = F, returnStudentSectionID = F, returnUnableToDeleteMessage = 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("Gradebook", "StudentGroupStudentSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGroupStudentSection
#'
#' This function returns fields for a StudentGroupStudentSection.
#'
#' @param StudentGroupStudentSectionID The id of the StudentGroupStudentSection.\cr Run \code{\link{getAllStudentGroupStudentSections}} for a list of StudentGroupStudentSections.
#' @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 Gradebook
#' @return Details for the StudentGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGroupStudentSection <- function(StudentGroupStudentSectionID, EntityID = 1, returnStudentGroupStudentSectionID = F, returnAssignmentCount = F, returnCanBeDeleted = F, returnCreatedTime = F, returnEndDate = F, returnIsActive = F, returnModifiedTime = F, returnScoredAssignmentCount = F, returnStartDate = F, returnStudentGroupID = F, returnStudentSectionID = F, returnUnableToDeleteMessage = 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("Gradebook", "StudentGroupStudentSection", StudentGroupStudentSectionID, searchFields, EntityID)
}
#' Modify a specific StudentGroupStudentSection
#'
#' This function modifies fields for a StudentGroupStudentSection.
#'
#' @param StudentGroupStudentSectionID The id of the StudentGroupStudentSection to be modified.\cr Run \code{\link{getAllStudentGroupStudentSections}} for a list of StudentGroupStudentSections.
#' @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 Gradebook
#' @return Details of the modified StudentGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGroupStudentSection <- function(StudentGroupStudentSectionID, EntityID = 1, setEndDate = NULL, setStartDate = NULL, setStudentGroupID = NULL, setStudentSectionID = 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("Gradebook", "StudentGroupStudentSection", StudentGroupStudentSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGroupStudentSection.
#'
#' This function creates a new StudentGroupStudentSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGroupStudentSection <- function(EntityID = 1, setEndDate = NULL, setStartDate = NULL, setStudentGroupID = NULL, setStudentSectionID = 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("Gradebook", "StudentGroupStudentSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGroupStudentSection
#'
#' This function deletes a StudentGroupStudentSection.
#'
#' @param StudentGroupStudentSectionID The id of the StudentGroupStudentSection.\cr Run \code{\link{getAllStudentGroupStudentSections}} for a list of StudentGroupStudentSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGroupStudentSection <- function(StudentGroupStudentSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGroupStudentSection", StudentGroupStudentSectionID, EntityID)
}
#' Get all StudentGroupTeacherSectionSettings.
#'
#' This function returns a dataframe of all StudentGroupTeacherSectionSettings 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 Gradebook
#' @return All StudentGroupTeacherSectionSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentGroupTeacherSectionSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGroupTeacherSectionSettingID = F, returnColor = F, returnCreatedTime = F, returnDisplay = F, returnModifiedTime = F, returnStudentGroupID = F, returnTeacherSectionSettingID = 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("Gradebook", "StudentGroupTeacherSectionSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentGroupTeacherSectionSetting
#'
#' This function returns fields for a StudentGroupTeacherSectionSetting.
#'
#' @param StudentGroupTeacherSectionSettingID The id of the StudentGroupTeacherSectionSetting.\cr Run \code{\link{getAllStudentGroupTeacherSectionSettings}} for a list of StudentGroupTeacherSectionSettings.
#' @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 Gradebook
#' @return Details for the StudentGroupTeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentGroupTeacherSectionSetting <- function(StudentGroupTeacherSectionSettingID, EntityID = 1, returnStudentGroupTeacherSectionSettingID = F, returnColor = F, returnCreatedTime = F, returnDisplay = F, returnModifiedTime = F, returnStudentGroupID = F, returnTeacherSectionSettingID = 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("Gradebook", "StudentGroupTeacherSectionSetting", StudentGroupTeacherSectionSettingID, searchFields, EntityID)
}
#' Modify a specific StudentGroupTeacherSectionSetting
#'
#' This function modifies fields for a StudentGroupTeacherSectionSetting.
#'
#' @param StudentGroupTeacherSectionSettingID The id of the StudentGroupTeacherSectionSetting to be modified.\cr Run \code{\link{getAllStudentGroupTeacherSectionSettings}} for a list of StudentGroupTeacherSectionSettings.
#' @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 Gradebook
#' @return Details of the modified StudentGroupTeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentGroupTeacherSectionSetting <- function(StudentGroupTeacherSectionSettingID, EntityID = 1, setColor = NULL, setDisplay = NULL, setStudentGroupID = NULL, setTeacherSectionSettingID = 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("Gradebook", "StudentGroupTeacherSectionSetting", StudentGroupTeacherSectionSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentGroupTeacherSectionSetting.
#'
#' This function creates a new StudentGroupTeacherSectionSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentGroupTeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentGroupTeacherSectionSetting <- function(EntityID = 1, setColor = NULL, setDisplay = NULL, setStudentGroupID = NULL, setTeacherSectionSettingID = 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("Gradebook", "StudentGroupTeacherSectionSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentGroupTeacherSectionSetting
#'
#' This function deletes a StudentGroupTeacherSectionSetting.
#'
#' @param StudentGroupTeacherSectionSettingID The id of the StudentGroupTeacherSectionSetting.\cr Run \code{\link{getAllStudentGroupTeacherSectionSettings}} for a list of StudentGroupTeacherSectionSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentGroupTeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentGroupTeacherSectionSetting <- function(StudentGroupTeacherSectionSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentGroupTeacherSectionSetting", StudentGroupTeacherSectionSettingID, EntityID)
}
#' Get all StudentQuestions.
#'
#' This function returns a dataframe of all StudentQuestions 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 Gradebook
#' @return All StudentQuestions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentQuestions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentQuestionID = F, returnAssignmentQuestionID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCreatedTime = F, returnModifiedTime = F, returnOrder = F, returnScore = F, returnStatus = F, returnStatusCode = F, returnStatusStudentDisplay = F, returnStudentAssignmentID = 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("Gradebook", "StudentQuestion", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentQuestion
#'
#' This function returns fields for a StudentQuestion.
#'
#' @param StudentQuestionID The id of the StudentQuestion.\cr Run \code{\link{getAllStudentQuestions}} for a list of StudentQuestions.
#' @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 Gradebook
#' @return Details for the StudentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentQuestion <- function(StudentQuestionID, EntityID = 1, returnStudentQuestionID = F, returnAssignmentQuestionID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCreatedTime = F, returnModifiedTime = F, returnOrder = F, returnScore = F, returnStatus = F, returnStatusCode = F, returnStatusStudentDisplay = F, returnStudentAssignmentID = 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("Gradebook", "StudentQuestion", StudentQuestionID, searchFields, EntityID)
}
#' Modify a specific StudentQuestion
#'
#' This function modifies fields for a StudentQuestion.
#'
#' @param StudentQuestionID The id of the StudentQuestion to be modified.\cr Run \code{\link{getAllStudentQuestions}} for a list of StudentQuestions.
#' @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 Gradebook
#' @return Details of the modified StudentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentQuestion <- function(StudentQuestionID, EntityID = 1, setAssignmentQuestionID = NULL, setOrder = NULL, setScore = NULL, setStatus = NULL, setStatusCode = NULL, setStudentAssignmentID = 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("Gradebook", "StudentQuestion", StudentQuestionID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentQuestion.
#'
#' This function creates a new StudentQuestion.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentQuestion <- function(EntityID = 1, setAssignmentQuestionID = NULL, setOrder = NULL, setScore = NULL, setStatus = NULL, setStatusCode = NULL, setStudentAssignmentID = 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("Gradebook", "StudentQuestion", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentQuestion
#'
#' This function deletes a StudentQuestion.
#'
#' @param StudentQuestionID The id of the StudentQuestion.\cr Run \code{\link{getAllStudentQuestions}} for a list of StudentQuestions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentQuestion.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentQuestion <- function(StudentQuestionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentQuestion", StudentQuestionID, EntityID)
}
#' Get all StudentSectionGradingScaleGradeBuckets.
#'
#' This function returns a dataframe of all StudentSectionGradingScaleGradeBuckets 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 Gradebook
#' @return All StudentSectionGradingScaleGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentSectionGradingScaleGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentSectionGradingScaleGradeBucketID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnStudentGradingScaleGroupStudentSectionID = 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("Gradebook", "StudentSectionGradingScaleGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentSectionGradingScaleGradeBucket
#'
#' This function returns fields for a StudentSectionGradingScaleGradeBucket.
#'
#' @param StudentSectionGradingScaleGradeBucketID The id of the StudentSectionGradingScaleGradeBucket.\cr Run \code{\link{getAllStudentSectionGradingScaleGradeBuckets}} for a list of StudentSectionGradingScaleGradeBuckets.
#' @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 Gradebook
#' @return Details for the StudentSectionGradingScaleGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentSectionGradingScaleGradeBucket <- function(StudentSectionGradingScaleGradeBucketID, EntityID = 1, returnStudentSectionGradingScaleGradeBucketID = F, returnCreatedTime = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnStudentGradingScaleGroupStudentSectionID = 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("Gradebook", "StudentSectionGradingScaleGradeBucket", StudentSectionGradingScaleGradeBucketID, searchFields, EntityID)
}
#' Modify a specific StudentSectionGradingScaleGradeBucket
#'
#' This function modifies fields for a StudentSectionGradingScaleGradeBucket.
#'
#' @param StudentSectionGradingScaleGradeBucketID The id of the StudentSectionGradingScaleGradeBucket to be modified.\cr Run \code{\link{getAllStudentSectionGradingScaleGradeBuckets}} for a list of StudentSectionGradingScaleGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified StudentSectionGradingScaleGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentSectionGradingScaleGradeBucket <- function(StudentSectionGradingScaleGradeBucketID, EntityID = 1, setGradingPeriodGradeBucketID = NULL, setStudentGradingScaleGroupStudentSectionID = 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("Gradebook", "StudentSectionGradingScaleGradeBucket", StudentSectionGradingScaleGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentSectionGradingScaleGradeBucket.
#'
#' This function creates a new StudentSectionGradingScaleGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentSectionGradingScaleGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentSectionGradingScaleGradeBucket <- function(EntityID = 1, setGradingPeriodGradeBucketID = NULL, setStudentGradingScaleGroupStudentSectionID = 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("Gradebook", "StudentSectionGradingScaleGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentSectionGradingScaleGradeBucket
#'
#' This function deletes a StudentSectionGradingScaleGradeBucket.
#'
#' @param StudentSectionGradingScaleGradeBucketID The id of the StudentSectionGradingScaleGradeBucket.\cr Run \code{\link{getAllStudentSectionGradingScaleGradeBuckets}} for a list of StudentSectionGradingScaleGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentSectionGradingScaleGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentSectionGradingScaleGradeBucket <- function(StudentSectionGradingScaleGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentSectionGradingScaleGradeBucket", StudentSectionGradingScaleGradeBucketID, EntityID)
}
#' Get all StudentSectionNotes.
#'
#' This function returns a dataframe of all StudentSectionNotes 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 Gradebook
#' @return All StudentSectionNotes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentSectionNotes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentSectionNoteID = F, returnCreatedTime = F, returnCurrentUserCanModify = F, returnLimitToThisSection = F, returnModifiedTime = F, returnNote = F, returnOtherTeachersHaveAccess = F, returnStudentSectionID = 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("Gradebook", "StudentSectionNote", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentSectionNote
#'
#' This function returns fields for a StudentSectionNote.
#'
#' @param StudentSectionNoteID The id of the StudentSectionNote.\cr Run \code{\link{getAllStudentSectionNotes}} for a list of StudentSectionNotes.
#' @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 Gradebook
#' @return Details for the StudentSectionNote.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentSectionNote <- function(StudentSectionNoteID, EntityID = 1, returnStudentSectionNoteID = F, returnCreatedTime = F, returnCurrentUserCanModify = F, returnLimitToThisSection = F, returnModifiedTime = F, returnNote = F, returnOtherTeachersHaveAccess = F, returnStudentSectionID = 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("Gradebook", "StudentSectionNote", StudentSectionNoteID, searchFields, EntityID)
}
#' Modify a specific StudentSectionNote
#'
#' This function modifies fields for a StudentSectionNote.
#'
#' @param StudentSectionNoteID The id of the StudentSectionNote to be modified.\cr Run \code{\link{getAllStudentSectionNotes}} for a list of StudentSectionNotes.
#' @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 Gradebook
#' @return Details of the modified StudentSectionNote.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentSectionNote <- function(StudentSectionNoteID, EntityID = 1, setLimitToThisSection = NULL, setNote = NULL, setOtherTeachersHaveAccess = NULL, setStudentSectionID = 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("Gradebook", "StudentSectionNote", StudentSectionNoteID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentSectionNote.
#'
#' This function creates a new StudentSectionNote.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created StudentSectionNote.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentSectionNote <- function(EntityID = 1, setLimitToThisSection = NULL, setNote = NULL, setOtherTeachersHaveAccess = NULL, setStudentSectionID = 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("Gradebook", "StudentSectionNote", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentSectionNote
#'
#' This function deletes a StudentSectionNote.
#'
#' @param StudentSectionNoteID The id of the StudentSectionNote.\cr Run \code{\link{getAllStudentSectionNotes}} for a list of StudentSectionNotes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted StudentSectionNote.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentSectionNote <- function(StudentSectionNoteID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "StudentSectionNote", StudentSectionNoteID, EntityID)
}
#' Get all SubjectGradingScaleGroups.
#'
#' This function returns a dataframe of all SubjectGradingScaleGroups 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 Gradebook
#' @return All SubjectGradingScaleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSubjectGradingScaleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSubjectGradingScaleGroupID = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnModifiedTime = F, returnSubjectCount = F, returnSubjectGradingScaleGroupIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SubjectGradingScaleGroup
#'
#' This function returns fields for a SubjectGradingScaleGroup.
#'
#' @param SubjectGradingScaleGroupID The id of the SubjectGradingScaleGroup.\cr Run \code{\link{getAllSubjectGradingScaleGroups}} for a list of SubjectGradingScaleGroups.
#' @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 Gradebook
#' @return Details for the SubjectGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSubjectGradingScaleGroup <- function(SubjectGradingScaleGroupID, EntityID = 1, returnSubjectGradingScaleGroupID = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnGradingScaleGroupID = F, returnIsAHistoricRecord = F, returnIsDefaultGroup = F, returnModifiedTime = F, returnSubjectCount = F, returnSubjectGradingScaleGroupIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroup", SubjectGradingScaleGroupID, searchFields, EntityID)
}
#' Modify a specific SubjectGradingScaleGroup
#'
#' This function modifies fields for a SubjectGradingScaleGroup.
#'
#' @param SubjectGradingScaleGroupID The id of the SubjectGradingScaleGroup to be modified.\cr Run \code{\link{getAllSubjectGradingScaleGroups}} for a list of SubjectGradingScaleGroups.
#' @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 Gradebook
#' @return Details of the modified SubjectGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySubjectGradingScaleGroup <- function(SubjectGradingScaleGroupID, EntityID = 1, setCalculationGroupID = NULL, setDescription = NULL, setEntityGroupKey = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = NULL, setSubjectGradingScaleGroupIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroup", SubjectGradingScaleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new SubjectGradingScaleGroup.
#'
#' This function creates a new SubjectGradingScaleGroup.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SubjectGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSubjectGradingScaleGroup <- function(EntityID = 1, setCalculationGroupID = NULL, setDescription = NULL, setEntityGroupKey = NULL, setGradingScaleGroupID = NULL, setIsDefaultGroup = NULL, setSubjectGradingScaleGroupIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SubjectGradingScaleGroup
#'
#' This function deletes a SubjectGradingScaleGroup.
#'
#' @param SubjectGradingScaleGroupID The id of the SubjectGradingScaleGroup.\cr Run \code{\link{getAllSubjectGradingScaleGroups}} for a list of SubjectGradingScaleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SubjectGradingScaleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSubjectGradingScaleGroup <- function(SubjectGradingScaleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SubjectGradingScaleGroup", SubjectGradingScaleGroupID, EntityID)
}
#' Get all SubjectGradingScaleGroupSubjects.
#'
#' This function returns a dataframe of all SubjectGradingScaleGroupSubjects 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 Gradebook
#' @return All SubjectGradingScaleGroupSubjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSubjectGradingScaleGroupSubjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSubjectGradingScaleGroupSubjectID = F, returnCalculationGroupSubjectID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnModifiedTime = F, returnSubjectGradingScaleGroupID = F, returnSubjectGradingScaleGroupSubjectIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroupSubject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SubjectGradingScaleGroupSubject
#'
#' This function returns fields for a SubjectGradingScaleGroupSubject.
#'
#' @param SubjectGradingScaleGroupSubjectID The id of the SubjectGradingScaleGroupSubject.\cr Run \code{\link{getAllSubjectGradingScaleGroupSubjects}} for a list of SubjectGradingScaleGroupSubjects.
#' @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 Gradebook
#' @return Details for the SubjectGradingScaleGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSubjectGradingScaleGroupSubject <- function(SubjectGradingScaleGroupSubjectID, EntityID = 1, returnSubjectGradingScaleGroupSubjectID = F, returnCalculationGroupSubjectID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnModifiedTime = F, returnSubjectGradingScaleGroupID = F, returnSubjectGradingScaleGroupSubjectIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroupSubject", SubjectGradingScaleGroupSubjectID, searchFields, EntityID)
}
#' Modify a specific SubjectGradingScaleGroupSubject
#'
#' This function modifies fields for a SubjectGradingScaleGroupSubject.
#'
#' @param SubjectGradingScaleGroupSubjectID The id of the SubjectGradingScaleGroupSubject to be modified.\cr Run \code{\link{getAllSubjectGradingScaleGroupSubjects}} for a list of SubjectGradingScaleGroupSubjects.
#' @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 Gradebook
#' @return Details of the modified SubjectGradingScaleGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySubjectGradingScaleGroupSubject <- function(SubjectGradingScaleGroupSubjectID, EntityID = 1, setCalculationGroupSubjectID = NULL, setEntityGroupKey = NULL, setSubjectGradingScaleGroupID = NULL, setSubjectGradingScaleGroupSubjectIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroupSubject", SubjectGradingScaleGroupSubjectID, names(functionParams), functionParams, EntityID)
}
#' Create new SubjectGradingScaleGroupSubject.
#'
#' This function creates a new SubjectGradingScaleGroupSubject.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created SubjectGradingScaleGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSubjectGradingScaleGroupSubject <- function(EntityID = 1, setCalculationGroupSubjectID = NULL, setEntityGroupKey = NULL, setSubjectGradingScaleGroupID = NULL, setSubjectGradingScaleGroupSubjectIDClonedFrom = 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("Gradebook", "SubjectGradingScaleGroupSubject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SubjectGradingScaleGroupSubject
#'
#' This function deletes a SubjectGradingScaleGroupSubject.
#'
#' @param SubjectGradingScaleGroupSubjectID The id of the SubjectGradingScaleGroupSubject.\cr Run \code{\link{getAllSubjectGradingScaleGroupSubjects}} for a list of SubjectGradingScaleGroupSubjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted SubjectGradingScaleGroupSubject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSubjectGradingScaleGroupSubject <- function(SubjectGradingScaleGroupSubjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "SubjectGradingScaleGroupSubject", SubjectGradingScaleGroupSubjectID, EntityID)
}
#' Get all TeacherSectionAcademicStandardGradeBucketSettings.
#'
#' This function returns a dataframe of all TeacherSectionAcademicStandardGradeBucketSettings 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 Gradebook
#' @return All TeacherSectionAcademicStandardGradeBucketSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionAcademicStandardGradeBucketSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionAcademicStandardGradeBucketSettingID = F, returnAcademicStandardID = F, returnCreatedTime = F, returnDisplay = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionAcademicStandardGradeBucketSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionAcademicStandardGradeBucketSetting
#'
#' This function returns fields for a TeacherSectionAcademicStandardGradeBucketSetting.
#'
#' @param TeacherSectionAcademicStandardGradeBucketSettingID The id of the TeacherSectionAcademicStandardGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionAcademicStandardGradeBucketSettings}} for a list of TeacherSectionAcademicStandardGradeBucketSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionAcademicStandardGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionAcademicStandardGradeBucketSetting <- function(TeacherSectionAcademicStandardGradeBucketSettingID, EntityID = 1, returnTeacherSectionAcademicStandardGradeBucketSettingID = F, returnAcademicStandardID = F, returnCreatedTime = F, returnDisplay = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionAcademicStandardGradeBucketSetting", TeacherSectionAcademicStandardGradeBucketSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionAcademicStandardGradeBucketSetting
#'
#' This function modifies fields for a TeacherSectionAcademicStandardGradeBucketSetting.
#'
#' @param TeacherSectionAcademicStandardGradeBucketSettingID The id of the TeacherSectionAcademicStandardGradeBucketSetting to be modified.\cr Run \code{\link{getAllTeacherSectionAcademicStandardGradeBucketSettings}} for a list of TeacherSectionAcademicStandardGradeBucketSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionAcademicStandardGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionAcademicStandardGradeBucketSetting <- function(TeacherSectionAcademicStandardGradeBucketSettingID, EntityID = 1, setAcademicStandardID = NULL, setDisplay = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionAcademicStandardGradeBucketSetting", TeacherSectionAcademicStandardGradeBucketSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionAcademicStandardGradeBucketSetting.
#'
#' This function creates a new TeacherSectionAcademicStandardGradeBucketSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionAcademicStandardGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionAcademicStandardGradeBucketSetting <- function(EntityID = 1, setAcademicStandardID = NULL, setDisplay = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionAcademicStandardGradeBucketSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionAcademicStandardGradeBucketSetting
#'
#' This function deletes a TeacherSectionAcademicStandardGradeBucketSetting.
#'
#' @param TeacherSectionAcademicStandardGradeBucketSettingID The id of the TeacherSectionAcademicStandardGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionAcademicStandardGradeBucketSettings}} for a list of TeacherSectionAcademicStandardGradeBucketSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionAcademicStandardGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionAcademicStandardGradeBucketSetting <- function(TeacherSectionAcademicStandardGradeBucketSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionAcademicStandardGradeBucketSetting", TeacherSectionAcademicStandardGradeBucketSettingID, EntityID)
}
#' Get all TeacherSectionCategoryAnalyticsSettings.
#'
#' This function returns a dataframe of all TeacherSectionCategoryAnalyticsSettings 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 Gradebook
#' @return All TeacherSectionCategoryAnalyticsSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionCategoryAnalyticsSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionCategoryAnalyticsSettingID = F, returnAnalysisType = F, returnAnalysisTypeCode = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionCategoryAnalyticsSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionCategoryAnalyticsSetting
#'
#' This function returns fields for a TeacherSectionCategoryAnalyticsSetting.
#'
#' @param TeacherSectionCategoryAnalyticsSettingID The id of the TeacherSectionCategoryAnalyticsSetting.\cr Run \code{\link{getAllTeacherSectionCategoryAnalyticsSettings}} for a list of TeacherSectionCategoryAnalyticsSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionCategoryAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionCategoryAnalyticsSetting <- function(TeacherSectionCategoryAnalyticsSettingID, EntityID = 1, returnTeacherSectionCategoryAnalyticsSettingID = F, returnAnalysisType = F, returnAnalysisTypeCode = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionCategoryAnalyticsSetting", TeacherSectionCategoryAnalyticsSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionCategoryAnalyticsSetting
#'
#' This function modifies fields for a TeacherSectionCategoryAnalyticsSetting.
#'
#' @param TeacherSectionCategoryAnalyticsSettingID The id of the TeacherSectionCategoryAnalyticsSetting to be modified.\cr Run \code{\link{getAllTeacherSectionCategoryAnalyticsSettings}} for a list of TeacherSectionCategoryAnalyticsSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionCategoryAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionCategoryAnalyticsSetting <- function(TeacherSectionCategoryAnalyticsSettingID, EntityID = 1, setAnalysisType = NULL, setAnalysisTypeCode = NULL, setCategoryID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionCategoryAnalyticsSetting", TeacherSectionCategoryAnalyticsSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionCategoryAnalyticsSetting.
#'
#' This function creates a new TeacherSectionCategoryAnalyticsSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionCategoryAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionCategoryAnalyticsSetting <- function(EntityID = 1, setAnalysisType = NULL, setAnalysisTypeCode = NULL, setCategoryID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionCategoryAnalyticsSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionCategoryAnalyticsSetting
#'
#' This function deletes a TeacherSectionCategoryAnalyticsSetting.
#'
#' @param TeacherSectionCategoryAnalyticsSettingID The id of the TeacherSectionCategoryAnalyticsSetting.\cr Run \code{\link{getAllTeacherSectionCategoryAnalyticsSettings}} for a list of TeacherSectionCategoryAnalyticsSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionCategoryAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionCategoryAnalyticsSetting <- function(TeacherSectionCategoryAnalyticsSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionCategoryAnalyticsSetting", TeacherSectionCategoryAnalyticsSettingID, EntityID)
}
#' Get all TeacherSectionGradeBucketAnalyticsSettings.
#'
#' This function returns a dataframe of all TeacherSectionGradeBucketAnalyticsSettings 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 Gradebook
#' @return All TeacherSectionGradeBucketAnalyticsSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionGradeBucketAnalyticsSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionGradeBucketAnalyticsSettingID = F, returnAnalysisType = F, returnAnalysisTypeCode = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketAnalyticsSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionGradeBucketAnalyticsSetting
#'
#' This function returns fields for a TeacherSectionGradeBucketAnalyticsSetting.
#'
#' @param TeacherSectionGradeBucketAnalyticsSettingID The id of the TeacherSectionGradeBucketAnalyticsSetting.\cr Run \code{\link{getAllTeacherSectionGradeBucketAnalyticsSettings}} for a list of TeacherSectionGradeBucketAnalyticsSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionGradeBucketAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionGradeBucketAnalyticsSetting <- function(TeacherSectionGradeBucketAnalyticsSettingID, EntityID = 1, returnTeacherSectionGradeBucketAnalyticsSettingID = F, returnAnalysisType = F, returnAnalysisTypeCode = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketAnalyticsSetting", TeacherSectionGradeBucketAnalyticsSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionGradeBucketAnalyticsSetting
#'
#' This function modifies fields for a TeacherSectionGradeBucketAnalyticsSetting.
#'
#' @param TeacherSectionGradeBucketAnalyticsSettingID The id of the TeacherSectionGradeBucketAnalyticsSetting to be modified.\cr Run \code{\link{getAllTeacherSectionGradeBucketAnalyticsSettings}} for a list of TeacherSectionGradeBucketAnalyticsSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionGradeBucketAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionGradeBucketAnalyticsSetting <- function(TeacherSectionGradeBucketAnalyticsSettingID, EntityID = 1, setAnalysisType = NULL, setAnalysisTypeCode = NULL, setCalculationGroupGradeBucketID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketAnalyticsSetting", TeacherSectionGradeBucketAnalyticsSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionGradeBucketAnalyticsSetting.
#'
#' This function creates a new TeacherSectionGradeBucketAnalyticsSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionGradeBucketAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionGradeBucketAnalyticsSetting <- function(EntityID = 1, setAnalysisType = NULL, setAnalysisTypeCode = NULL, setCalculationGroupGradeBucketID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketAnalyticsSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionGradeBucketAnalyticsSetting
#'
#' This function deletes a TeacherSectionGradeBucketAnalyticsSetting.
#'
#' @param TeacherSectionGradeBucketAnalyticsSettingID The id of the TeacherSectionGradeBucketAnalyticsSetting.\cr Run \code{\link{getAllTeacherSectionGradeBucketAnalyticsSettings}} for a list of TeacherSectionGradeBucketAnalyticsSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionGradeBucketAnalyticsSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionGradeBucketAnalyticsSetting <- function(TeacherSectionGradeBucketAnalyticsSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionGradeBucketAnalyticsSetting", TeacherSectionGradeBucketAnalyticsSettingID, EntityID)
}
#' Get all TeacherSectionGradeBucketSettings.
#'
#' This function returns a dataframe of all TeacherSectionGradeBucketSettings 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 Gradebook
#' @return All TeacherSectionGradeBucketSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionGradeBucketSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionGradeBucketSettingID = F, returnCreatedTime = F, returnGradeBucketDisplayType = F, returnGradeBucketDisplayTypeCode = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionGradeBucketSetting
#'
#' This function returns fields for a TeacherSectionGradeBucketSetting.
#'
#' @param TeacherSectionGradeBucketSettingID The id of the TeacherSectionGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionGradeBucketSettings}} for a list of TeacherSectionGradeBucketSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionGradeBucketSetting <- function(TeacherSectionGradeBucketSettingID, EntityID = 1, returnTeacherSectionGradeBucketSettingID = F, returnCreatedTime = F, returnGradeBucketDisplayType = F, returnGradeBucketDisplayTypeCode = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketSetting", TeacherSectionGradeBucketSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionGradeBucketSetting
#'
#' This function modifies fields for a TeacherSectionGradeBucketSetting.
#'
#' @param TeacherSectionGradeBucketSettingID The id of the TeacherSectionGradeBucketSetting to be modified.\cr Run \code{\link{getAllTeacherSectionGradeBucketSettings}} for a list of TeacherSectionGradeBucketSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionGradeBucketSetting <- function(TeacherSectionGradeBucketSettingID, EntityID = 1, setGradeBucketDisplayType = NULL, setGradeBucketDisplayTypeCode = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketSetting", TeacherSectionGradeBucketSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionGradeBucketSetting.
#'
#' This function creates a new TeacherSectionGradeBucketSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionGradeBucketSetting <- function(EntityID = 1, setGradeBucketDisplayType = NULL, setGradeBucketDisplayTypeCode = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradeBucketSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionGradeBucketSetting
#'
#' This function deletes a TeacherSectionGradeBucketSetting.
#'
#' @param TeacherSectionGradeBucketSettingID The id of the TeacherSectionGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionGradeBucketSettings}} for a list of TeacherSectionGradeBucketSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionGradeBucketSetting <- function(TeacherSectionGradeBucketSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionGradeBucketSetting", TeacherSectionGradeBucketSettingID, EntityID)
}
#' Get all TeacherSectionGradingPeriodSettings.
#'
#' This function returns a dataframe of all TeacherSectionGradingPeriodSettings 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 Gradebook
#' @return All TeacherSectionGradingPeriodSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionGradingPeriodSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionGradingPeriodSettingID = F, returnCreatedTime = F, returnGradingPeriodID = F, returnIncludeMissingAssignments = F, returnModifiedTime = F, returnShowAssessments = F, returnShowAssignments = F, returnShowGradeBuckets = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradingPeriodSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionGradingPeriodSetting
#'
#' This function returns fields for a TeacherSectionGradingPeriodSetting.
#'
#' @param TeacherSectionGradingPeriodSettingID The id of the TeacherSectionGradingPeriodSetting.\cr Run \code{\link{getAllTeacherSectionGradingPeriodSettings}} for a list of TeacherSectionGradingPeriodSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionGradingPeriodSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionGradingPeriodSetting <- function(TeacherSectionGradingPeriodSettingID, EntityID = 1, returnTeacherSectionGradingPeriodSettingID = F, returnCreatedTime = F, returnGradingPeriodID = F, returnIncludeMissingAssignments = F, returnModifiedTime = F, returnShowAssessments = F, returnShowAssignments = F, returnShowGradeBuckets = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradingPeriodSetting", TeacherSectionGradingPeriodSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionGradingPeriodSetting
#'
#' This function modifies fields for a TeacherSectionGradingPeriodSetting.
#'
#' @param TeacherSectionGradingPeriodSettingID The id of the TeacherSectionGradingPeriodSetting to be modified.\cr Run \code{\link{getAllTeacherSectionGradingPeriodSettings}} for a list of TeacherSectionGradingPeriodSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionGradingPeriodSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionGradingPeriodSetting <- function(TeacherSectionGradingPeriodSettingID, EntityID = 1, setGradingPeriodID = NULL, setIncludeMissingAssignments = NULL, setShowAssessments = NULL, setShowAssignments = NULL, setShowGradeBuckets = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradingPeriodSetting", TeacherSectionGradingPeriodSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionGradingPeriodSetting.
#'
#' This function creates a new TeacherSectionGradingPeriodSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionGradingPeriodSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionGradingPeriodSetting <- function(EntityID = 1, setGradingPeriodID = NULL, setIncludeMissingAssignments = NULL, setShowAssessments = NULL, setShowAssignments = NULL, setShowGradeBuckets = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionGradingPeriodSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionGradingPeriodSetting
#'
#' This function deletes a TeacherSectionGradingPeriodSetting.
#'
#' @param TeacherSectionGradingPeriodSettingID The id of the TeacherSectionGradingPeriodSetting.\cr Run \code{\link{getAllTeacherSectionGradingPeriodSettings}} for a list of TeacherSectionGradingPeriodSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionGradingPeriodSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionGradingPeriodSetting <- function(TeacherSectionGradingPeriodSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionGradingPeriodSetting", TeacherSectionGradingPeriodSettingID, EntityID)
}
#' Get all TeacherSectionSettings.
#'
#' This function returns a dataframe of all TeacherSectionSettings 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 Gradebook
#' @return All TeacherSectionSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionSettingID = F, returnBrowseViewID = F, returnCalculationGroupGradeBucketIDLocked = F, returnClassGroupID = F, returnCreatedTime = F, returnDisplayAssignmentAttendanceIndicator = F, returnDisplayAssignmentStudentGroupColors = F, returnDisplayAttendance = F, returnDisplayGradebookAverages = F, returnDisplayMissingAssignment = F, returnDisplayStudentGradeLevel = F, returnDisplayStudentGradingPeriodCommentIndicator = F, returnDisplayStudentGroupColors = F, returnDisplayStudentGroups = F, returnDisplayStudentNumber = F, returnDisplayUnscoredPastDueAssignments = F, returnHasCustomClassRosterSort = F, returnHideAssignmentCategoryColors = F, returnHideLockedColumns = F, returnIsAHistoricRecord = F, returnManualDateEntryEndDate = F, returnManualDateEntryStartDate = F, returnModifiedTime = F, returnSectionID = F, returnShowGradebookLockedColumnButton = F, returnStudentNameDisplayType = F, returnStudentNameDisplayTypeCode = F, returnStudentsToDisplay = F, returnStudentsToDisplayCode = F, returnUseCustomClassRosterSort = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDOwner = 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("Gradebook", "TeacherSectionSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionSetting
#'
#' This function returns fields for a TeacherSectionSetting.
#'
#' @param TeacherSectionSettingID The id of the TeacherSectionSetting.\cr Run \code{\link{getAllTeacherSectionSettings}} for a list of TeacherSectionSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionSetting <- function(TeacherSectionSettingID, EntityID = 1, returnTeacherSectionSettingID = F, returnBrowseViewID = F, returnCalculationGroupGradeBucketIDLocked = F, returnClassGroupID = F, returnCreatedTime = F, returnDisplayAssignmentAttendanceIndicator = F, returnDisplayAssignmentStudentGroupColors = F, returnDisplayAttendance = F, returnDisplayGradebookAverages = F, returnDisplayMissingAssignment = F, returnDisplayStudentGradeLevel = F, returnDisplayStudentGradingPeriodCommentIndicator = F, returnDisplayStudentGroupColors = F, returnDisplayStudentGroups = F, returnDisplayStudentNumber = F, returnDisplayUnscoredPastDueAssignments = F, returnHasCustomClassRosterSort = F, returnHideAssignmentCategoryColors = F, returnHideLockedColumns = F, returnIsAHistoricRecord = F, returnManualDateEntryEndDate = F, returnManualDateEntryStartDate = F, returnModifiedTime = F, returnSectionID = F, returnShowGradebookLockedColumnButton = F, returnStudentNameDisplayType = F, returnStudentNameDisplayTypeCode = F, returnStudentsToDisplay = F, returnStudentsToDisplayCode = F, returnUseCustomClassRosterSort = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDOwner = 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("Gradebook", "TeacherSectionSetting", TeacherSectionSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionSetting
#'
#' This function modifies fields for a TeacherSectionSetting.
#'
#' @param TeacherSectionSettingID The id of the TeacherSectionSetting to be modified.\cr Run \code{\link{getAllTeacherSectionSettings}} for a list of TeacherSectionSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionSetting <- function(TeacherSectionSettingID, EntityID = 1, setBrowseViewID = NULL, setCalculationGroupGradeBucketIDLocked = NULL, setClassGroupID = NULL, setDisplayAssignmentAttendanceIndicator = NULL, setDisplayAssignmentStudentGroupColors = NULL, setDisplayAttendance = NULL, setDisplayGradebookAverages = NULL, setDisplayMissingAssignment = NULL, setDisplayStudentGradeLevel = NULL, setDisplayStudentGradingPeriodCommentIndicator = NULL, setDisplayStudentGroupColors = NULL, setDisplayStudentGroups = NULL, setDisplayStudentNumber = NULL, setDisplayUnscoredPastDueAssignments = NULL, setHideAssignmentCategoryColors = NULL, setHideLockedColumns = NULL, setManualDateEntryEndDate = NULL, setManualDateEntryStartDate = NULL, setSectionID = NULL, setStudentNameDisplayType = NULL, setStudentNameDisplayTypeCode = NULL, setStudentsToDisplay = NULL, setStudentsToDisplayCode = NULL, setUseCustomClassRosterSort = NULL, setUserIDOwner = 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("Gradebook", "TeacherSectionSetting", TeacherSectionSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionSetting.
#'
#' This function creates a new TeacherSectionSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionSetting <- function(EntityID = 1, setBrowseViewID = NULL, setCalculationGroupGradeBucketIDLocked = NULL, setClassGroupID = NULL, setDisplayAssignmentAttendanceIndicator = NULL, setDisplayAssignmentStudentGroupColors = NULL, setDisplayAttendance = NULL, setDisplayGradebookAverages = NULL, setDisplayMissingAssignment = NULL, setDisplayStudentGradeLevel = NULL, setDisplayStudentGradingPeriodCommentIndicator = NULL, setDisplayStudentGroupColors = NULL, setDisplayStudentGroups = NULL, setDisplayStudentNumber = NULL, setDisplayUnscoredPastDueAssignments = NULL, setHideAssignmentCategoryColors = NULL, setHideLockedColumns = NULL, setManualDateEntryEndDate = NULL, setManualDateEntryStartDate = NULL, setSectionID = NULL, setStudentNameDisplayType = NULL, setStudentNameDisplayTypeCode = NULL, setStudentsToDisplay = NULL, setStudentsToDisplayCode = NULL, setUseCustomClassRosterSort = NULL, setUserIDOwner = 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("Gradebook", "TeacherSectionSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionSetting
#'
#' This function deletes a TeacherSectionSetting.
#'
#' @param TeacherSectionSettingID The id of the TeacherSectionSetting.\cr Run \code{\link{getAllTeacherSectionSettings}} for a list of TeacherSectionSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionSetting <- function(TeacherSectionSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionSetting", TeacherSectionSettingID, EntityID)
}
#' Get all TeacherSectionStandardsDisplayAcademicStandardSettings.
#'
#' This function returns a dataframe of all TeacherSectionStandardsDisplayAcademicStandardSettings 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 Gradebook
#' @return All TeacherSectionStandardsDisplayAcademicStandardSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionStandardsDisplayAcademicStandardSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionStandardsDisplayAcademicStandardSettingID = F, returnAcademicStandardID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionStandardsDisplayGradeBucketSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayAcademicStandardSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionStandardsDisplayAcademicStandardSetting
#'
#' This function returns fields for a TeacherSectionStandardsDisplayAcademicStandardSetting.
#'
#' @param TeacherSectionStandardsDisplayAcademicStandardSettingID The id of the TeacherSectionStandardsDisplayAcademicStandardSetting.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayAcademicStandardSettings}} for a list of TeacherSectionStandardsDisplayAcademicStandardSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionStandardsDisplayAcademicStandardSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionStandardsDisplayAcademicStandardSetting <- function(TeacherSectionStandardsDisplayAcademicStandardSettingID, EntityID = 1, returnTeacherSectionStandardsDisplayAcademicStandardSettingID = F, returnAcademicStandardID = F, returnCreatedTime = F, returnModifiedTime = F, returnTeacherSectionStandardsDisplayGradeBucketSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayAcademicStandardSetting", TeacherSectionStandardsDisplayAcademicStandardSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionStandardsDisplayAcademicStandardSetting
#'
#' This function modifies fields for a TeacherSectionStandardsDisplayAcademicStandardSetting.
#'
#' @param TeacherSectionStandardsDisplayAcademicStandardSettingID The id of the TeacherSectionStandardsDisplayAcademicStandardSetting to be modified.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayAcademicStandardSettings}} for a list of TeacherSectionStandardsDisplayAcademicStandardSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionStandardsDisplayAcademicStandardSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionStandardsDisplayAcademicStandardSetting <- function(TeacherSectionStandardsDisplayAcademicStandardSettingID, EntityID = 1, setAcademicStandardID = NULL, setTeacherSectionStandardsDisplayGradeBucketSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayAcademicStandardSetting", TeacherSectionStandardsDisplayAcademicStandardSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionStandardsDisplayAcademicStandardSetting.
#'
#' This function creates a new TeacherSectionStandardsDisplayAcademicStandardSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionStandardsDisplayAcademicStandardSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionStandardsDisplayAcademicStandardSetting <- function(EntityID = 1, setAcademicStandardID = NULL, setTeacherSectionStandardsDisplayGradeBucketSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayAcademicStandardSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionStandardsDisplayAcademicStandardSetting
#'
#' This function deletes a TeacherSectionStandardsDisplayAcademicStandardSetting.
#'
#' @param TeacherSectionStandardsDisplayAcademicStandardSettingID The id of the TeacherSectionStandardsDisplayAcademicStandardSetting.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayAcademicStandardSettings}} for a list of TeacherSectionStandardsDisplayAcademicStandardSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionStandardsDisplayAcademicStandardSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionStandardsDisplayAcademicStandardSetting <- function(TeacherSectionStandardsDisplayAcademicStandardSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionStandardsDisplayAcademicStandardSetting", TeacherSectionStandardsDisplayAcademicStandardSettingID, EntityID)
}
#' Get all TeacherSectionStandardsDisplayGradeBucketSettings.
#'
#' This function returns a dataframe of all TeacherSectionStandardsDisplayGradeBucketSettings 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 Gradebook
#' @return All TeacherSectionStandardsDisplayGradeBucketSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionStandardsDisplayGradeBucketSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionStandardsDisplayGradeBucketSettingID = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnModifiedTime = F, returnShowBucket = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayGradeBucketSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionStandardsDisplayGradeBucketSetting
#'
#' This function returns fields for a TeacherSectionStandardsDisplayGradeBucketSetting.
#'
#' @param TeacherSectionStandardsDisplayGradeBucketSettingID The id of the TeacherSectionStandardsDisplayGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayGradeBucketSettings}} for a list of TeacherSectionStandardsDisplayGradeBucketSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionStandardsDisplayGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionStandardsDisplayGradeBucketSetting <- function(TeacherSectionStandardsDisplayGradeBucketSettingID, EntityID = 1, returnTeacherSectionStandardsDisplayGradeBucketSettingID = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnModifiedTime = F, returnShowBucket = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayGradeBucketSetting", TeacherSectionStandardsDisplayGradeBucketSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionStandardsDisplayGradeBucketSetting
#'
#' This function modifies fields for a TeacherSectionStandardsDisplayGradeBucketSetting.
#'
#' @param TeacherSectionStandardsDisplayGradeBucketSettingID The id of the TeacherSectionStandardsDisplayGradeBucketSetting to be modified.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayGradeBucketSettings}} for a list of TeacherSectionStandardsDisplayGradeBucketSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionStandardsDisplayGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionStandardsDisplayGradeBucketSetting <- function(TeacherSectionStandardsDisplayGradeBucketSettingID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setShowBucket = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayGradeBucketSetting", TeacherSectionStandardsDisplayGradeBucketSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionStandardsDisplayGradeBucketSetting.
#'
#' This function creates a new TeacherSectionStandardsDisplayGradeBucketSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionStandardsDisplayGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionStandardsDisplayGradeBucketSetting <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setShowBucket = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStandardsDisplayGradeBucketSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionStandardsDisplayGradeBucketSetting
#'
#' This function deletes a TeacherSectionStandardsDisplayGradeBucketSetting.
#'
#' @param TeacherSectionStandardsDisplayGradeBucketSettingID The id of the TeacherSectionStandardsDisplayGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionStandardsDisplayGradeBucketSettings}} for a list of TeacherSectionStandardsDisplayGradeBucketSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionStandardsDisplayGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionStandardsDisplayGradeBucketSetting <- function(TeacherSectionStandardsDisplayGradeBucketSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionStandardsDisplayGradeBucketSetting", TeacherSectionStandardsDisplayGradeBucketSettingID, EntityID)
}
#' Get all TeacherSectionStudentSectionSettings.
#'
#' This function returns a dataframe of all TeacherSectionStudentSectionSettings 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 Gradebook
#' @return All TeacherSectionStudentSectionSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionStudentSectionSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionStudentSectionSettingID = F, returnCreatedTime = F, returnDisplayOrder = F, returnModifiedTime = F, returnStudentSectionID = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStudentSectionSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionStudentSectionSetting
#'
#' This function returns fields for a TeacherSectionStudentSectionSetting.
#'
#' @param TeacherSectionStudentSectionSettingID The id of the TeacherSectionStudentSectionSetting.\cr Run \code{\link{getAllTeacherSectionStudentSectionSettings}} for a list of TeacherSectionStudentSectionSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionStudentSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionStudentSectionSetting <- function(TeacherSectionStudentSectionSettingID, EntityID = 1, returnTeacherSectionStudentSectionSettingID = F, returnCreatedTime = F, returnDisplayOrder = F, returnModifiedTime = F, returnStudentSectionID = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStudentSectionSetting", TeacherSectionStudentSectionSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionStudentSectionSetting
#'
#' This function modifies fields for a TeacherSectionStudentSectionSetting.
#'
#' @param TeacherSectionStudentSectionSettingID The id of the TeacherSectionStudentSectionSetting to be modified.\cr Run \code{\link{getAllTeacherSectionStudentSectionSettings}} for a list of TeacherSectionStudentSectionSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionStudentSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionStudentSectionSetting <- function(TeacherSectionStudentSectionSettingID, EntityID = 1, setDisplayOrder = NULL, setStudentSectionID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStudentSectionSetting", TeacherSectionStudentSectionSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionStudentSectionSetting.
#'
#' This function creates a new TeacherSectionStudentSectionSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionStudentSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionStudentSectionSetting <- function(EntityID = 1, setDisplayOrder = NULL, setStudentSectionID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionStudentSectionSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionStudentSectionSetting
#'
#' This function deletes a TeacherSectionStudentSectionSetting.
#'
#' @param TeacherSectionStudentSectionSettingID The id of the TeacherSectionStudentSectionSetting.\cr Run \code{\link{getAllTeacherSectionStudentSectionSettings}} for a list of TeacherSectionStudentSectionSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionStudentSectionSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionStudentSectionSetting <- function(TeacherSectionStudentSectionSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionStudentSectionSetting", TeacherSectionStudentSectionSettingID, EntityID)
}
#' Get all TeacherSectionSubjectGradeBucketSettings.
#'
#' This function returns a dataframe of all TeacherSectionSubjectGradeBucketSettings 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 Gradebook
#' @return All TeacherSectionSubjectGradeBucketSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherSectionSubjectGradeBucketSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherSectionSubjectGradeBucketSettingID = F, returnAllLinkedAcademicStandardsAreDisplayed = F, returnCreatedTime = F, returnDisplay = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnSubjectID = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionSubjectGradeBucketSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherSectionSubjectGradeBucketSetting
#'
#' This function returns fields for a TeacherSectionSubjectGradeBucketSetting.
#'
#' @param TeacherSectionSubjectGradeBucketSettingID The id of the TeacherSectionSubjectGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionSubjectGradeBucketSettings}} for a list of TeacherSectionSubjectGradeBucketSettings.
#' @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 Gradebook
#' @return Details for the TeacherSectionSubjectGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherSectionSubjectGradeBucketSetting <- function(TeacherSectionSubjectGradeBucketSettingID, EntityID = 1, returnTeacherSectionSubjectGradeBucketSettingID = F, returnAllLinkedAcademicStandardsAreDisplayed = F, returnCreatedTime = F, returnDisplay = F, returnGradingPeriodGradeBucketID = F, returnIsExpanded = F, returnModifiedTime = F, returnSubjectID = F, returnTeacherSectionSettingID = 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("Gradebook", "TeacherSectionSubjectGradeBucketSetting", TeacherSectionSubjectGradeBucketSettingID, searchFields, EntityID)
}
#' Modify a specific TeacherSectionSubjectGradeBucketSetting
#'
#' This function modifies fields for a TeacherSectionSubjectGradeBucketSetting.
#'
#' @param TeacherSectionSubjectGradeBucketSettingID The id of the TeacherSectionSubjectGradeBucketSetting to be modified.\cr Run \code{\link{getAllTeacherSectionSubjectGradeBucketSettings}} for a list of TeacherSectionSubjectGradeBucketSettings.
#' @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 Gradebook
#' @return Details of the modified TeacherSectionSubjectGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherSectionSubjectGradeBucketSetting <- function(TeacherSectionSubjectGradeBucketSettingID, EntityID = 1, setDisplay = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setSubjectID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionSubjectGradeBucketSetting", TeacherSectionSubjectGradeBucketSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherSectionSubjectGradeBucketSetting.
#'
#' This function creates a new TeacherSectionSubjectGradeBucketSetting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TeacherSectionSubjectGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherSectionSubjectGradeBucketSetting <- function(EntityID = 1, setDisplay = NULL, setGradingPeriodGradeBucketID = NULL, setIsExpanded = NULL, setSubjectID = NULL, setTeacherSectionSettingID = 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("Gradebook", "TeacherSectionSubjectGradeBucketSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherSectionSubjectGradeBucketSetting
#'
#' This function deletes a TeacherSectionSubjectGradeBucketSetting.
#'
#' @param TeacherSectionSubjectGradeBucketSettingID The id of the TeacherSectionSubjectGradeBucketSetting.\cr Run \code{\link{getAllTeacherSectionSubjectGradeBucketSettings}} for a list of TeacherSectionSubjectGradeBucketSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TeacherSectionSubjectGradeBucketSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherSectionSubjectGradeBucketSetting <- function(TeacherSectionSubjectGradeBucketSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TeacherSectionSubjectGradeBucketSetting", TeacherSectionSubjectGradeBucketSettingID, EntityID)
}
#' Get all TempAdjustedCategories.
#'
#' This function returns a dataframe of all TempAdjustedCategories 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 Gradebook
#' @return All TempAdjustedCategories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAdjustedCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAdjustedCategoryID = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnTempSectionCategoryID = 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("Gradebook", "TempAdjustedCategory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAdjustedCategory
#'
#' This function returns fields for a TempAdjustedCategory.
#'
#' @param TempAdjustedCategoryID The id of the TempAdjustedCategory.\cr Run \code{\link{getAllTempAdjustedCategories}} for a list of TempAdjustedCategories.
#' @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 Gradebook
#' @return Details for the TempAdjustedCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAdjustedCategory <- function(TempAdjustedCategoryID, EntityID = 1, returnTempAdjustedCategoryID = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnTempSectionCategoryID = 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("Gradebook", "TempAdjustedCategory", TempAdjustedCategoryID, searchFields, EntityID)
}
#' Modify a specific TempAdjustedCategory
#'
#' This function modifies fields for a TempAdjustedCategory.
#'
#' @param TempAdjustedCategoryID The id of the TempAdjustedCategory to be modified.\cr Run \code{\link{getAllTempAdjustedCategories}} for a list of TempAdjustedCategorys.
#' @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 Gradebook
#' @return Details of the modified TempAdjustedCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAdjustedCategory <- function(TempAdjustedCategoryID, EntityID = 1, setCategoryID = NULL, setTempSectionCategoryID = 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("Gradebook", "TempAdjustedCategory", TempAdjustedCategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAdjustedCategory.
#'
#' This function creates a new TempAdjustedCategory.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempAdjustedCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAdjustedCategory <- function(EntityID = 1, setCategoryID = NULL, setTempSectionCategoryID = 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("Gradebook", "TempAdjustedCategory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAdjustedCategory
#'
#' This function deletes a TempAdjustedCategory.
#'
#' @param TempAdjustedCategoryID The id of the TempAdjustedCategory.\cr Run \code{\link{getAllTempAdjustedCategories}} for a list of TempAdjustedCategories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempAdjustedCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAdjustedCategory <- function(TempAdjustedCategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempAdjustedCategory", TempAdjustedCategoryID, EntityID)
}
#' Get all TempAssignmentErrors.
#'
#' This function returns a dataframe of all TempAssignmentErrors 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 Gradebook
#' @return All TempAssignmentErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAssignmentErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAssignmentErrorID = F, returnCreatedTime = F, returnErrorNumber = F, returnErrorText = F, returnModifiedTime = F, returnTempSectionAssignmentID = 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("Gradebook", "TempAssignmentError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAssignmentError
#'
#' This function returns fields for a TempAssignmentError.
#'
#' @param TempAssignmentErrorID The id of the TempAssignmentError.\cr Run \code{\link{getAllTempAssignmentErrors}} for a list of TempAssignmentErrors.
#' @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 Gradebook
#' @return Details for the TempAssignmentError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAssignmentError <- function(TempAssignmentErrorID, EntityID = 1, returnTempAssignmentErrorID = F, returnCreatedTime = F, returnErrorNumber = F, returnErrorText = F, returnModifiedTime = F, returnTempSectionAssignmentID = 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("Gradebook", "TempAssignmentError", TempAssignmentErrorID, searchFields, EntityID)
}
#' Modify a specific TempAssignmentError
#'
#' This function modifies fields for a TempAssignmentError.
#'
#' @param TempAssignmentErrorID The id of the TempAssignmentError to be modified.\cr Run \code{\link{getAllTempAssignmentErrors}} for a list of TempAssignmentErrors.
#' @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 Gradebook
#' @return Details of the modified TempAssignmentError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAssignmentError <- function(TempAssignmentErrorID, EntityID = 1, setErrorNumber = NULL, setErrorText = NULL, setTempSectionAssignmentID = 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("Gradebook", "TempAssignmentError", TempAssignmentErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAssignmentError.
#'
#' This function creates a new TempAssignmentError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempAssignmentError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAssignmentError <- function(EntityID = 1, setErrorNumber = NULL, setErrorText = NULL, setTempSectionAssignmentID = 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("Gradebook", "TempAssignmentError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAssignmentError
#'
#' This function deletes a TempAssignmentError.
#'
#' @param TempAssignmentErrorID The id of the TempAssignmentError.\cr Run \code{\link{getAllTempAssignmentErrors}} for a list of TempAssignmentErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempAssignmentError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAssignmentError <- function(TempAssignmentErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempAssignmentError", TempAssignmentErrorID, EntityID)
}
#' Get all TempCalcGroupBucketRemoveStandardOrSubjectResults.
#'
#' This function returns a dataframe of all TempCalcGroupBucketRemoveStandardOrSubjectResults 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 Gradebook
#' @return All TempCalcGroupBucketRemoveStandardOrSubjectResults in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalcGroupBucketRemoveStandardOrSubjectResults <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalcGroupBucketRemoveStandardOrSubjectResultID = F, returnCreatedTime = F, returnErrorText = F, returnIsError = F, returnModifiedTime = F, returnStandardOrSubjectDescription = 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("Gradebook", "TempCalcGroupBucketRemoveStandardOrSubjectResult", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalcGroupBucketRemoveStandardOrSubjectResult
#'
#' This function returns fields for a TempCalcGroupBucketRemoveStandardOrSubjectResult.
#'
#' @param TempCalcGroupBucketRemoveStandardOrSubjectResultID The id of the TempCalcGroupBucketRemoveStandardOrSubjectResult.\cr Run \code{\link{getAllTempCalcGroupBucketRemoveStandardOrSubjectResults}} for a list of TempCalcGroupBucketRemoveStandardOrSubjectResults.
#' @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 Gradebook
#' @return Details for the TempCalcGroupBucketRemoveStandardOrSubjectResult.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalcGroupBucketRemoveStandardOrSubjectResult <- function(TempCalcGroupBucketRemoveStandardOrSubjectResultID, EntityID = 1, returnTempCalcGroupBucketRemoveStandardOrSubjectResultID = F, returnCreatedTime = F, returnErrorText = F, returnIsError = F, returnModifiedTime = F, returnStandardOrSubjectDescription = 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("Gradebook", "TempCalcGroupBucketRemoveStandardOrSubjectResult", TempCalcGroupBucketRemoveStandardOrSubjectResultID, searchFields, EntityID)
}
#' Modify a specific TempCalcGroupBucketRemoveStandardOrSubjectResult
#'
#' This function modifies fields for a TempCalcGroupBucketRemoveStandardOrSubjectResult.
#'
#' @param TempCalcGroupBucketRemoveStandardOrSubjectResultID The id of the TempCalcGroupBucketRemoveStandardOrSubjectResult to be modified.\cr Run \code{\link{getAllTempCalcGroupBucketRemoveStandardOrSubjectResults}} for a list of TempCalcGroupBucketRemoveStandardOrSubjectResults.
#' @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 Gradebook
#' @return Details of the modified TempCalcGroupBucketRemoveStandardOrSubjectResult.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalcGroupBucketRemoveStandardOrSubjectResult <- function(TempCalcGroupBucketRemoveStandardOrSubjectResultID, EntityID = 1, setErrorText = NULL, setIsError = NULL, setStandardOrSubjectDescription = 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("Gradebook", "TempCalcGroupBucketRemoveStandardOrSubjectResult", TempCalcGroupBucketRemoveStandardOrSubjectResultID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalcGroupBucketRemoveStandardOrSubjectResult.
#'
#' This function creates a new TempCalcGroupBucketRemoveStandardOrSubjectResult.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCalcGroupBucketRemoveStandardOrSubjectResult.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalcGroupBucketRemoveStandardOrSubjectResult <- function(EntityID = 1, setErrorText = NULL, setIsError = NULL, setStandardOrSubjectDescription = 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("Gradebook", "TempCalcGroupBucketRemoveStandardOrSubjectResult", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalcGroupBucketRemoveStandardOrSubjectResult
#'
#' This function deletes a TempCalcGroupBucketRemoveStandardOrSubjectResult.
#'
#' @param TempCalcGroupBucketRemoveStandardOrSubjectResultID The id of the TempCalcGroupBucketRemoveStandardOrSubjectResult.\cr Run \code{\link{getAllTempCalcGroupBucketRemoveStandardOrSubjectResults}} for a list of TempCalcGroupBucketRemoveStandardOrSubjectResults.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCalcGroupBucketRemoveStandardOrSubjectResult.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalcGroupBucketRemoveStandardOrSubjectResult <- function(TempCalcGroupBucketRemoveStandardOrSubjectResultID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCalcGroupBucketRemoveStandardOrSubjectResult", TempCalcGroupBucketRemoveStandardOrSubjectResultID, EntityID)
}
#' Get all TempCalculationGroupAcademicStandardWeightings.
#'
#' This function returns a dataframe of all TempCalculationGroupAcademicStandardWeightings 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 Gradebook
#' @return All TempCalculationGroupAcademicStandardWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalculationGroupAcademicStandardWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalculationGroupAcademicStandardWeightingID = F, returnCalculationGroupAcademicStandardGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupAcademicStandardWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalculationGroupAcademicStandardWeighting
#'
#' This function returns fields for a TempCalculationGroupAcademicStandardWeighting.
#'
#' @param TempCalculationGroupAcademicStandardWeightingID The id of the TempCalculationGroupAcademicStandardWeighting.\cr Run \code{\link{getAllTempCalculationGroupAcademicStandardWeightings}} for a list of TempCalculationGroupAcademicStandardWeightings.
#' @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 Gradebook
#' @return Details for the TempCalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalculationGroupAcademicStandardWeighting <- function(TempCalculationGroupAcademicStandardWeightingID, EntityID = 1, returnTempCalculationGroupAcademicStandardWeightingID = F, returnCalculationGroupAcademicStandardGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupAcademicStandardWeighting", TempCalculationGroupAcademicStandardWeightingID, searchFields, EntityID)
}
#' Modify a specific TempCalculationGroupAcademicStandardWeighting
#'
#' This function modifies fields for a TempCalculationGroupAcademicStandardWeighting.
#'
#' @param TempCalculationGroupAcademicStandardWeightingID The id of the TempCalculationGroupAcademicStandardWeighting to be modified.\cr Run \code{\link{getAllTempCalculationGroupAcademicStandardWeightings}} for a list of TempCalculationGroupAcademicStandardWeightings.
#' @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 Gradebook
#' @return Details of the modified TempCalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalculationGroupAcademicStandardWeighting <- function(TempCalculationGroupAcademicStandardWeightingID, EntityID = 1, setCalculationGroupAcademicStandardGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupAcademicStandardWeighting", TempCalculationGroupAcademicStandardWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalculationGroupAcademicStandardWeighting.
#'
#' This function creates a new TempCalculationGroupAcademicStandardWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalculationGroupAcademicStandardWeighting <- function(EntityID = 1, setCalculationGroupAcademicStandardGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupAcademicStandardWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalculationGroupAcademicStandardWeighting
#'
#' This function deletes a TempCalculationGroupAcademicStandardWeighting.
#'
#' @param TempCalculationGroupAcademicStandardWeightingID The id of the TempCalculationGroupAcademicStandardWeighting.\cr Run \code{\link{getAllTempCalculationGroupAcademicStandardWeightings}} for a list of TempCalculationGroupAcademicStandardWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCalculationGroupAcademicStandardWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalculationGroupAcademicStandardWeighting <- function(TempCalculationGroupAcademicStandardWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCalculationGroupAcademicStandardWeighting", TempCalculationGroupAcademicStandardWeightingID, EntityID)
}
#' Get all TempCalculationGroupSubjectWeightings.
#'
#' This function returns a dataframe of all TempCalculationGroupSubjectWeightings 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 Gradebook
#' @return All TempCalculationGroupSubjectWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalculationGroupSubjectWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalculationGroupSubjectWeightingID = F, returnAcademicStandardDescription = F, returnAcademicStandardFullKey = F, returnAcademicStandardID = F, returnCalculationGroupSubjectGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupSubjectWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalculationGroupSubjectWeighting
#'
#' This function returns fields for a TempCalculationGroupSubjectWeighting.
#'
#' @param TempCalculationGroupSubjectWeightingID The id of the TempCalculationGroupSubjectWeighting.\cr Run \code{\link{getAllTempCalculationGroupSubjectWeightings}} for a list of TempCalculationGroupSubjectWeightings.
#' @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 Gradebook
#' @return Details for the TempCalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalculationGroupSubjectWeighting <- function(TempCalculationGroupSubjectWeightingID, EntityID = 1, returnTempCalculationGroupSubjectWeightingID = F, returnAcademicStandardDescription = F, returnAcademicStandardFullKey = F, returnAcademicStandardID = F, returnCalculationGroupSubjectGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupSubjectWeighting", TempCalculationGroupSubjectWeightingID, searchFields, EntityID)
}
#' Modify a specific TempCalculationGroupSubjectWeighting
#'
#' This function modifies fields for a TempCalculationGroupSubjectWeighting.
#'
#' @param TempCalculationGroupSubjectWeightingID The id of the TempCalculationGroupSubjectWeighting to be modified.\cr Run \code{\link{getAllTempCalculationGroupSubjectWeightings}} for a list of TempCalculationGroupSubjectWeightings.
#' @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 Gradebook
#' @return Details of the modified TempCalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalculationGroupSubjectWeighting <- function(TempCalculationGroupSubjectWeightingID, EntityID = 1, setAcademicStandardDescription = NULL, setAcademicStandardFullKey = NULL, setAcademicStandardID = NULL, setCalculationGroupSubjectGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupSubjectWeighting", TempCalculationGroupSubjectWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalculationGroupSubjectWeighting.
#'
#' This function creates a new TempCalculationGroupSubjectWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalculationGroupSubjectWeighting <- function(EntityID = 1, setAcademicStandardDescription = NULL, setAcademicStandardFullKey = NULL, setAcademicStandardID = NULL, setCalculationGroupSubjectGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupSubjectWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalculationGroupSubjectWeighting
#'
#' This function deletes a TempCalculationGroupSubjectWeighting.
#'
#' @param TempCalculationGroupSubjectWeightingID The id of the TempCalculationGroupSubjectWeighting.\cr Run \code{\link{getAllTempCalculationGroupSubjectWeightings}} for a list of TempCalculationGroupSubjectWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCalculationGroupSubjectWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalculationGroupSubjectWeighting <- function(TempCalculationGroupSubjectWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCalculationGroupSubjectWeighting", TempCalculationGroupSubjectWeightingID, EntityID)
}
#' Get all TempCalculationGroupWeightings.
#'
#' This function returns a dataframe of all TempCalculationGroupWeightings 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 Gradebook
#' @return All TempCalculationGroupWeightings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalculationGroupWeightings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalculationGroupWeightingID = F, returnAcademicStandardDescription = F, returnAcademicStandardFullKey = F, returnAcademicStandardID = F, returnCalculationGroupGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnGradeBucketLabel = F, returnGradeBucketOrder = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSubjectDescription = F, returnSubjectID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupWeighting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalculationGroupWeighting
#'
#' This function returns fields for a TempCalculationGroupWeighting.
#'
#' @param TempCalculationGroupWeightingID The id of the TempCalculationGroupWeighting.\cr Run \code{\link{getAllTempCalculationGroupWeightings}} for a list of TempCalculationGroupWeightings.
#' @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 Gradebook
#' @return Details for the TempCalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalculationGroupWeighting <- function(TempCalculationGroupWeightingID, EntityID = 1, returnTempCalculationGroupWeightingID = F, returnAcademicStandardDescription = F, returnAcademicStandardFullKey = F, returnAcademicStandardID = F, returnCalculationGroupGradeBucketID = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnGradeBucketLabel = F, returnGradeBucketOrder = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSubjectDescription = F, returnSubjectID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempCalculationGroupWeighting", TempCalculationGroupWeightingID, searchFields, EntityID)
}
#' Modify a specific TempCalculationGroupWeighting
#'
#' This function modifies fields for a TempCalculationGroupWeighting.
#'
#' @param TempCalculationGroupWeightingID The id of the TempCalculationGroupWeighting to be modified.\cr Run \code{\link{getAllTempCalculationGroupWeightings}} for a list of TempCalculationGroupWeightings.
#' @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 Gradebook
#' @return Details of the modified TempCalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalculationGroupWeighting <- function(TempCalculationGroupWeightingID, EntityID = 1, setAcademicStandardDescription = NULL, setAcademicStandardFullKey = NULL, setAcademicStandardID = NULL, setCalculationGroupGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setGradeBucketLabel = NULL, setGradeBucketOrder = NULL, setGradingPeriodGradeBucketID = NULL, setSubjectDescription = NULL, setSubjectID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupWeighting", TempCalculationGroupWeightingID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalculationGroupWeighting.
#'
#' This function creates a new TempCalculationGroupWeighting.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalculationGroupWeighting <- function(EntityID = 1, setAcademicStandardDescription = NULL, setAcademicStandardFullKey = NULL, setAcademicStandardID = NULL, setCalculationGroupGradeBucketID = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setGradeBucketLabel = NULL, setGradeBucketOrder = NULL, setGradingPeriodGradeBucketID = NULL, setSubjectDescription = NULL, setSubjectID = NULL, setWeightPercent = 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("Gradebook", "TempCalculationGroupWeighting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalculationGroupWeighting
#'
#' This function deletes a TempCalculationGroupWeighting.
#'
#' @param TempCalculationGroupWeightingID The id of the TempCalculationGroupWeighting.\cr Run \code{\link{getAllTempCalculationGroupWeightings}} for a list of TempCalculationGroupWeightings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCalculationGroupWeighting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalculationGroupWeighting <- function(TempCalculationGroupWeightingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCalculationGroupWeighting", TempCalculationGroupWeightingID, EntityID)
}
#' Get all TempCloneGradebookSections.
#'
#' This function returns a dataframe of all TempCloneGradebookSections 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 Gradebook
#' @return All TempCloneGradebookSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCloneGradebookSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCloneGradebookSectionID = F, returnCanClone = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempCloneGradebookSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCloneGradebookSection
#'
#' This function returns fields for a TempCloneGradebookSection.
#'
#' @param TempCloneGradebookSectionID The id of the TempCloneGradebookSection.\cr Run \code{\link{getAllTempCloneGradebookSections}} for a list of TempCloneGradebookSections.
#' @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 Gradebook
#' @return Details for the TempCloneGradebookSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCloneGradebookSection <- function(TempCloneGradebookSectionID, EntityID = 1, returnTempCloneGradebookSectionID = F, returnCanClone = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempCloneGradebookSection", TempCloneGradebookSectionID, searchFields, EntityID)
}
#' Modify a specific TempCloneGradebookSection
#'
#' This function modifies fields for a TempCloneGradebookSection.
#'
#' @param TempCloneGradebookSectionID The id of the TempCloneGradebookSection to be modified.\cr Run \code{\link{getAllTempCloneGradebookSections}} for a list of TempCloneGradebookSections.
#' @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 Gradebook
#' @return Details of the modified TempCloneGradebookSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCloneGradebookSection <- function(TempCloneGradebookSectionID, EntityID = 1, setCanClone = NULL, setErrorMessage = NULL, setSectionID = 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("Gradebook", "TempCloneGradebookSection", TempCloneGradebookSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCloneGradebookSection.
#'
#' This function creates a new TempCloneGradebookSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCloneGradebookSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCloneGradebookSection <- function(EntityID = 1, setCanClone = NULL, setErrorMessage = NULL, setSectionID = 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("Gradebook", "TempCloneGradebookSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCloneGradebookSection
#'
#' This function deletes a TempCloneGradebookSection.
#'
#' @param TempCloneGradebookSectionID The id of the TempCloneGradebookSection.\cr Run \code{\link{getAllTempCloneGradebookSections}} for a list of TempCloneGradebookSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCloneGradebookSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCloneGradebookSection <- function(TempCloneGradebookSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCloneGradebookSection", TempCloneGradebookSectionID, EntityID)
}
#' Get all TempCourseMoveCourses.
#'
#' This function returns a dataframe of all TempCourseMoveCourses 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 Gradebook
#' @return All TempCourseMoveCourses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCourseMoveCourses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCourseMoveCourseID = F, returnCodeDescription = F, returnCourseCode = F, returnCourseDescription = F, returnCourseID = F, returnCreatedTime = F, returnEntityID = F, returnGroupCourseID = F, returnIsValidUpdate = F, returnModifiedTime = F, returnNewCalculationGroupDescription = F, returnNewCalculationGroupID = F, returnOriginalCalculationGroupDescription = F, returnOriginalCalculationGroupID = 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("Gradebook", "TempCourseMoveCourse", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCourseMoveCourse
#'
#' This function returns fields for a TempCourseMoveCourse.
#'
#' @param TempCourseMoveCourseID The id of the TempCourseMoveCourse.\cr Run \code{\link{getAllTempCourseMoveCourses}} for a list of TempCourseMoveCourses.
#' @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 Gradebook
#' @return Details for the TempCourseMoveCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCourseMoveCourse <- function(TempCourseMoveCourseID, EntityID = 1, returnTempCourseMoveCourseID = F, returnCodeDescription = F, returnCourseCode = F, returnCourseDescription = F, returnCourseID = F, returnCreatedTime = F, returnEntityID = F, returnGroupCourseID = F, returnIsValidUpdate = F, returnModifiedTime = F, returnNewCalculationGroupDescription = F, returnNewCalculationGroupID = F, returnOriginalCalculationGroupDescription = F, returnOriginalCalculationGroupID = 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("Gradebook", "TempCourseMoveCourse", TempCourseMoveCourseID, searchFields, EntityID)
}
#' Modify a specific TempCourseMoveCourse
#'
#' This function modifies fields for a TempCourseMoveCourse.
#'
#' @param TempCourseMoveCourseID The id of the TempCourseMoveCourse to be modified.\cr Run \code{\link{getAllTempCourseMoveCourses}} for a list of TempCourseMoveCourses.
#' @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 Gradebook
#' @return Details of the modified TempCourseMoveCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCourseMoveCourse <- function(TempCourseMoveCourseID, EntityID = 1, setCodeDescription = NULL, setCourseCode = NULL, setCourseDescription = NULL, setCourseID = NULL, setEntityID = NULL, setGroupCourseID = NULL, setIsValidUpdate = NULL, setNewCalculationGroupDescription = NULL, setNewCalculationGroupID = NULL, setOriginalCalculationGroupDescription = NULL, setOriginalCalculationGroupID = 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("Gradebook", "TempCourseMoveCourse", TempCourseMoveCourseID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCourseMoveCourse.
#'
#' This function creates a new TempCourseMoveCourse.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCourseMoveCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCourseMoveCourse <- function(EntityID = 1, setCodeDescription = NULL, setCourseCode = NULL, setCourseDescription = NULL, setCourseID = NULL, setEntityID = NULL, setGroupCourseID = NULL, setIsValidUpdate = NULL, setNewCalculationGroupDescription = NULL, setNewCalculationGroupID = NULL, setOriginalCalculationGroupDescription = NULL, setOriginalCalculationGroupID = 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("Gradebook", "TempCourseMoveCourse", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCourseMoveCourse
#'
#' This function deletes a TempCourseMoveCourse.
#'
#' @param TempCourseMoveCourseID The id of the TempCourseMoveCourse.\cr Run \code{\link{getAllTempCourseMoveCourses}} for a list of TempCourseMoveCourses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCourseMoveCourse.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCourseMoveCourse <- function(TempCourseMoveCourseID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCourseMoveCourse", TempCourseMoveCourseID, EntityID)
}
#' Get all TempCourseMoveErrors.
#'
#' This function returns a dataframe of all TempCourseMoveErrors 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 Gradebook
#' @return All TempCourseMoveErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCourseMoveErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCourseMoveErrorID = F, returnBucketLabel = F, returnCreatedTime = F, returnErrorCode = F, returnErrorMessage = F, returnErrorType = F, returnErrorTypeCode = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempCourseMoveError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCourseMoveError
#'
#' This function returns fields for a TempCourseMoveError.
#'
#' @param TempCourseMoveErrorID The id of the TempCourseMoveError.\cr Run \code{\link{getAllTempCourseMoveErrors}} for a list of TempCourseMoveErrors.
#' @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 Gradebook
#' @return Details for the TempCourseMoveError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCourseMoveError <- function(TempCourseMoveErrorID, EntityID = 1, returnTempCourseMoveErrorID = F, returnBucketLabel = F, returnCreatedTime = F, returnErrorCode = F, returnErrorMessage = F, returnErrorType = F, returnErrorTypeCode = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempCourseMoveError", TempCourseMoveErrorID, searchFields, EntityID)
}
#' Modify a specific TempCourseMoveError
#'
#' This function modifies fields for a TempCourseMoveError.
#'
#' @param TempCourseMoveErrorID The id of the TempCourseMoveError to be modified.\cr Run \code{\link{getAllTempCourseMoveErrors}} for a list of TempCourseMoveErrors.
#' @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 Gradebook
#' @return Details of the modified TempCourseMoveError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCourseMoveError <- function(TempCourseMoveErrorID, EntityID = 1, setBucketLabel = NULL, setErrorCode = NULL, setErrorMessage = NULL, setErrorType = NULL, setErrorTypeCode = NULL, setSectionID = 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("Gradebook", "TempCourseMoveError", TempCourseMoveErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCourseMoveError.
#'
#' This function creates a new TempCourseMoveError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCourseMoveError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCourseMoveError <- function(EntityID = 1, setBucketLabel = NULL, setErrorCode = NULL, setErrorMessage = NULL, setErrorType = NULL, setErrorTypeCode = NULL, setSectionID = 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("Gradebook", "TempCourseMoveError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCourseMoveError
#'
#' This function deletes a TempCourseMoveError.
#'
#' @param TempCourseMoveErrorID The id of the TempCourseMoveError.\cr Run \code{\link{getAllTempCourseMoveErrors}} for a list of TempCourseMoveErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCourseMoveError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCourseMoveError <- function(TempCourseMoveErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCourseMoveError", TempCourseMoveErrorID, EntityID)
}
#' Get all TempCourseMoveSectionErrors.
#'
#' This function returns a dataframe of all TempCourseMoveSectionErrors 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 Gradebook
#' @return All TempCourseMoveSectionErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCourseMoveSectionErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCourseMoveSectionErrorID = F, returnCourseID = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionCode = F, returnSectionID = 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("Gradebook", "TempCourseMoveSectionError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCourseMoveSectionError
#'
#' This function returns fields for a TempCourseMoveSectionError.
#'
#' @param TempCourseMoveSectionErrorID The id of the TempCourseMoveSectionError.\cr Run \code{\link{getAllTempCourseMoveSectionErrors}} for a list of TempCourseMoveSectionErrors.
#' @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 Gradebook
#' @return Details for the TempCourseMoveSectionError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCourseMoveSectionError <- function(TempCourseMoveSectionErrorID, EntityID = 1, returnTempCourseMoveSectionErrorID = F, returnCourseID = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionCode = F, returnSectionID = 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("Gradebook", "TempCourseMoveSectionError", TempCourseMoveSectionErrorID, searchFields, EntityID)
}
#' Modify a specific TempCourseMoveSectionError
#'
#' This function modifies fields for a TempCourseMoveSectionError.
#'
#' @param TempCourseMoveSectionErrorID The id of the TempCourseMoveSectionError to be modified.\cr Run \code{\link{getAllTempCourseMoveSectionErrors}} for a list of TempCourseMoveSectionErrors.
#' @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 Gradebook
#' @return Details of the modified TempCourseMoveSectionError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCourseMoveSectionError <- function(TempCourseMoveSectionErrorID, EntityID = 1, setCourseID = NULL, setErrorMessage = NULL, setSectionCode = NULL, setSectionID = 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("Gradebook", "TempCourseMoveSectionError", TempCourseMoveSectionErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCourseMoveSectionError.
#'
#' This function creates a new TempCourseMoveSectionError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempCourseMoveSectionError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCourseMoveSectionError <- function(EntityID = 1, setCourseID = NULL, setErrorMessage = NULL, setSectionCode = NULL, setSectionID = 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("Gradebook", "TempCourseMoveSectionError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCourseMoveSectionError
#'
#' This function deletes a TempCourseMoveSectionError.
#'
#' @param TempCourseMoveSectionErrorID The id of the TempCourseMoveSectionError.\cr Run \code{\link{getAllTempCourseMoveSectionErrors}} for a list of TempCourseMoveSectionErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempCourseMoveSectionError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCourseMoveSectionError <- function(TempCourseMoveSectionErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempCourseMoveSectionError", TempCourseMoveSectionErrorID, EntityID)
}
#' Get all TempDropLowScoreStudentAssignments.
#'
#' This function returns a dataframe of all TempDropLowScoreStudentAssignments 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 Gradebook
#' @return All TempDropLowScoreStudentAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempDropLowScoreStudentAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempDropLowScoreStudentAssignmentID = F, returnAssignmentName = F, returnComments = F, returnCreatedTime = F, returnDropActionType = F, returnDropActionTypeCode = F, returnDropCode = F, returnDropLowScore = F, returnDueDate = F, returnMaxScore = F, returnModifiedTime = F, returnNewGrade = F, returnNoDropReason = F, returnOriginalGrade = F, returnScore = F, returnStudentAssignmentID = F, returnStudentDisplaySortCode = F, returnStudentName = F, returnStudentSectionID = F, returnUndoDropActionType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempDropLowScoreStudentAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempDropLowScoreStudentAssignment
#'
#' This function returns fields for a TempDropLowScoreStudentAssignment.
#'
#' @param TempDropLowScoreStudentAssignmentID The id of the TempDropLowScoreStudentAssignment.\cr Run \code{\link{getAllTempDropLowScoreStudentAssignments}} for a list of TempDropLowScoreStudentAssignments.
#' @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 Gradebook
#' @return Details for the TempDropLowScoreStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempDropLowScoreStudentAssignment <- function(TempDropLowScoreStudentAssignmentID, EntityID = 1, returnTempDropLowScoreStudentAssignmentID = F, returnAssignmentName = F, returnComments = F, returnCreatedTime = F, returnDropActionType = F, returnDropActionTypeCode = F, returnDropCode = F, returnDropLowScore = F, returnDueDate = F, returnMaxScore = F, returnModifiedTime = F, returnNewGrade = F, returnNoDropReason = F, returnOriginalGrade = F, returnScore = F, returnStudentAssignmentID = F, returnStudentDisplaySortCode = F, returnStudentName = F, returnStudentSectionID = F, returnUndoDropActionType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempDropLowScoreStudentAssignment", TempDropLowScoreStudentAssignmentID, searchFields, EntityID)
}
#' Modify a specific TempDropLowScoreStudentAssignment
#'
#' This function modifies fields for a TempDropLowScoreStudentAssignment.
#'
#' @param TempDropLowScoreStudentAssignmentID The id of the TempDropLowScoreStudentAssignment to be modified.\cr Run \code{\link{getAllTempDropLowScoreStudentAssignments}} for a list of TempDropLowScoreStudentAssignments.
#' @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 Gradebook
#' @return Details of the modified TempDropLowScoreStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempDropLowScoreStudentAssignment <- function(TempDropLowScoreStudentAssignmentID, EntityID = 1, setAssignmentName = NULL, setComments = NULL, setDropActionType = NULL, setDropActionTypeCode = NULL, setDropCode = NULL, setDropLowScore = NULL, setDueDate = NULL, setMaxScore = NULL, setNewGrade = NULL, setNoDropReason = NULL, setOriginalGrade = NULL, setScore = NULL, setStudentAssignmentID = NULL, setStudentDisplaySortCode = NULL, setStudentName = NULL, setStudentSectionID = NULL, setWeight = 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("Gradebook", "TempDropLowScoreStudentAssignment", TempDropLowScoreStudentAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new TempDropLowScoreStudentAssignment.
#'
#' This function creates a new TempDropLowScoreStudentAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempDropLowScoreStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempDropLowScoreStudentAssignment <- function(EntityID = 1, setAssignmentName = NULL, setComments = NULL, setDropActionType = NULL, setDropActionTypeCode = NULL, setDropCode = NULL, setDropLowScore = NULL, setDueDate = NULL, setMaxScore = NULL, setNewGrade = NULL, setNoDropReason = NULL, setOriginalGrade = NULL, setScore = NULL, setStudentAssignmentID = NULL, setStudentDisplaySortCode = NULL, setStudentName = NULL, setStudentSectionID = NULL, setWeight = 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("Gradebook", "TempDropLowScoreStudentAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempDropLowScoreStudentAssignment
#'
#' This function deletes a TempDropLowScoreStudentAssignment.
#'
#' @param TempDropLowScoreStudentAssignmentID The id of the TempDropLowScoreStudentAssignment.\cr Run \code{\link{getAllTempDropLowScoreStudentAssignments}} for a list of TempDropLowScoreStudentAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempDropLowScoreStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempDropLowScoreStudentAssignment <- function(TempDropLowScoreStudentAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempDropLowScoreStudentAssignment", TempDropLowScoreStudentAssignmentID, EntityID)
}
#' Get all TempGradebookCloneErrors.
#'
#' This function returns a dataframe of all TempGradebookCloneErrors 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 Gradebook
#' @return All TempGradebookCloneErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempGradebookCloneErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempGradebookCloneErrorID = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnField = F, returnGradeBucketLabel = F, returnMessage = F, returnModifiedTime = F, returnRecordType = F, returnRecordTypeCode = F, returnSectionID = 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("Gradebook", "TempGradebookCloneError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempGradebookCloneError
#'
#' This function returns fields for a TempGradebookCloneError.
#'
#' @param TempGradebookCloneErrorID The id of the TempGradebookCloneError.\cr Run \code{\link{getAllTempGradebookCloneErrors}} for a list of TempGradebookCloneErrors.
#' @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 Gradebook
#' @return Details for the TempGradebookCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempGradebookCloneError <- function(TempGradebookCloneErrorID, EntityID = 1, returnTempGradebookCloneErrorID = F, returnCalculationGroupGradeBucketID = F, returnCreatedTime = F, returnField = F, returnGradeBucketLabel = F, returnMessage = F, returnModifiedTime = F, returnRecordType = F, returnRecordTypeCode = F, returnSectionID = 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("Gradebook", "TempGradebookCloneError", TempGradebookCloneErrorID, searchFields, EntityID)
}
#' Modify a specific TempGradebookCloneError
#'
#' This function modifies fields for a TempGradebookCloneError.
#'
#' @param TempGradebookCloneErrorID The id of the TempGradebookCloneError to be modified.\cr Run \code{\link{getAllTempGradebookCloneErrors}} for a list of TempGradebookCloneErrors.
#' @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 Gradebook
#' @return Details of the modified TempGradebookCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempGradebookCloneError <- function(TempGradebookCloneErrorID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setField = NULL, setGradeBucketLabel = NULL, setMessage = NULL, setRecordType = NULL, setRecordTypeCode = NULL, setSectionID = 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("Gradebook", "TempGradebookCloneError", TempGradebookCloneErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempGradebookCloneError.
#'
#' This function creates a new TempGradebookCloneError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempGradebookCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempGradebookCloneError <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setField = NULL, setGradeBucketLabel = NULL, setMessage = NULL, setRecordType = NULL, setRecordTypeCode = NULL, setSectionID = 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("Gradebook", "TempGradebookCloneError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempGradebookCloneError
#'
#' This function deletes a TempGradebookCloneError.
#'
#' @param TempGradebookCloneErrorID The id of the TempGradebookCloneError.\cr Run \code{\link{getAllTempGradebookCloneErrors}} for a list of TempGradebookCloneErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempGradebookCloneError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempGradebookCloneError <- function(TempGradebookCloneErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempGradebookCloneError", TempGradebookCloneErrorID, EntityID)
}
#' Get all TempGradebookGroupErrors.
#'
#' This function returns a dataframe of all TempGradebookGroupErrors 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 Gradebook
#' @return All TempGradebookGroupErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempGradebookGroupErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempGradebookGroupErrorID = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnErrorText = F, returnGradingScaleGroupID = 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("Gradebook", "TempGradebookGroupError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempGradebookGroupError
#'
#' This function returns fields for a TempGradebookGroupError.
#'
#' @param TempGradebookGroupErrorID The id of the TempGradebookGroupError.\cr Run \code{\link{getAllTempGradebookGroupErrors}} for a list of TempGradebookGroupErrors.
#' @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 Gradebook
#' @return Details for the TempGradebookGroupError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempGradebookGroupError <- function(TempGradebookGroupErrorID, EntityID = 1, returnTempGradebookGroupErrorID = F, returnCalculationGroupID = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnErrorText = F, returnGradingScaleGroupID = 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("Gradebook", "TempGradebookGroupError", TempGradebookGroupErrorID, searchFields, EntityID)
}
#' Modify a specific TempGradebookGroupError
#'
#' This function modifies fields for a TempGradebookGroupError.
#'
#' @param TempGradebookGroupErrorID The id of the TempGradebookGroupError to be modified.\cr Run \code{\link{getAllTempGradebookGroupErrors}} for a list of TempGradebookGroupErrors.
#' @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 Gradebook
#' @return Details of the modified TempGradebookGroupError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempGradebookGroupError <- function(TempGradebookGroupErrorID, EntityID = 1, setCalculationGroupID = NULL, setDescription = NULL, setEntityID = NULL, setErrorText = NULL, setGradingScaleGroupID = 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("Gradebook", "TempGradebookGroupError", TempGradebookGroupErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempGradebookGroupError.
#'
#' This function creates a new TempGradebookGroupError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempGradebookGroupError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempGradebookGroupError <- function(EntityID = 1, setCalculationGroupID = NULL, setDescription = NULL, setEntityID = NULL, setErrorText = NULL, setGradingScaleGroupID = 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("Gradebook", "TempGradebookGroupError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempGradebookGroupError
#'
#' This function deletes a TempGradebookGroupError.
#'
#' @param TempGradebookGroupErrorID The id of the TempGradebookGroupError.\cr Run \code{\link{getAllTempGradebookGroupErrors}} for a list of TempGradebookGroupErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempGradebookGroupError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempGradebookGroupError <- function(TempGradebookGroupErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempGradebookGroupError", TempGradebookGroupErrorID, EntityID)
}
#' Get all TempGradeMarkErrors.
#'
#' This function returns a dataframe of all TempGradeMarkErrors 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 Gradebook
#' @return All TempGradeMarkErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempGradeMarkErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempGradeMarkErrorID = F, returnCreatedTime = F, returnDisplayOrder = F, returnGradeMarkCode = F, returnGradeMarkID = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempGradeMarkError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempGradeMarkError
#'
#' This function returns fields for a TempGradeMarkError.
#'
#' @param TempGradeMarkErrorID The id of the TempGradeMarkError.\cr Run \code{\link{getAllTempGradeMarkErrors}} for a list of TempGradeMarkErrors.
#' @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 Gradebook
#' @return Details for the TempGradeMarkError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempGradeMarkError <- function(TempGradeMarkErrorID, EntityID = 1, returnTempGradeMarkErrorID = F, returnCreatedTime = F, returnDisplayOrder = F, returnGradeMarkCode = F, returnGradeMarkID = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempGradeMarkError", TempGradeMarkErrorID, searchFields, EntityID)
}
#' Modify a specific TempGradeMarkError
#'
#' This function modifies fields for a TempGradeMarkError.
#'
#' @param TempGradeMarkErrorID The id of the TempGradeMarkError to be modified.\cr Run \code{\link{getAllTempGradeMarkErrors}} for a list of TempGradeMarkErrors.
#' @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 Gradebook
#' @return Details of the modified TempGradeMarkError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempGradeMarkError <- function(TempGradeMarkErrorID, EntityID = 1, setDisplayOrder = NULL, setGradeMarkCode = NULL, setGradeMarkID = NULL, setSectionID = 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("Gradebook", "TempGradeMarkError", TempGradeMarkErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempGradeMarkError.
#'
#' This function creates a new TempGradeMarkError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempGradeMarkError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempGradeMarkError <- function(EntityID = 1, setDisplayOrder = NULL, setGradeMarkCode = NULL, setGradeMarkID = NULL, setSectionID = 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("Gradebook", "TempGradeMarkError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempGradeMarkError
#'
#' This function deletes a TempGradeMarkError.
#'
#' @param TempGradeMarkErrorID The id of the TempGradeMarkError.\cr Run \code{\link{getAllTempGradeMarkErrors}} for a list of TempGradeMarkErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempGradeMarkError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempGradeMarkError <- function(TempGradeMarkErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempGradeMarkError", TempGradeMarkErrorID, EntityID)
}
#' Get all TempGradingPeriodGradeBuckets.
#'
#' This function returns a dataframe of all TempGradingPeriodGradeBuckets 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 Gradebook
#' @return All TempGradingPeriodGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempGradingPeriodGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempGradingPeriodGradeBucketID = F, returnCreatedTime = F, returnEndDate = F, returnErrorCount = F, returnGradeBucketLabelWithDates = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSectionLengthCodeDescription = F, returnStartDate = F, returnStatusDisplayWithExtensionDate = 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("Gradebook", "TempGradingPeriodGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempGradingPeriodGradeBucket
#'
#' This function returns fields for a TempGradingPeriodGradeBucket.
#'
#' @param TempGradingPeriodGradeBucketID The id of the TempGradingPeriodGradeBucket.\cr Run \code{\link{getAllTempGradingPeriodGradeBuckets}} for a list of TempGradingPeriodGradeBuckets.
#' @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 Gradebook
#' @return Details for the TempGradingPeriodGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempGradingPeriodGradeBucket <- function(TempGradingPeriodGradeBucketID, EntityID = 1, returnTempGradingPeriodGradeBucketID = F, returnCreatedTime = F, returnEndDate = F, returnErrorCount = F, returnGradeBucketLabelWithDates = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSectionLengthCodeDescription = F, returnStartDate = F, returnStatusDisplayWithExtensionDate = 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("Gradebook", "TempGradingPeriodGradeBucket", TempGradingPeriodGradeBucketID, searchFields, EntityID)
}
#' Modify a specific TempGradingPeriodGradeBucket
#'
#' This function modifies fields for a TempGradingPeriodGradeBucket.
#'
#' @param TempGradingPeriodGradeBucketID The id of the TempGradingPeriodGradeBucket to be modified.\cr Run \code{\link{getAllTempGradingPeriodGradeBuckets}} for a list of TempGradingPeriodGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified TempGradingPeriodGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempGradingPeriodGradeBucket <- function(TempGradingPeriodGradeBucketID, EntityID = 1, setEndDate = NULL, setErrorCount = NULL, setGradeBucketLabelWithDates = NULL, setGradingPeriodGradeBucketID = NULL, setSectionLengthCodeDescription = NULL, setStartDate = NULL, setStatusDisplayWithExtensionDate = 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("Gradebook", "TempGradingPeriodGradeBucket", TempGradingPeriodGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new TempGradingPeriodGradeBucket.
#'
#' This function creates a new TempGradingPeriodGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempGradingPeriodGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempGradingPeriodGradeBucket <- function(EntityID = 1, setEndDate = NULL, setErrorCount = NULL, setGradeBucketLabelWithDates = NULL, setGradingPeriodGradeBucketID = NULL, setSectionLengthCodeDescription = NULL, setStartDate = NULL, setStatusDisplayWithExtensionDate = 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("Gradebook", "TempGradingPeriodGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempGradingPeriodGradeBucket
#'
#' This function deletes a TempGradingPeriodGradeBucket.
#'
#' @param TempGradingPeriodGradeBucketID The id of the TempGradingPeriodGradeBucket.\cr Run \code{\link{getAllTempGradingPeriodGradeBuckets}} for a list of TempGradingPeriodGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempGradingPeriodGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempGradingPeriodGradeBucket <- function(TempGradingPeriodGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempGradingPeriodGradeBucket", TempGradingPeriodGradeBucketID, EntityID)
}
#' Get all TempGradingPeriodGradeBucketErrors.
#'
#' This function returns a dataframe of all TempGradingPeriodGradeBucketErrors 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 Gradebook
#' @return All TempGradingPeriodGradeBucketErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempGradingPeriodGradeBucketErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempGradingPeriodGradeBucketErrorID = F, returnCalculationGroupID = F, returnCalculationType = F, returnCreatedTime = F, returnEndDate = F, returnErrorNumber = F, returnErrorText = F, returnGradeBucketLabelWithDates = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSectionLengthCodeDescription = F, returnStartDate = F, returnStatusDisplayWithExtensionDate = F, returnSubjectOrStandardDescription = F, returnSubjectOrStandardKey = 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("Gradebook", "TempGradingPeriodGradeBucketError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempGradingPeriodGradeBucketError
#'
#' This function returns fields for a TempGradingPeriodGradeBucketError.
#'
#' @param TempGradingPeriodGradeBucketErrorID The id of the TempGradingPeriodGradeBucketError.\cr Run \code{\link{getAllTempGradingPeriodGradeBucketErrors}} for a list of TempGradingPeriodGradeBucketErrors.
#' @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 Gradebook
#' @return Details for the TempGradingPeriodGradeBucketError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempGradingPeriodGradeBucketError <- function(TempGradingPeriodGradeBucketErrorID, EntityID = 1, returnTempGradingPeriodGradeBucketErrorID = F, returnCalculationGroupID = F, returnCalculationType = F, returnCreatedTime = F, returnEndDate = F, returnErrorNumber = F, returnErrorText = F, returnGradeBucketLabelWithDates = F, returnGradingPeriodGradeBucketID = F, returnModifiedTime = F, returnSectionLengthCodeDescription = F, returnStartDate = F, returnStatusDisplayWithExtensionDate = F, returnSubjectOrStandardDescription = F, returnSubjectOrStandardKey = 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("Gradebook", "TempGradingPeriodGradeBucketError", TempGradingPeriodGradeBucketErrorID, searchFields, EntityID)
}
#' Modify a specific TempGradingPeriodGradeBucketError
#'
#' This function modifies fields for a TempGradingPeriodGradeBucketError.
#'
#' @param TempGradingPeriodGradeBucketErrorID The id of the TempGradingPeriodGradeBucketError to be modified.\cr Run \code{\link{getAllTempGradingPeriodGradeBucketErrors}} for a list of TempGradingPeriodGradeBucketErrors.
#' @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 Gradebook
#' @return Details of the modified TempGradingPeriodGradeBucketError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempGradingPeriodGradeBucketError <- function(TempGradingPeriodGradeBucketErrorID, EntityID = 1, setCalculationGroupID = NULL, setCalculationType = NULL, setEndDate = NULL, setErrorNumber = NULL, setErrorText = NULL, setGradeBucketLabelWithDates = NULL, setGradingPeriodGradeBucketID = NULL, setSectionLengthCodeDescription = NULL, setStartDate = NULL, setStatusDisplayWithExtensionDate = NULL, setSubjectOrStandardDescription = NULL, setSubjectOrStandardKey = 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("Gradebook", "TempGradingPeriodGradeBucketError", TempGradingPeriodGradeBucketErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempGradingPeriodGradeBucketError.
#'
#' This function creates a new TempGradingPeriodGradeBucketError.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempGradingPeriodGradeBucketError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempGradingPeriodGradeBucketError <- function(EntityID = 1, setCalculationGroupID = NULL, setCalculationType = NULL, setEndDate = NULL, setErrorNumber = NULL, setErrorText = NULL, setGradeBucketLabelWithDates = NULL, setGradingPeriodGradeBucketID = NULL, setSectionLengthCodeDescription = NULL, setStartDate = NULL, setStatusDisplayWithExtensionDate = NULL, setSubjectOrStandardDescription = NULL, setSubjectOrStandardKey = 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("Gradebook", "TempGradingPeriodGradeBucketError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempGradingPeriodGradeBucketError
#'
#' This function deletes a TempGradingPeriodGradeBucketError.
#'
#' @param TempGradingPeriodGradeBucketErrorID The id of the TempGradingPeriodGradeBucketError.\cr Run \code{\link{getAllTempGradingPeriodGradeBucketErrors}} for a list of TempGradingPeriodGradeBucketErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempGradingPeriodGradeBucketError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempGradingPeriodGradeBucketError <- function(TempGradingPeriodGradeBucketErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempGradingPeriodGradeBucketError", TempGradingPeriodGradeBucketErrorID, EntityID)
}
#' Get all TempSectionAssignments.
#'
#' This function returns a dataframe of all TempSectionAssignments 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 Gradebook
#' @return All TempSectionAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionAssignmentID = F, returnAnswerRevealDate = F, returnAnswerRevealDateAndTime = F, returnAnswerRevealTime = F, returnAssignedDate = F, returnAssignmentID = F, returnAssignmentName = F, returnAttachmentCount = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnCurrentPeriod = F, returnDueDate = F, returnEndDate = F, returnEndDateAndTime = F, returnEndTime = F, returnEntityID = F, returnErrorCount = F, returnHideScoreUntilDate = F, returnHideScoreUntilDateAndTime = F, returnHideScoreUntilTime = F, returnIsOnlineAssignment = F, returnMaxScore = F, returnModifiedTime = F, returnSchoolYearID = F, returnSectionDetails = F, returnSectionID = F, returnSectionLengthEndDate = F, returnSectionLengthStartDate = F, returnShowCorrectAnswers = F, returnStartDate = F, returnStartDateAndTime = F, returnStartTime = F, returnSync = F, returnUseForSpecificGradeBucketType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempSectionAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionAssignment
#'
#' This function returns fields for a TempSectionAssignment.
#'
#' @param TempSectionAssignmentID The id of the TempSectionAssignment.\cr Run \code{\link{getAllTempSectionAssignments}} for a list of TempSectionAssignments.
#' @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 Gradebook
#' @return Details for the TempSectionAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionAssignment <- function(TempSectionAssignmentID, EntityID = 1, returnTempSectionAssignmentID = F, returnAnswerRevealDate = F, returnAnswerRevealDateAndTime = F, returnAnswerRevealTime = F, returnAssignedDate = F, returnAssignmentID = F, returnAssignmentName = F, returnAttachmentCount = F, returnCategoryDescription = F, returnCategoryID = F, returnCreatedTime = F, returnCurrentPeriod = F, returnDueDate = F, returnEndDate = F, returnEndDateAndTime = F, returnEndTime = F, returnEntityID = F, returnErrorCount = F, returnHideScoreUntilDate = F, returnHideScoreUntilDateAndTime = F, returnHideScoreUntilTime = F, returnIsOnlineAssignment = F, returnMaxScore = F, returnModifiedTime = F, returnSchoolYearID = F, returnSectionDetails = F, returnSectionID = F, returnSectionLengthEndDate = F, returnSectionLengthStartDate = F, returnShowCorrectAnswers = F, returnStartDate = F, returnStartDateAndTime = F, returnStartTime = F, returnSync = F, returnUseForSpecificGradeBucketType = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempSectionAssignment", TempSectionAssignmentID, searchFields, EntityID)
}
#' Modify a specific TempSectionAssignment
#'
#' This function modifies fields for a TempSectionAssignment.
#'
#' @param TempSectionAssignmentID The id of the TempSectionAssignment to be modified.\cr Run \code{\link{getAllTempSectionAssignments}} for a list of TempSectionAssignments.
#' @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 Gradebook
#' @return Details of the modified TempSectionAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionAssignment <- function(TempSectionAssignmentID, EntityID = 1, setAnswerRevealDate = NULL, setAnswerRevealDateAndTime = NULL, setAnswerRevealTime = NULL, setAssignedDate = NULL, setAssignmentID = NULL, setAssignmentName = NULL, setAttachmentCount = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setCurrentPeriod = NULL, setDueDate = NULL, setEndDate = NULL, setEndDateAndTime = NULL, setEndTime = NULL, setEntityID = NULL, setErrorCount = NULL, setHideScoreUntilDate = NULL, setHideScoreUntilDateAndTime = NULL, setHideScoreUntilTime = NULL, setIsOnlineAssignment = NULL, setMaxScore = NULL, setSchoolYearID = NULL, setSectionDetails = NULL, setSectionID = NULL, setSectionLengthEndDate = NULL, setSectionLengthStartDate = NULL, setShowCorrectAnswers = NULL, setStartDate = NULL, setStartDateAndTime = NULL, setStartTime = NULL, setSync = NULL, setUseForSpecificGradeBucketType = NULL, setWeight = 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("Gradebook", "TempSectionAssignment", TempSectionAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionAssignment.
#'
#' This function creates a new TempSectionAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionAssignment <- function(EntityID = 1, setAnswerRevealDate = NULL, setAnswerRevealDateAndTime = NULL, setAnswerRevealTime = NULL, setAssignedDate = NULL, setAssignmentID = NULL, setAssignmentName = NULL, setAttachmentCount = NULL, setCategoryDescription = NULL, setCategoryID = NULL, setCurrentPeriod = NULL, setDueDate = NULL, setEndDate = NULL, setEndDateAndTime = NULL, setEndTime = NULL, setEntityID = NULL, setErrorCount = NULL, setHideScoreUntilDate = NULL, setHideScoreUntilDateAndTime = NULL, setHideScoreUntilTime = NULL, setIsOnlineAssignment = NULL, setMaxScore = NULL, setSchoolYearID = NULL, setSectionDetails = NULL, setSectionID = NULL, setSectionLengthEndDate = NULL, setSectionLengthStartDate = NULL, setShowCorrectAnswers = NULL, setStartDate = NULL, setStartDateAndTime = NULL, setStartTime = NULL, setSync = NULL, setUseForSpecificGradeBucketType = NULL, setWeight = 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("Gradebook", "TempSectionAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionAssignment
#'
#' This function deletes a TempSectionAssignment.
#'
#' @param TempSectionAssignmentID The id of the TempSectionAssignment.\cr Run \code{\link{getAllTempSectionAssignments}} for a list of TempSectionAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionAssignment <- function(TempSectionAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionAssignment", TempSectionAssignmentID, EntityID)
}
#' Get all TempSectionCategories.
#'
#' This function returns a dataframe of all TempSectionCategories 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 Gradebook
#' @return All TempSectionCategories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionCategoryID = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupID = F, returnCanClone = F, returnCategoryCode = F, returnCategoryID = F, returnCategoryIDIsInvalid = F, returnCreatedTime = F, returnErrorMessages = F, returnModifiedTime = F, returnSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempSectionCategory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionCategory
#'
#' This function returns fields for a TempSectionCategory.
#'
#' @param TempSectionCategoryID The id of the TempSectionCategory.\cr Run \code{\link{getAllTempSectionCategories}} for a list of TempSectionCategories.
#' @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 Gradebook
#' @return Details for the TempSectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionCategory <- function(TempSectionCategoryID, EntityID = 1, returnTempSectionCategoryID = F, returnCalculationGroupGradeBucketID = F, returnCalculationGroupID = F, returnCanClone = F, returnCategoryCode = F, returnCategoryID = F, returnCategoryIDIsInvalid = F, returnCreatedTime = F, returnErrorMessages = F, returnModifiedTime = F, returnSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempSectionCategory", TempSectionCategoryID, searchFields, EntityID)
}
#' Modify a specific TempSectionCategory
#'
#' This function modifies fields for a TempSectionCategory.
#'
#' @param TempSectionCategoryID The id of the TempSectionCategory to be modified.\cr Run \code{\link{getAllTempSectionCategories}} for a list of TempSectionCategorys.
#' @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 Gradebook
#' @return Details of the modified TempSectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionCategory <- function(TempSectionCategoryID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationGroupID = NULL, setCanClone = NULL, setCategoryCode = NULL, setCategoryID = NULL, setCategoryIDIsInvalid = NULL, setErrorMessages = NULL, setSectionID = NULL, setWeightPercent = 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("Gradebook", "TempSectionCategory", TempSectionCategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionCategory.
#'
#' This function creates a new TempSectionCategory.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionCategory <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCalculationGroupID = NULL, setCanClone = NULL, setCategoryCode = NULL, setCategoryID = NULL, setCategoryIDIsInvalid = NULL, setErrorMessages = NULL, setSectionID = NULL, setWeightPercent = 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("Gradebook", "TempSectionCategory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionCategory
#'
#' This function deletes a TempSectionCategory.
#'
#' @param TempSectionCategoryID The id of the TempSectionCategory.\cr Run \code{\link{getAllTempSectionCategories}} for a list of TempSectionCategories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionCategory <- function(TempSectionCategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionCategory", TempSectionCategoryID, EntityID)
}
#' Get all TempSectionGradeBuckets.
#'
#' This function returns a dataframe of all TempSectionGradeBuckets 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 Gradebook
#' @return All TempSectionGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCanClone = F, returnChildRecords = F, returnCreatedTime = F, returnCurrentAllowCategoryOverride = F, returnCurrentCalculationType = F, returnCurrentCalculationTypeCode = F, returnEndDate = F, returnErrorMessages = F, returnExclude = F, returnGradeBucketLabel = F, returnGradeBucketTypeID = F, returnHasLeftOverPercentage = F, returnIsCalculationTypeOverridden = F, returnIsSpecificGradeBucket = F, returnModifiedTime = F, returnNewCalculationType = F, returnNewCalculationTypeCode = F, returnOrder = F, returnSectionGradeBucketID = F, returnSectionID = 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("Gradebook", "TempSectionGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionGradeBucket
#'
#' This function returns fields for a TempSectionGradeBucket.
#'
#' @param TempSectionGradeBucketID The id of the TempSectionGradeBucket.\cr Run \code{\link{getAllTempSectionGradeBuckets}} for a list of TempSectionGradeBuckets.
#' @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 Gradebook
#' @return Details for the TempSectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionGradeBucket <- function(TempSectionGradeBucketID, EntityID = 1, returnTempSectionGradeBucketID = F, returnCalculationGroupGradeBucketID = F, returnCanClone = F, returnChildRecords = F, returnCreatedTime = F, returnCurrentAllowCategoryOverride = F, returnCurrentCalculationType = F, returnCurrentCalculationTypeCode = F, returnEndDate = F, returnErrorMessages = F, returnExclude = F, returnGradeBucketLabel = F, returnGradeBucketTypeID = F, returnHasLeftOverPercentage = F, returnIsCalculationTypeOverridden = F, returnIsSpecificGradeBucket = F, returnModifiedTime = F, returnNewCalculationType = F, returnNewCalculationTypeCode = F, returnOrder = F, returnSectionGradeBucketID = F, returnSectionID = 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("Gradebook", "TempSectionGradeBucket", TempSectionGradeBucketID, searchFields, EntityID)
}
#' Modify a specific TempSectionGradeBucket
#'
#' This function modifies fields for a TempSectionGradeBucket.
#'
#' @param TempSectionGradeBucketID The id of the TempSectionGradeBucket to be modified.\cr Run \code{\link{getAllTempSectionGradeBuckets}} for a list of TempSectionGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified TempSectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionGradeBucket <- function(TempSectionGradeBucketID, EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCanClone = NULL, setChildRecords = NULL, setCurrentAllowCategoryOverride = NULL, setCurrentCalculationType = NULL, setCurrentCalculationTypeCode = NULL, setEndDate = NULL, setErrorMessages = NULL, setExclude = NULL, setGradeBucketLabel = NULL, setGradeBucketTypeID = NULL, setHasLeftOverPercentage = NULL, setIsCalculationTypeOverridden = NULL, setIsSpecificGradeBucket = NULL, setNewCalculationType = NULL, setNewCalculationTypeCode = NULL, setOrder = NULL, setSectionGradeBucketID = NULL, setSectionID = 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("Gradebook", "TempSectionGradeBucket", TempSectionGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionGradeBucket.
#'
#' This function creates a new TempSectionGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionGradeBucket <- function(EntityID = 1, setCalculationGroupGradeBucketID = NULL, setCanClone = NULL, setChildRecords = NULL, setCurrentAllowCategoryOverride = NULL, setCurrentCalculationType = NULL, setCurrentCalculationTypeCode = NULL, setEndDate = NULL, setErrorMessages = NULL, setExclude = NULL, setGradeBucketLabel = NULL, setGradeBucketTypeID = NULL, setHasLeftOverPercentage = NULL, setIsCalculationTypeOverridden = NULL, setIsSpecificGradeBucket = NULL, setNewCalculationType = NULL, setNewCalculationTypeCode = NULL, setOrder = NULL, setSectionGradeBucketID = NULL, setSectionID = 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("Gradebook", "TempSectionGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionGradeBucket
#'
#' This function deletes a TempSectionGradeBucket.
#'
#' @param TempSectionGradeBucketID The id of the TempSectionGradeBucket.\cr Run \code{\link{getAllTempSectionGradeBuckets}} for a list of TempSectionGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionGradeBucket <- function(TempSectionGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionGradeBucket", TempSectionGradeBucketID, EntityID)
}
#' Get all TempSectionGradeBucketWeights.
#'
#' This function returns a dataframe of all TempSectionGradeBucketWeights 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 Gradebook
#' @return All TempSectionGradeBucketWeights in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionGradeBucketWeights <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionGradeBucketWeightID = F, returnAcademicStandardIDToWeight = F, returnCalculationGroupGradeBucketIDComposite = F, returnCalculationGroupGradeBucketIDFeeder = F, returnCanClone = F, returnCreatedTime = F, returnModifiedTime = F, returnSectionID = F, returnSubjectIDToWeight = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempSectionGradeBucketWeight", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionGradeBucketWeight
#'
#' This function returns fields for a TempSectionGradeBucketWeight.
#'
#' @param TempSectionGradeBucketWeightID The id of the TempSectionGradeBucketWeight.\cr Run \code{\link{getAllTempSectionGradeBucketWeights}} for a list of TempSectionGradeBucketWeights.
#' @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 Gradebook
#' @return Details for the TempSectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionGradeBucketWeight <- function(TempSectionGradeBucketWeightID, EntityID = 1, returnTempSectionGradeBucketWeightID = F, returnAcademicStandardIDToWeight = F, returnCalculationGroupGradeBucketIDComposite = F, returnCalculationGroupGradeBucketIDFeeder = F, returnCanClone = F, returnCreatedTime = F, returnModifiedTime = F, returnSectionID = F, returnSubjectIDToWeight = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeightPercent = 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("Gradebook", "TempSectionGradeBucketWeight", TempSectionGradeBucketWeightID, searchFields, EntityID)
}
#' Modify a specific TempSectionGradeBucketWeight
#'
#' This function modifies fields for a TempSectionGradeBucketWeight.
#'
#' @param TempSectionGradeBucketWeightID The id of the TempSectionGradeBucketWeight to be modified.\cr Run \code{\link{getAllTempSectionGradeBucketWeights}} for a list of TempSectionGradeBucketWeights.
#' @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 Gradebook
#' @return Details of the modified TempSectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionGradeBucketWeight <- function(TempSectionGradeBucketWeightID, EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupGradeBucketIDComposite = NULL, setCalculationGroupGradeBucketIDFeeder = NULL, setCanClone = NULL, setSectionID = NULL, setSubjectIDToWeight = NULL, setWeightPercent = 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("Gradebook", "TempSectionGradeBucketWeight", TempSectionGradeBucketWeightID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionGradeBucketWeight.
#'
#' This function creates a new TempSectionGradeBucketWeight.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionGradeBucketWeight <- function(EntityID = 1, setAcademicStandardIDToWeight = NULL, setCalculationGroupGradeBucketIDComposite = NULL, setCalculationGroupGradeBucketIDFeeder = NULL, setCanClone = NULL, setSectionID = NULL, setSubjectIDToWeight = NULL, setWeightPercent = 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("Gradebook", "TempSectionGradeBucketWeight", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionGradeBucketWeight
#'
#' This function deletes a TempSectionGradeBucketWeight.
#'
#' @param TempSectionGradeBucketWeightID The id of the TempSectionGradeBucketWeight.\cr Run \code{\link{getAllTempSectionGradeBucketWeights}} for a list of TempSectionGradeBucketWeights.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionGradeBucketWeight.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionGradeBucketWeight <- function(TempSectionGradeBucketWeightID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionGradeBucketWeight", TempSectionGradeBucketWeightID, EntityID)
}
#' Get all TempSectionGradingScales.
#'
#' This function returns a dataframe of all TempSectionGradingScales 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 Gradebook
#' @return All TempSectionGradingScales in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionGradingScales <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionGradingScaleID = F, returnCanClone = F, returnChildGradeBuckets = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempSectionGradingScale", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionGradingScale
#'
#' This function returns fields for a TempSectionGradingScale.
#'
#' @param TempSectionGradingScaleID The id of the TempSectionGradingScale.\cr Run \code{\link{getAllTempSectionGradingScales}} for a list of TempSectionGradingScales.
#' @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 Gradebook
#' @return Details for the TempSectionGradingScale.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionGradingScale <- function(TempSectionGradingScaleID, EntityID = 1, returnTempSectionGradingScaleID = F, returnCanClone = F, returnChildGradeBuckets = F, returnCreatedTime = F, returnErrorMessage = F, returnModifiedTime = F, returnSectionID = 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("Gradebook", "TempSectionGradingScale", TempSectionGradingScaleID, searchFields, EntityID)
}
#' Modify a specific TempSectionGradingScale
#'
#' This function modifies fields for a TempSectionGradingScale.
#'
#' @param TempSectionGradingScaleID The id of the TempSectionGradingScale to be modified.\cr Run \code{\link{getAllTempSectionGradingScales}} for a list of TempSectionGradingScales.
#' @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 Gradebook
#' @return Details of the modified TempSectionGradingScale.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionGradingScale <- function(TempSectionGradingScaleID, EntityID = 1, setCanClone = NULL, setChildGradeBuckets = NULL, setErrorMessage = NULL, setSectionID = 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("Gradebook", "TempSectionGradingScale", TempSectionGradingScaleID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionGradingScale.
#'
#' This function creates a new TempSectionGradingScale.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionGradingScale.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionGradingScale <- function(EntityID = 1, setCanClone = NULL, setChildGradeBuckets = NULL, setErrorMessage = NULL, setSectionID = 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("Gradebook", "TempSectionGradingScale", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionGradingScale
#'
#' This function deletes a TempSectionGradingScale.
#'
#' @param TempSectionGradingScaleID The id of the TempSectionGradingScale.\cr Run \code{\link{getAllTempSectionGradingScales}} for a list of TempSectionGradingScales.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionGradingScale.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionGradingScale <- function(TempSectionGradingScaleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionGradingScale", TempSectionGradingScaleID, EntityID)
}
#' Get all TempSectionGradingScaleGroupToCreates.
#'
#' This function returns a dataframe of all TempSectionGradingScaleGroupToCreates 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 Gradebook
#' @return All TempSectionGradingScaleGroupToCreates in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempSectionGradingScaleGroupToCreates <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempSectionGradingScaleGroupToCreateID = F, returnCourseCode = F, returnCourseDescriptionCodeSectionCode = F, returnCourseGradingScaleGroupCourseID = F, returnCourseGradingScaleGroupID = F, returnCourseID = F, returnCreatedTime = F, returnDescription = F, returnGradingPeriodGradeBucketsToRetainJson = F, returnInvalidGradeMarks = F, returnIsValidInNewGroup = F, returnModifiedTime = F, returnNewCourseGradingScaleGroupDescription = F, returnNewCourseGradingScaleGroupID = F, returnReason = F, returnRequiresSectionGradingScaleGroups = F, returnSectionCode = F, returnSectionID = F, returnSectionLengthCode = 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("Gradebook", "TempSectionGradingScaleGroupToCreate", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempSectionGradingScaleGroupToCreate
#'
#' This function returns fields for a TempSectionGradingScaleGroupToCreate.
#'
#' @param TempSectionGradingScaleGroupToCreateID The id of the TempSectionGradingScaleGroupToCreate.\cr Run \code{\link{getAllTempSectionGradingScaleGroupToCreates}} for a list of TempSectionGradingScaleGroupToCreates.
#' @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 Gradebook
#' @return Details for the TempSectionGradingScaleGroupToCreate.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempSectionGradingScaleGroupToCreate <- function(TempSectionGradingScaleGroupToCreateID, EntityID = 1, returnTempSectionGradingScaleGroupToCreateID = F, returnCourseCode = F, returnCourseDescriptionCodeSectionCode = F, returnCourseGradingScaleGroupCourseID = F, returnCourseGradingScaleGroupID = F, returnCourseID = F, returnCreatedTime = F, returnDescription = F, returnGradingPeriodGradeBucketsToRetainJson = F, returnInvalidGradeMarks = F, returnIsValidInNewGroup = F, returnModifiedTime = F, returnNewCourseGradingScaleGroupDescription = F, returnNewCourseGradingScaleGroupID = F, returnReason = F, returnRequiresSectionGradingScaleGroups = F, returnSectionCode = F, returnSectionID = F, returnSectionLengthCode = 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("Gradebook", "TempSectionGradingScaleGroupToCreate", TempSectionGradingScaleGroupToCreateID, searchFields, EntityID)
}
#' Modify a specific TempSectionGradingScaleGroupToCreate
#'
#' This function modifies fields for a TempSectionGradingScaleGroupToCreate.
#'
#' @param TempSectionGradingScaleGroupToCreateID The id of the TempSectionGradingScaleGroupToCreate to be modified.\cr Run \code{\link{getAllTempSectionGradingScaleGroupToCreates}} for a list of TempSectionGradingScaleGroupToCreates.
#' @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 Gradebook
#' @return Details of the modified TempSectionGradingScaleGroupToCreate.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempSectionGradingScaleGroupToCreate <- function(TempSectionGradingScaleGroupToCreateID, EntityID = 1, setCourseCode = NULL, setCourseDescriptionCodeSectionCode = NULL, setCourseGradingScaleGroupCourseID = NULL, setCourseGradingScaleGroupID = NULL, setCourseID = NULL, setDescription = NULL, setGradingPeriodGradeBucketsToRetainJson = NULL, setInvalidGradeMarks = NULL, setIsValidInNewGroup = NULL, setNewCourseGradingScaleGroupDescription = NULL, setNewCourseGradingScaleGroupID = NULL, setReason = NULL, setRequiresSectionGradingScaleGroups = NULL, setSectionCode = NULL, setSectionID = NULL, setSectionLengthCode = 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("Gradebook", "TempSectionGradingScaleGroupToCreate", TempSectionGradingScaleGroupToCreateID, names(functionParams), functionParams, EntityID)
}
#' Create new TempSectionGradingScaleGroupToCreate.
#'
#' This function creates a new TempSectionGradingScaleGroupToCreate.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempSectionGradingScaleGroupToCreate.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempSectionGradingScaleGroupToCreate <- function(EntityID = 1, setCourseCode = NULL, setCourseDescriptionCodeSectionCode = NULL, setCourseGradingScaleGroupCourseID = NULL, setCourseGradingScaleGroupID = NULL, setCourseID = NULL, setDescription = NULL, setGradingPeriodGradeBucketsToRetainJson = NULL, setInvalidGradeMarks = NULL, setIsValidInNewGroup = NULL, setNewCourseGradingScaleGroupDescription = NULL, setNewCourseGradingScaleGroupID = NULL, setReason = NULL, setRequiresSectionGradingScaleGroups = NULL, setSectionCode = NULL, setSectionID = NULL, setSectionLengthCode = 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("Gradebook", "TempSectionGradingScaleGroupToCreate", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempSectionGradingScaleGroupToCreate
#'
#' This function deletes a TempSectionGradingScaleGroupToCreate.
#'
#' @param TempSectionGradingScaleGroupToCreateID The id of the TempSectionGradingScaleGroupToCreate.\cr Run \code{\link{getAllTempSectionGradingScaleGroupToCreates}} for a list of TempSectionGradingScaleGroupToCreates.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempSectionGradingScaleGroupToCreate.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempSectionGradingScaleGroupToCreate <- function(TempSectionGradingScaleGroupToCreateID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempSectionGradingScaleGroupToCreate", TempSectionGradingScaleGroupToCreateID, EntityID)
}
#' Get all TempStudentAssignments.
#'
#' This function returns a dataframe of all TempStudentAssignments 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 Gradebook
#' @return All TempStudentAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempStudentAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempStudentAssignmentID = F, returnAssignmentDescription = F, returnAssignmentID = F, returnAssignmentName = F, returnCreatedTime = F, returnDueDate = F, returnDueDateIsInGivenDateRange = F, returnInclude = F, returnIsMissing = F, returnMaxScore = F, returnModifiedTime = F, returnNoCount = F, returnScore = F, returnScoreClarifierCode = F, returnScoreClarifierID = F, returnSectionID = F, returnStudentSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempStudentAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempStudentAssignment
#'
#' This function returns fields for a TempStudentAssignment.
#'
#' @param TempStudentAssignmentID The id of the TempStudentAssignment.\cr Run \code{\link{getAllTempStudentAssignments}} for a list of TempStudentAssignments.
#' @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 Gradebook
#' @return Details for the TempStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempStudentAssignment <- function(TempStudentAssignmentID, EntityID = 1, returnTempStudentAssignmentID = F, returnAssignmentDescription = F, returnAssignmentID = F, returnAssignmentName = F, returnCreatedTime = F, returnDueDate = F, returnDueDateIsInGivenDateRange = F, returnInclude = F, returnIsMissing = F, returnMaxScore = F, returnModifiedTime = F, returnNoCount = F, returnScore = F, returnScoreClarifierCode = F, returnScoreClarifierID = F, returnSectionID = F, returnStudentSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWeight = 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("Gradebook", "TempStudentAssignment", TempStudentAssignmentID, searchFields, EntityID)
}
#' Modify a specific TempStudentAssignment
#'
#' This function modifies fields for a TempStudentAssignment.
#'
#' @param TempStudentAssignmentID The id of the TempStudentAssignment to be modified.\cr Run \code{\link{getAllTempStudentAssignments}} for a list of TempStudentAssignments.
#' @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 Gradebook
#' @return Details of the modified TempStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempStudentAssignment <- function(TempStudentAssignmentID, EntityID = 1, setAssignmentDescription = NULL, setAssignmentID = NULL, setAssignmentName = NULL, setDueDate = NULL, setInclude = NULL, setIsMissing = NULL, setMaxScore = NULL, setNoCount = NULL, setScore = NULL, setScoreClarifierCode = NULL, setScoreClarifierID = NULL, setSectionID = NULL, setStudentSectionID = NULL, setWeight = 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("Gradebook", "TempStudentAssignment", TempStudentAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new TempStudentAssignment.
#'
#' This function creates a new TempStudentAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempStudentAssignment <- function(EntityID = 1, setAssignmentDescription = NULL, setAssignmentID = NULL, setAssignmentName = NULL, setDueDate = NULL, setInclude = NULL, setIsMissing = NULL, setMaxScore = NULL, setNoCount = NULL, setScore = NULL, setScoreClarifierCode = NULL, setScoreClarifierID = NULL, setSectionID = NULL, setStudentSectionID = NULL, setWeight = 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("Gradebook", "TempStudentAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempStudentAssignment
#'
#' This function deletes a TempStudentAssignment.
#'
#' @param TempStudentAssignmentID The id of the TempStudentAssignment.\cr Run \code{\link{getAllTempStudentAssignments}} for a list of TempStudentAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempStudentAssignment <- function(TempStudentAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempStudentAssignment", TempStudentAssignmentID, EntityID)
}
#' Get all TempStudentGradingScaleGroupStudentSections.
#'
#' This function returns a dataframe of all TempStudentGradingScaleGroupStudentSections 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 Gradebook
#' @return All TempStudentGradingScaleGroupStudentSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempStudentGradingScaleGroupStudentSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempStudentGradingScaleGroupStudentSectionID = F, returnCourseDescriptionCodeSectionCode = F, returnCreatedTime = F, returnErrorText = F, returnGradingPeriodGradeBuckets = F, returnHasError = F, returnModifiedTime = F, returnSectionID = F, returnSectionLengthCode = F, returnSectionLengthID = F, returnStudentFullNameLFM = F, returnStudentGradingScaleGroupStudentSectionID = F, returnStudentID = F, returnStudentSectionID = 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("Gradebook", "TempStudentGradingScaleGroupStudentSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempStudentGradingScaleGroupStudentSection
#'
#' This function returns fields for a TempStudentGradingScaleGroupStudentSection.
#'
#' @param TempStudentGradingScaleGroupStudentSectionID The id of the TempStudentGradingScaleGroupStudentSection.\cr Run \code{\link{getAllTempStudentGradingScaleGroupStudentSections}} for a list of TempStudentGradingScaleGroupStudentSections.
#' @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 Gradebook
#' @return Details for the TempStudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempStudentGradingScaleGroupStudentSection <- function(TempStudentGradingScaleGroupStudentSectionID, EntityID = 1, returnTempStudentGradingScaleGroupStudentSectionID = F, returnCourseDescriptionCodeSectionCode = F, returnCreatedTime = F, returnErrorText = F, returnGradingPeriodGradeBuckets = F, returnHasError = F, returnModifiedTime = F, returnSectionID = F, returnSectionLengthCode = F, returnSectionLengthID = F, returnStudentFullNameLFM = F, returnStudentGradingScaleGroupStudentSectionID = F, returnStudentID = F, returnStudentSectionID = 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("Gradebook", "TempStudentGradingScaleGroupStudentSection", TempStudentGradingScaleGroupStudentSectionID, searchFields, EntityID)
}
#' Modify a specific TempStudentGradingScaleGroupStudentSection
#'
#' This function modifies fields for a TempStudentGradingScaleGroupStudentSection.
#'
#' @param TempStudentGradingScaleGroupStudentSectionID The id of the TempStudentGradingScaleGroupStudentSection to be modified.\cr Run \code{\link{getAllTempStudentGradingScaleGroupStudentSections}} for a list of TempStudentGradingScaleGroupStudentSections.
#' @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 Gradebook
#' @return Details of the modified TempStudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempStudentGradingScaleGroupStudentSection <- function(TempStudentGradingScaleGroupStudentSectionID, EntityID = 1, setCourseDescriptionCodeSectionCode = NULL, setErrorText = NULL, setGradingPeriodGradeBuckets = NULL, setHasError = NULL, setSectionID = NULL, setSectionLengthCode = NULL, setSectionLengthID = NULL, setStudentFullNameLFM = NULL, setStudentGradingScaleGroupStudentSectionID = NULL, setStudentID = NULL, setStudentSectionID = 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("Gradebook", "TempStudentGradingScaleGroupStudentSection", TempStudentGradingScaleGroupStudentSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new TempStudentGradingScaleGroupStudentSection.
#'
#' This function creates a new TempStudentGradingScaleGroupStudentSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempStudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempStudentGradingScaleGroupStudentSection <- function(EntityID = 1, setCourseDescriptionCodeSectionCode = NULL, setErrorText = NULL, setGradingPeriodGradeBuckets = NULL, setHasError = NULL, setSectionID = NULL, setSectionLengthCode = NULL, setSectionLengthID = NULL, setStudentFullNameLFM = NULL, setStudentGradingScaleGroupStudentSectionID = NULL, setStudentID = NULL, setStudentSectionID = 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("Gradebook", "TempStudentGradingScaleGroupStudentSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempStudentGradingScaleGroupStudentSection
#'
#' This function deletes a TempStudentGradingScaleGroupStudentSection.
#'
#' @param TempStudentGradingScaleGroupStudentSectionID The id of the TempStudentGradingScaleGroupStudentSection.\cr Run \code{\link{getAllTempStudentGradingScaleGroupStudentSections}} for a list of TempStudentGradingScaleGroupStudentSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempStudentGradingScaleGroupStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempStudentGradingScaleGroupStudentSection <- function(TempStudentGradingScaleGroupStudentSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempStudentGradingScaleGroupStudentSection", TempStudentGradingScaleGroupStudentSectionID, EntityID)
}
#' Get all TempUnDropLowScoreStudentSections.
#'
#' This function returns a dataframe of all TempUnDropLowScoreStudentSections 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 Gradebook
#' @return All TempUnDropLowScoreStudentSections in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempUnDropLowScoreStudentSections <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempUnDropLowScoreStudentSectionID = F, returnCreatedTime = F, returnModifiedTime = F, returnNewGrade = F, returnOriginalGrade = F, returnStudentDisplaySortCode = F, returnStudentName = F, returnStudentSectionID = 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("Gradebook", "TempUnDropLowScoreStudentSection", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempUnDropLowScoreStudentSection
#'
#' This function returns fields for a TempUnDropLowScoreStudentSection.
#'
#' @param TempUnDropLowScoreStudentSectionID The id of the TempUnDropLowScoreStudentSection.\cr Run \code{\link{getAllTempUnDropLowScoreStudentSections}} for a list of TempUnDropLowScoreStudentSections.
#' @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 Gradebook
#' @return Details for the TempUnDropLowScoreStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempUnDropLowScoreStudentSection <- function(TempUnDropLowScoreStudentSectionID, EntityID = 1, returnTempUnDropLowScoreStudentSectionID = F, returnCreatedTime = F, returnModifiedTime = F, returnNewGrade = F, returnOriginalGrade = F, returnStudentDisplaySortCode = F, returnStudentName = F, returnStudentSectionID = 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("Gradebook", "TempUnDropLowScoreStudentSection", TempUnDropLowScoreStudentSectionID, searchFields, EntityID)
}
#' Modify a specific TempUnDropLowScoreStudentSection
#'
#' This function modifies fields for a TempUnDropLowScoreStudentSection.
#'
#' @param TempUnDropLowScoreStudentSectionID The id of the TempUnDropLowScoreStudentSection to be modified.\cr Run \code{\link{getAllTempUnDropLowScoreStudentSections}} for a list of TempUnDropLowScoreStudentSections.
#' @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 Gradebook
#' @return Details of the modified TempUnDropLowScoreStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempUnDropLowScoreStudentSection <- function(TempUnDropLowScoreStudentSectionID, EntityID = 1, setNewGrade = NULL, setOriginalGrade = NULL, setStudentDisplaySortCode = NULL, setStudentName = NULL, setStudentSectionID = 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("Gradebook", "TempUnDropLowScoreStudentSection", TempUnDropLowScoreStudentSectionID, names(functionParams), functionParams, EntityID)
}
#' Create new TempUnDropLowScoreStudentSection.
#'
#' This function creates a new TempUnDropLowScoreStudentSection.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created TempUnDropLowScoreStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempUnDropLowScoreStudentSection <- function(EntityID = 1, setNewGrade = NULL, setOriginalGrade = NULL, setStudentDisplaySortCode = NULL, setStudentName = NULL, setStudentSectionID = 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("Gradebook", "TempUnDropLowScoreStudentSection", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempUnDropLowScoreStudentSection
#'
#' This function deletes a TempUnDropLowScoreStudentSection.
#'
#' @param TempUnDropLowScoreStudentSectionID The id of the TempUnDropLowScoreStudentSection.\cr Run \code{\link{getAllTempUnDropLowScoreStudentSections}} for a list of TempUnDropLowScoreStudentSections.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted TempUnDropLowScoreStudentSection.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempUnDropLowScoreStudentSection <- function(TempUnDropLowScoreStudentSectionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "TempUnDropLowScoreStudentSection", TempUnDropLowScoreStudentSectionID, EntityID)
}
#' Get all UnenteredStudentGradeBuckets.
#'
#' This function returns a dataframe of all UnenteredStudentGradeBuckets 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 Gradebook
#' @return All UnenteredStudentGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllUnenteredStudentGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentGradeBucketID = F, returnCourseDescription = F, returnDisplayPeriodID = F, returnEntityCode = F, returnEntityID = F, returnGradeBucketID = F, returnGradeBucketLabel = F, returnGradeMarkCode = F, returnGradeMarkIDToApply = F, returnGradingPeriodEndDate = F, returnGradingPeriodStartDate = F, returnIsAdminOverride = F, returnPercent = F, returnSchoolYearID = F, returnSectionID = F, returnStaffID = F, returnStudentGradeBucketFlag = F, returnStudentID = F, returnStudentSectionID = F, returnStudentSectionTransactionEndDate = F, returnStudentSectionTransactionStartDate = F, returnUseServiceIDOverride = 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("Gradebook", "UnenteredStudentGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific UnenteredStudentGradeBucket
#'
#' This function returns fields for an UnenteredStudentGradeBucket.
#'
#' @param UnenteredStudentGradeBucketID The id of the UnenteredStudentGradeBucket.\cr Run \code{\link{getAllUnenteredStudentGradeBuckets}} for a list of UnenteredStudentGradeBuckets.
#' @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 Gradebook
#' @return Details for the UnenteredStudentGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getUnenteredStudentGradeBucket <- function(UnenteredStudentGradeBucketID, EntityID = 1, returnStudentGradeBucketID = F, returnCourseDescription = F, returnDisplayPeriodID = F, returnEntityCode = F, returnEntityID = F, returnGradeBucketID = F, returnGradeBucketLabel = F, returnGradeMarkCode = F, returnGradeMarkIDToApply = F, returnGradingPeriodEndDate = F, returnGradingPeriodStartDate = F, returnIsAdminOverride = F, returnPercent = F, returnSchoolYearID = F, returnSectionID = F, returnStaffID = F, returnStudentGradeBucketFlag = F, returnStudentID = F, returnStudentSectionID = F, returnStudentSectionTransactionEndDate = F, returnStudentSectionTransactionStartDate = F, returnUseServiceIDOverride = 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("Gradebook", "UnenteredStudentGradeBucket", UnenteredStudentGradeBucketID, searchFields, EntityID)
}
#' Modify a specific UnenteredStudentGradeBucket
#'
#' This function modifies fields for an UnenteredStudentGradeBucket.
#'
#' @param UnenteredStudentGradeBucketID The id of the UnenteredStudentGradeBucket to be modified.\cr Run \code{\link{getAllUnenteredStudentGradeBuckets}} for a list of UnenteredStudentGradeBuckets.
#' @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 Gradebook
#' @return Details of the modified UnenteredStudentGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyUnenteredStudentGradeBucket <- function(UnenteredStudentGradeBucketID, EntityID = 1, setGradingPeriodEndDate = NULL, setGradingPeriodStartDate = NULL, setIsAdminOverride = NULL, setPercent = NULL, setStudentSectionTransactionEndDate = NULL, setStudentSectionTransactionStartDate = 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("Gradebook", "UnenteredStudentGradeBucket", UnenteredStudentGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new UnenteredStudentGradeBucket.
#'
#' This function creates a new UnenteredStudentGradeBucket.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created UnenteredStudentGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createUnenteredStudentGradeBucket <- function(EntityID = 1, setGradingPeriodEndDate = NULL, setGradingPeriodStartDate = NULL, setIsAdminOverride = NULL, setPercent = NULL, setStudentSectionTransactionEndDate = NULL, setStudentSectionTransactionStartDate = 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("Gradebook", "UnenteredStudentGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific UnenteredStudentGradeBucket
#'
#' This function deletes an UnenteredStudentGradeBucket.
#'
#' @param UnenteredStudentGradeBucketID The id of the UnenteredStudentGradeBucket.\cr Run \code{\link{getAllUnenteredStudentGradeBuckets}} for a list of UnenteredStudentGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted UnenteredStudentGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteUnenteredStudentGradeBucket <- function(UnenteredStudentGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "UnenteredStudentGradeBucket", UnenteredStudentGradeBucketID, EntityID)
}
#' Get all VendorAssignments.
#'
#' This function returns a dataframe of all VendorAssignments 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 Gradebook
#' @return All VendorAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllVendorAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnVendorAssignmentID = F, returnAssignmentID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific VendorAssignment
#'
#' This function returns fields for a VendorAssignment.
#'
#' @param VendorAssignmentID The id of the VendorAssignment.\cr Run \code{\link{getAllVendorAssignments}} for a list of VendorAssignments.
#' @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 Gradebook
#' @return Details for the VendorAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getVendorAssignment <- function(VendorAssignmentID, EntityID = 1, returnVendorAssignmentID = F, returnAssignmentID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorAssignment", VendorAssignmentID, searchFields, EntityID)
}
#' Modify a specific VendorAssignment
#'
#' This function modifies fields for a VendorAssignment.
#'
#' @param VendorAssignmentID The id of the VendorAssignment to be modified.\cr Run \code{\link{getAllVendorAssignments}} for a list of VendorAssignments.
#' @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 Gradebook
#' @return Details of the modified VendorAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyVendorAssignment <- function(VendorAssignmentID, EntityID = 1, setAssignmentID = NULL, setOneRosterVendorID = NULL, setVendorSourceID = 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("Gradebook", "VendorAssignment", VendorAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new VendorAssignment.
#'
#' This function creates a new VendorAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created VendorAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createVendorAssignment <- function(EntityID = 1, setAssignmentID = NULL, setOneRosterVendorID = NULL, setVendorSourceID = 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("Gradebook", "VendorAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific VendorAssignment
#'
#' This function deletes a VendorAssignment.
#'
#' @param VendorAssignmentID The id of the VendorAssignment.\cr Run \code{\link{getAllVendorAssignments}} for a list of VendorAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted VendorAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteVendorAssignment <- function(VendorAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "VendorAssignment", VendorAssignmentID, EntityID)
}
#' Get all VendorCategories.
#'
#' This function returns a dataframe of all VendorCategories 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 Gradebook
#' @return All VendorCategories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllVendorCategories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnVendorCategoryID = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorCategory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific VendorCategory
#'
#' This function returns fields for a VendorCategory.
#'
#' @param VendorCategoryID The id of the VendorCategory.\cr Run \code{\link{getAllVendorCategories}} for a list of VendorCategories.
#' @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 Gradebook
#' @return Details for the VendorCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getVendorCategory <- function(VendorCategoryID, EntityID = 1, returnVendorCategoryID = F, returnCategoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorCategory", VendorCategoryID, searchFields, EntityID)
}
#' Modify a specific VendorCategory
#'
#' This function modifies fields for a VendorCategory.
#'
#' @param VendorCategoryID The id of the VendorCategory to be modified.\cr Run \code{\link{getAllVendorCategories}} for a list of VendorCategorys.
#' @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 Gradebook
#' @return Details of the modified VendorCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyVendorCategory <- function(VendorCategoryID, EntityID = 1, setCategoryID = NULL, setOneRosterVendorID = NULL, setVendorSourceID = 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("Gradebook", "VendorCategory", VendorCategoryID, names(functionParams), functionParams, EntityID)
}
#' Create new VendorCategory.
#'
#' This function creates a new VendorCategory.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created VendorCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createVendorCategory <- function(EntityID = 1, setCategoryID = NULL, setOneRosterVendorID = NULL, setVendorSourceID = 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("Gradebook", "VendorCategory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific VendorCategory
#'
#' This function deletes a VendorCategory.
#'
#' @param VendorCategoryID The id of the VendorCategory.\cr Run \code{\link{getAllVendorCategories}} for a list of VendorCategories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted VendorCategory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteVendorCategory <- function(VendorCategoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "VendorCategory", VendorCategoryID, EntityID)
}
#' Get all VendorStudentAssignments.
#'
#' This function returns a dataframe of all VendorStudentAssignments 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 Gradebook
#' @return All VendorStudentAssignments in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllVendorStudentAssignments <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnVendorStudentAssignmentID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnStudentAssignmentID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorStudentAssignment", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific VendorStudentAssignment
#'
#' This function returns fields for a VendorStudentAssignment.
#'
#' @param VendorStudentAssignmentID The id of the VendorStudentAssignment.\cr Run \code{\link{getAllVendorStudentAssignments}} for a list of VendorStudentAssignments.
#' @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 Gradebook
#' @return Details for the VendorStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getVendorStudentAssignment <- function(VendorStudentAssignmentID, EntityID = 1, returnVendorStudentAssignmentID = F, returnCreatedTime = F, returnModifiedTime = F, returnOneRosterVendorID = F, returnStudentAssignmentID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnVendorSourceID = 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("Gradebook", "VendorStudentAssignment", VendorStudentAssignmentID, searchFields, EntityID)
}
#' Modify a specific VendorStudentAssignment
#'
#' This function modifies fields for a VendorStudentAssignment.
#'
#' @param VendorStudentAssignmentID The id of the VendorStudentAssignment to be modified.\cr Run \code{\link{getAllVendorStudentAssignments}} for a list of VendorStudentAssignments.
#' @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 Gradebook
#' @return Details of the modified VendorStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyVendorStudentAssignment <- function(VendorStudentAssignmentID, EntityID = 1, setOneRosterVendorID = NULL, setStudentAssignmentID = NULL, setVendorSourceID = 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("Gradebook", "VendorStudentAssignment", VendorStudentAssignmentID, names(functionParams), functionParams, EntityID)
}
#' Create new VendorStudentAssignment.
#'
#' This function creates a new VendorStudentAssignment.
#'
#' @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 Gradebook
#' @return The fields used to define the newly created VendorStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createVendorStudentAssignment <- function(EntityID = 1, setOneRosterVendorID = NULL, setStudentAssignmentID = NULL, setVendorSourceID = 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("Gradebook", "VendorStudentAssignment", names(functionParams), functionParams, EntityID)
}
#' Delete a specific VendorStudentAssignment
#'
#' This function deletes a VendorStudentAssignment.
#'
#' @param VendorStudentAssignmentID The id of the VendorStudentAssignment.\cr Run \code{\link{getAllVendorStudentAssignments}} for a list of VendorStudentAssignments.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Gradebook
#' @return The id of the deleted VendorStudentAssignment.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteVendorStudentAssignment <- function(VendorStudentAssignmentID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Gradebook", "VendorStudentAssignment", VendorStudentAssignmentID, EntityID)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.