#' Get all AttendancePeriods.
#'
#' This function returns a dataframe of all AttendancePeriods 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 Attendance
#' @return All AttendancePeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendancePeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendancePeriodID = F, returnAttendancePeriodIDClonedFrom = F, returnAttendancePeriodIDClonedTo = F, returnCode = F, returnCreatedTime = F, returnDisplayOrder = F, returnDynamicRelationshipID = F, returnEntityGroupKey = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUseForSchoolTrakPositiveAttendance = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseTeacherEntryCutOffTime = 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("Attendance", "AttendancePeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendancePeriod
#'
#' This function returns fields for an AttendancePeriod.
#'
#' @param AttendancePeriodID The id of the AttendancePeriod.\cr Run \code{\link{getAllAttendancePeriods}} for a list of AttendancePeriods.
#' @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 Attendance
#' @return Details for the AttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendancePeriod <- function(AttendancePeriodID, EntityID = 1, returnAttendancePeriodID = F, returnAttendancePeriodIDClonedFrom = F, returnAttendancePeriodIDClonedTo = F, returnCode = F, returnCreatedTime = F, returnDisplayOrder = F, returnDynamicRelationshipID = F, returnEntityGroupKey = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUseForSchoolTrakPositiveAttendance = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseTeacherEntryCutOffTime = 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("Attendance", "AttendancePeriod", AttendancePeriodID, searchFields, EntityID)
}
#' Modify a specific AttendancePeriod
#'
#' This function modifies fields for an AttendancePeriod.
#'
#' @param AttendancePeriodID The id of the AttendancePeriod to be modified.\cr Run \code{\link{getAllAttendancePeriods}} for a list of AttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendancePeriod <- function(AttendancePeriodID, EntityID = 1, setAttendancePeriodIDClonedFrom = NULL, setCode = NULL, setDisplayOrder = NULL, setDynamicRelationshipID = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setSchoolYearID = NULL, setUseForSchoolTrakPositiveAttendance = NULL, setUseTeacherEntryCutOffTime = 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("Attendance", "AttendancePeriod", AttendancePeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendancePeriod.
#'
#' This function creates a new AttendancePeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendancePeriod <- function(EntityID = 1, setAttendancePeriodIDClonedFrom = NULL, setCode = NULL, setDisplayOrder = NULL, setDynamicRelationshipID = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setSchoolYearID = NULL, setUseForSchoolTrakPositiveAttendance = NULL, setUseTeacherEntryCutOffTime = 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("Attendance", "AttendancePeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendancePeriod
#'
#' This function deletes an AttendancePeriod.
#'
#' @param AttendancePeriodID The id of the AttendancePeriod.\cr Run \code{\link{getAllAttendancePeriods}} for a list of AttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendancePeriod <- function(AttendancePeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendancePeriod", AttendancePeriodID, EntityID)
}
#' Get all AttendancePeriodConfigEntityGroupYears.
#'
#' This function returns a dataframe of all AttendancePeriodConfigEntityGroupYears 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 Attendance
#' @return All AttendancePeriodConfigEntityGroupYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendancePeriodConfigEntityGroupYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendancePeriodConfigEntityGroupYearID = F, returnAttendancePeriodConfigEntityGroupYearIDClonedFrom = F, returnAttendancePeriodID = F, returnConfigEntityGroupYearID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnModifiedTime = F, returnTeacherEntryCutoffDuration = F, returnTeacherEntryCutoffNumberOfMinutesAfter = F, returnTeacherEntryCutoffTime = F, returnTeacherEntryCutoffTimeCode = F, returnTeacherEntryCutoffWindowEndTime = F, returnTeacherEntryCutoffWindowStartTime = F, returnTeacherEntrySpecificCutoffTime = 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("Attendance", "AttendancePeriodConfigEntityGroupYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendancePeriodConfigEntityGroupYear
#'
#' This function returns fields for an AttendancePeriodConfigEntityGroupYear.
#'
#' @param AttendancePeriodConfigEntityGroupYearID The id of the AttendancePeriodConfigEntityGroupYear.\cr Run \code{\link{getAllAttendancePeriodConfigEntityGroupYears}} for a list of AttendancePeriodConfigEntityGroupYears.
#' @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 Attendance
#' @return Details for the AttendancePeriodConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendancePeriodConfigEntityGroupYear <- function(AttendancePeriodConfigEntityGroupYearID, EntityID = 1, returnAttendancePeriodConfigEntityGroupYearID = F, returnAttendancePeriodConfigEntityGroupYearIDClonedFrom = F, returnAttendancePeriodID = F, returnConfigEntityGroupYearID = F, returnCreatedTime = F, returnEntityGroupKey = F, returnModifiedTime = F, returnTeacherEntryCutoffDuration = F, returnTeacherEntryCutoffNumberOfMinutesAfter = F, returnTeacherEntryCutoffTime = F, returnTeacherEntryCutoffTimeCode = F, returnTeacherEntryCutoffWindowEndTime = F, returnTeacherEntryCutoffWindowStartTime = F, returnTeacherEntrySpecificCutoffTime = 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("Attendance", "AttendancePeriodConfigEntityGroupYear", AttendancePeriodConfigEntityGroupYearID, searchFields, EntityID)
}
#' Modify a specific AttendancePeriodConfigEntityGroupYear
#'
#' This function modifies fields for an AttendancePeriodConfigEntityGroupYear.
#'
#' @param AttendancePeriodConfigEntityGroupYearID The id of the AttendancePeriodConfigEntityGroupYear to be modified.\cr Run \code{\link{getAllAttendancePeriodConfigEntityGroupYears}} for a list of AttendancePeriodConfigEntityGroupYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendancePeriodConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendancePeriodConfigEntityGroupYear <- function(AttendancePeriodConfigEntityGroupYearID, EntityID = 1, setAttendancePeriodConfigEntityGroupYearIDClonedFrom = NULL, setAttendancePeriodID = NULL, setConfigEntityGroupYearID = NULL, setEntityGroupKey = NULL, setTeacherEntryCutoffDuration = NULL, setTeacherEntryCutoffNumberOfMinutesAfter = NULL, setTeacherEntryCutoffTime = NULL, setTeacherEntryCutoffTimeCode = NULL, setTeacherEntryCutoffWindowEndTime = NULL, setTeacherEntryCutoffWindowStartTime = NULL, setTeacherEntrySpecificCutoffTime = 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("Attendance", "AttendancePeriodConfigEntityGroupYear", AttendancePeriodConfigEntityGroupYearID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendancePeriodConfigEntityGroupYear.
#'
#' This function creates a new AttendancePeriodConfigEntityGroupYear.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendancePeriodConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendancePeriodConfigEntityGroupYear <- function(EntityID = 1, setAttendancePeriodConfigEntityGroupYearIDClonedFrom = NULL, setAttendancePeriodID = NULL, setConfigEntityGroupYearID = NULL, setEntityGroupKey = NULL, setTeacherEntryCutoffDuration = NULL, setTeacherEntryCutoffNumberOfMinutesAfter = NULL, setTeacherEntryCutoffTime = NULL, setTeacherEntryCutoffTimeCode = NULL, setTeacherEntryCutoffWindowEndTime = NULL, setTeacherEntryCutoffWindowStartTime = NULL, setTeacherEntrySpecificCutoffTime = 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("Attendance", "AttendancePeriodConfigEntityGroupYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendancePeriodConfigEntityGroupYear
#'
#' This function deletes an AttendancePeriodConfigEntityGroupYear.
#'
#' @param AttendancePeriodConfigEntityGroupYearID The id of the AttendancePeriodConfigEntityGroupYear.\cr Run \code{\link{getAllAttendancePeriodConfigEntityGroupYears}} for a list of AttendancePeriodConfigEntityGroupYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendancePeriodConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendancePeriodConfigEntityGroupYear <- function(AttendancePeriodConfigEntityGroupYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendancePeriodConfigEntityGroupYear", AttendancePeriodConfigEntityGroupYearID, EntityID)
}
#' Get all AttendanceReasons.
#'
#' This function returns a dataframe of all AttendanceReasons 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 Attendance
#' @return All AttendanceReasons in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendanceReasons <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendanceReasonID = F, returnAttendanceReasonIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnTeacherEntryID = 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("Attendance", "AttendanceReason", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendanceReason
#'
#' This function returns fields for an AttendanceReason.
#'
#' @param AttendanceReasonID The id of the AttendanceReason.\cr Run \code{\link{getAllAttendanceReasons}} for a list of AttendanceReasons.
#' @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 Attendance
#' @return Details for the AttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendanceReason <- function(AttendanceReasonID, EntityID = 1, returnAttendanceReasonID = F, returnAttendanceReasonIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnTeacherEntryID = 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("Attendance", "AttendanceReason", AttendanceReasonID, searchFields, EntityID)
}
#' Modify a specific AttendanceReason
#'
#' This function modifies fields for an AttendanceReason.
#'
#' @param AttendanceReasonID The id of the AttendanceReason to be modified.\cr Run \code{\link{getAllAttendanceReasons}} for a list of AttendanceReasons.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendanceReason <- function(AttendanceReasonID, EntityID = 1, setAttendanceReasonIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setSchoolYearID = NULL, setTeacherEntryID = 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("Attendance", "AttendanceReason", AttendanceReasonID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendanceReason.
#'
#' This function creates a new AttendanceReason.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendanceReason <- function(EntityID = 1, setAttendanceReasonIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setSchoolYearID = NULL, setTeacherEntryID = 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("Attendance", "AttendanceReason", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendanceReason
#'
#' This function deletes an AttendanceReason.
#'
#' @param AttendanceReasonID The id of the AttendanceReason.\cr Run \code{\link{getAllAttendanceReasons}} for a list of AttendanceReasons.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendanceReason <- function(AttendanceReasonID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendanceReason", AttendanceReasonID, EntityID)
}
#' Get all AttendanceReportRunHistories.
#'
#' This function returns a dataframe of all AttendanceReportRunHistories 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 Attendance
#' @return All AttendanceReportRunHistories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendanceReportRunHistories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendanceReportRunHistoryID = F, returnAttachmentDisplayName = F, returnCachedEntity = F, returnCachedFiscalYear = F, returnCachedSchoolYear = F, returnCountType = F, returnCreatedTime = F, returnDate = F, returnEntityID = F, returnEntityIDList = F, returnFilterType = F, returnFilterTypeCode = F, returnFiscalYearID = F, returnGracePeriod = F, returnIsActive = F, returnModifiedTime = F, returnParameterData = F, returnParameterDescription = F, returnPostToFASA = F, returnPrintAttendanceLetterForWindowedEnvelope = F, returnReportRunInfoID = F, returnRunDescription = F, returnSchoolYearID = F, returnSchoolYearNumericYearOrCurrent = 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("Attendance", "AttendanceReportRunHistory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendanceReportRunHistory
#'
#' This function returns fields for an AttendanceReportRunHistory.
#'
#' @param AttendanceReportRunHistoryID The id of the AttendanceReportRunHistory.\cr Run \code{\link{getAllAttendanceReportRunHistories}} for a list of AttendanceReportRunHistories.
#' @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 Attendance
#' @return Details for the AttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendanceReportRunHistory <- function(AttendanceReportRunHistoryID, EntityID = 1, returnAttendanceReportRunHistoryID = F, returnAttachmentDisplayName = F, returnCachedEntity = F, returnCachedFiscalYear = F, returnCachedSchoolYear = F, returnCountType = F, returnCreatedTime = F, returnDate = F, returnEntityID = F, returnEntityIDList = F, returnFilterType = F, returnFilterTypeCode = F, returnFiscalYearID = F, returnGracePeriod = F, returnIsActive = F, returnModifiedTime = F, returnParameterData = F, returnParameterDescription = F, returnPostToFASA = F, returnPrintAttendanceLetterForWindowedEnvelope = F, returnReportRunInfoID = F, returnRunDescription = F, returnSchoolYearID = F, returnSchoolYearNumericYearOrCurrent = 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("Attendance", "AttendanceReportRunHistory", AttendanceReportRunHistoryID, searchFields, EntityID)
}
#' Modify a specific AttendanceReportRunHistory
#'
#' This function modifies fields for an AttendanceReportRunHistory.
#'
#' @param AttendanceReportRunHistoryID The id of the AttendanceReportRunHistory to be modified.\cr Run \code{\link{getAllAttendanceReportRunHistories}} for a list of AttendanceReportRunHistorys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendanceReportRunHistory <- function(AttendanceReportRunHistoryID, EntityID = 1, setAttachmentDisplayName = NULL, setDate = NULL, setEntityID = NULL, setFilterType = NULL, setFilterTypeCode = NULL, setGracePeriod = NULL, setIsActive = NULL, setPostToFASA = NULL, setReportRunInfoID = NULL, setRunDescription = 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("Attendance", "AttendanceReportRunHistory", AttendanceReportRunHistoryID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendanceReportRunHistory.
#'
#' This function creates a new AttendanceReportRunHistory.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendanceReportRunHistory <- function(EntityID = 1, setAttachmentDisplayName = NULL, setDate = NULL, setEntityID = NULL, setFilterType = NULL, setFilterTypeCode = NULL, setGracePeriod = NULL, setIsActive = NULL, setPostToFASA = NULL, setReportRunInfoID = NULL, setRunDescription = 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("Attendance", "AttendanceReportRunHistory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendanceReportRunHistory
#'
#' This function deletes an AttendanceReportRunHistory.
#'
#' @param AttendanceReportRunHistoryID The id of the AttendanceReportRunHistory.\cr Run \code{\link{getAllAttendanceReportRunHistories}} for a list of AttendanceReportRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendanceReportRunHistory <- function(AttendanceReportRunHistoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendanceReportRunHistory", AttendanceReportRunHistoryID, EntityID)
}
#' Get all AttendanceReportRunHistoryThresholdResetRanges.
#'
#' This function returns a dataframe of all AttendanceReportRunHistoryThresholdResetRanges 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 Attendance
#' @return All AttendanceReportRunHistoryThresholdResetRanges in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendanceReportRunHistoryThresholdResetRanges <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendanceReportRunHistoryThresholdResetRangeID = F, returnAttendanceReportRunHistoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "AttendanceReportRunHistoryThresholdResetRange", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendanceReportRunHistoryThresholdResetRange
#'
#' This function returns fields for an AttendanceReportRunHistoryThresholdResetRange.
#'
#' @param AttendanceReportRunHistoryThresholdResetRangeID The id of the AttendanceReportRunHistoryThresholdResetRange.\cr Run \code{\link{getAllAttendanceReportRunHistoryThresholdResetRanges}} for a list of AttendanceReportRunHistoryThresholdResetRanges.
#' @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 Attendance
#' @return Details for the AttendanceReportRunHistoryThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendanceReportRunHistoryThresholdResetRange <- function(AttendanceReportRunHistoryThresholdResetRangeID, EntityID = 1, returnAttendanceReportRunHistoryThresholdResetRangeID = F, returnAttendanceReportRunHistoryID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "AttendanceReportRunHistoryThresholdResetRange", AttendanceReportRunHistoryThresholdResetRangeID, searchFields, EntityID)
}
#' Modify a specific AttendanceReportRunHistoryThresholdResetRange
#'
#' This function modifies fields for an AttendanceReportRunHistoryThresholdResetRange.
#'
#' @param AttendanceReportRunHistoryThresholdResetRangeID The id of the AttendanceReportRunHistoryThresholdResetRange to be modified.\cr Run \code{\link{getAllAttendanceReportRunHistoryThresholdResetRanges}} for a list of AttendanceReportRunHistoryThresholdResetRanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendanceReportRunHistoryThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendanceReportRunHistoryThresholdResetRange <- function(AttendanceReportRunHistoryThresholdResetRangeID, EntityID = 1, setAttendanceReportRunHistoryID = NULL, setThresholdResetRangeID = 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("Attendance", "AttendanceReportRunHistoryThresholdResetRange", AttendanceReportRunHistoryThresholdResetRangeID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendanceReportRunHistoryThresholdResetRange.
#'
#' This function creates a new AttendanceReportRunHistoryThresholdResetRange.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendanceReportRunHistoryThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendanceReportRunHistoryThresholdResetRange <- function(EntityID = 1, setAttendanceReportRunHistoryID = NULL, setThresholdResetRangeID = 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("Attendance", "AttendanceReportRunHistoryThresholdResetRange", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendanceReportRunHistoryThresholdResetRange
#'
#' This function deletes an AttendanceReportRunHistoryThresholdResetRange.
#'
#' @param AttendanceReportRunHistoryThresholdResetRangeID The id of the AttendanceReportRunHistoryThresholdResetRange.\cr Run \code{\link{getAllAttendanceReportRunHistoryThresholdResetRanges}} for a list of AttendanceReportRunHistoryThresholdResetRanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendanceReportRunHistoryThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendanceReportRunHistoryThresholdResetRange <- function(AttendanceReportRunHistoryThresholdResetRangeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendanceReportRunHistoryThresholdResetRange", AttendanceReportRunHistoryThresholdResetRangeID, EntityID)
}
#' Get all AttendanceTerms.
#'
#' This function returns a dataframe of all AttendanceTerms 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 Attendance
#' @return All AttendanceTerms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendanceTerms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendanceTermID = F, returnAttendanceTermIDClonedFrom = F, returnCalendarID = F, returnCode = F, returnCreatedTime = F, returnDaysInTerm = F, returnEndDate = F, returnModifiedTime = 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("Attendance", "AttendanceTerm", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendanceTerm
#'
#' This function returns fields for an AttendanceTerm.
#'
#' @param AttendanceTermID The id of the AttendanceTerm.\cr Run \code{\link{getAllAttendanceTerms}} for a list of AttendanceTerms.
#' @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 Attendance
#' @return Details for the AttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendanceTerm <- function(AttendanceTermID, EntityID = 1, returnAttendanceTermID = F, returnAttendanceTermIDClonedFrom = F, returnCalendarID = F, returnCode = F, returnCreatedTime = F, returnDaysInTerm = F, returnEndDate = F, returnModifiedTime = 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("Attendance", "AttendanceTerm", AttendanceTermID, searchFields, EntityID)
}
#' Modify a specific AttendanceTerm
#'
#' This function modifies fields for an AttendanceTerm.
#'
#' @param AttendanceTermID The id of the AttendanceTerm to be modified.\cr Run \code{\link{getAllAttendanceTerms}} for a list of AttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendanceTerm <- function(AttendanceTermID, EntityID = 1, setAttendanceTermIDClonedFrom = NULL, setCalendarID = NULL, setCode = NULL, setEndDate = 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("Attendance", "AttendanceTerm", AttendanceTermID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendanceTerm.
#'
#' This function creates a new AttendanceTerm.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendanceTerm <- function(EntityID = 1, setAttendanceTermIDClonedFrom = NULL, setCalendarID = NULL, setCode = NULL, setEndDate = 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("Attendance", "AttendanceTerm", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendanceTerm
#'
#' This function deletes an AttendanceTerm.
#'
#' @param AttendanceTermID The id of the AttendanceTerm.\cr Run \code{\link{getAllAttendanceTerms}} for a list of AttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendanceTerm <- function(AttendanceTermID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendanceTerm", AttendanceTermID, EntityID)
}
#' Get all AttendanceTypes.
#'
#' This function returns a dataframe of all AttendanceTypes 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 Attendance
#' @return All AttendanceTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllAttendanceTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnAttendanceTypeID = F, returnAttendanceTypeIDClonedFrom = F, returnAttendanceTypeMNID = F, returnCategory = F, returnCategoryCode = F, returnCategoryDescription = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnIncludeInClassCounts = F, returnIncludeInSpecialClassCounts = F, returnIncludeInTotals = F, returnIsTruant = F, returnModifiedTime = F, returnSchoolYearID = F, returnShowOnGradesheetAssignments = F, returnTeacherEntryID = 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("Attendance", "AttendanceType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific AttendanceType
#'
#' This function returns fields for an AttendanceType.
#'
#' @param AttendanceTypeID The id of the AttendanceType.\cr Run \code{\link{getAllAttendanceTypes}} for a list of AttendanceTypes.
#' @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 Attendance
#' @return Details for the AttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAttendanceType <- function(AttendanceTypeID, EntityID = 1, returnAttendanceTypeID = F, returnAttendanceTypeIDClonedFrom = F, returnAttendanceTypeMNID = F, returnCategory = F, returnCategoryCode = F, returnCategoryDescription = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityGroupKey = F, returnEntityID = F, returnIncludeInClassCounts = F, returnIncludeInSpecialClassCounts = F, returnIncludeInTotals = F, returnIsTruant = F, returnModifiedTime = F, returnSchoolYearID = F, returnShowOnGradesheetAssignments = F, returnTeacherEntryID = 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("Attendance", "AttendanceType", AttendanceTypeID, searchFields, EntityID)
}
#' Modify a specific AttendanceType
#'
#' This function modifies fields for an AttendanceType.
#'
#' @param AttendanceTypeID The id of the AttendanceType to be modified.\cr Run \code{\link{getAllAttendanceTypes}} for a list of AttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified AttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyAttendanceType <- function(AttendanceTypeID, EntityID = 1, setAttendanceTypeIDClonedFrom = NULL, setCategory = NULL, setCategoryCode = NULL, setCategoryDescription = NULL, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIncludeInClassCounts = NULL, setIncludeInSpecialClassCounts = NULL, setIncludeInTotals = NULL, setIsTruant = NULL, setSchoolYearID = NULL, setShowOnGradesheetAssignments = NULL, setTeacherEntryID = 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("Attendance", "AttendanceType", AttendanceTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new AttendanceType.
#'
#' This function creates a new AttendanceType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created AttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createAttendanceType <- function(EntityID = 1, setAttendanceTypeIDClonedFrom = NULL, setCategory = NULL, setCategoryCode = NULL, setCategoryDescription = NULL, setCode = NULL, setDescription = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIncludeInClassCounts = NULL, setIncludeInSpecialClassCounts = NULL, setIncludeInTotals = NULL, setIsTruant = NULL, setSchoolYearID = NULL, setShowOnGradesheetAssignments = NULL, setTeacherEntryID = 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("Attendance", "AttendanceType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific AttendanceType
#'
#' This function deletes an AttendanceType.
#'
#' @param AttendanceTypeID The id of the AttendanceType.\cr Run \code{\link{getAllAttendanceTypes}} for a list of AttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted AttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteAttendanceType <- function(AttendanceTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "AttendanceType", AttendanceTypeID, EntityID)
}
#' Get all BellSchedules.
#'
#' This function returns a dataframe of all BellSchedules 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 Attendance
#' @return All BellSchedules in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllBellSchedules <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnBellScheduleID = F, returnBellScheduleIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "BellSchedule", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific BellSchedule
#'
#' This function returns fields for a BellSchedule.
#'
#' @param BellScheduleID The id of the BellSchedule.\cr Run \code{\link{getAllBellSchedules}} for a list of BellSchedules.
#' @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 Attendance
#' @return Details for the BellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getBellSchedule <- function(BellScheduleID, EntityID = 1, returnBellScheduleID = F, returnBellScheduleIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "BellSchedule", BellScheduleID, searchFields, EntityID)
}
#' Modify a specific BellSchedule
#'
#' This function modifies fields for a BellSchedule.
#'
#' @param BellScheduleID The id of the BellSchedule to be modified.\cr Run \code{\link{getAllBellSchedules}} for a list of BellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified BellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyBellSchedule <- function(BellScheduleID, EntityID = 1, setBellScheduleIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityID = NULL, setIsDefault = 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("Attendance", "BellSchedule", BellScheduleID, names(functionParams), functionParams, EntityID)
}
#' Create new BellSchedule.
#'
#' This function creates a new BellSchedule.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created BellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createBellSchedule <- function(EntityID = 1, setBellScheduleIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityID = NULL, setIsDefault = 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("Attendance", "BellSchedule", names(functionParams), functionParams, EntityID)
}
#' Delete a specific BellSchedule
#'
#' This function deletes a BellSchedule.
#'
#' @param BellScheduleID The id of the BellSchedule.\cr Run \code{\link{getAllBellSchedules}} for a list of BellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted BellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteBellSchedule <- function(BellScheduleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "BellSchedule", BellScheduleID, EntityID)
}
#' Get all BellScheduleGroups.
#'
#' This function returns a dataframe of all BellScheduleGroups 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 Attendance
#' @return All BellScheduleGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllBellScheduleGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnBellScheduleGroupID = F, returnAttendancePeriodIDAsOfDate = F, returnBellScheduleGroupIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "BellScheduleGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific BellScheduleGroup
#'
#' This function returns fields for a BellScheduleGroup.
#'
#' @param BellScheduleGroupID The id of the BellScheduleGroup.\cr Run \code{\link{getAllBellScheduleGroups}} for a list of BellScheduleGroups.
#' @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 Attendance
#' @return Details for the BellScheduleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getBellScheduleGroup <- function(BellScheduleGroupID, EntityID = 1, returnBellScheduleGroupID = F, returnAttendancePeriodIDAsOfDate = F, returnBellScheduleGroupIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEntityID = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "BellScheduleGroup", BellScheduleGroupID, searchFields, EntityID)
}
#' Modify a specific BellScheduleGroup
#'
#' This function modifies fields for a BellScheduleGroup.
#'
#' @param BellScheduleGroupID The id of the BellScheduleGroup to be modified.\cr Run \code{\link{getAllBellScheduleGroups}} for a list of BellScheduleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified BellScheduleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyBellScheduleGroup <- function(BellScheduleGroupID, EntityID = 1, setBellScheduleGroupIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityID = NULL, setIsDefault = 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("Attendance", "BellScheduleGroup", BellScheduleGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new BellScheduleGroup.
#'
#' This function creates a new BellScheduleGroup.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created BellScheduleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createBellScheduleGroup <- function(EntityID = 1, setBellScheduleGroupIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEntityID = NULL, setIsDefault = 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("Attendance", "BellScheduleGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific BellScheduleGroup
#'
#' This function deletes a BellScheduleGroup.
#'
#' @param BellScheduleGroupID The id of the BellScheduleGroup.\cr Run \code{\link{getAllBellScheduleGroups}} for a list of BellScheduleGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted BellScheduleGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteBellScheduleGroup <- function(BellScheduleGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "BellScheduleGroup", BellScheduleGroupID, EntityID)
}
#' Get all BellScheduleGroupBellSchedules.
#'
#' This function returns a dataframe of all BellScheduleGroupBellSchedules 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 Attendance
#' @return All BellScheduleGroupBellSchedules in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllBellScheduleGroupBellSchedules <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupID = F, returnBellScheduleID = 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("Attendance", "BellScheduleGroupBellSchedule", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific BellScheduleGroupBellSchedule
#'
#' This function returns fields for a BellScheduleGroupBellSchedule.
#'
#' @param BellScheduleGroupBellScheduleID The id of the BellScheduleGroupBellSchedule.\cr Run \code{\link{getAllBellScheduleGroupBellSchedules}} for a list of BellScheduleGroupBellSchedules.
#' @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 Attendance
#' @return Details for the BellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getBellScheduleGroupBellSchedule <- function(BellScheduleGroupBellScheduleID, EntityID = 1, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupID = F, returnBellScheduleID = 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("Attendance", "BellScheduleGroupBellSchedule", BellScheduleGroupBellScheduleID, searchFields, EntityID)
}
#' Modify a specific BellScheduleGroupBellSchedule
#'
#' This function modifies fields for a BellScheduleGroupBellSchedule.
#'
#' @param BellScheduleGroupBellScheduleID The id of the BellScheduleGroupBellSchedule to be modified.\cr Run \code{\link{getAllBellScheduleGroupBellSchedules}} for a list of BellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified BellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyBellScheduleGroupBellSchedule <- function(BellScheduleGroupBellScheduleID, EntityID = 1, setBellScheduleGroupID = NULL, setBellScheduleID = 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("Attendance", "BellScheduleGroupBellSchedule", BellScheduleGroupBellScheduleID, names(functionParams), functionParams, EntityID)
}
#' Create new BellScheduleGroupBellSchedule.
#'
#' This function creates a new BellScheduleGroupBellSchedule.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created BellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createBellScheduleGroupBellSchedule <- function(EntityID = 1, setBellScheduleGroupID = NULL, setBellScheduleID = 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("Attendance", "BellScheduleGroupBellSchedule", names(functionParams), functionParams, EntityID)
}
#' Delete a specific BellScheduleGroupBellSchedule
#'
#' This function deletes a BellScheduleGroupBellSchedule.
#'
#' @param BellScheduleGroupBellScheduleID The id of the BellScheduleGroupBellSchedule.\cr Run \code{\link{getAllBellScheduleGroupBellSchedules}} for a list of BellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted BellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteBellScheduleGroupBellSchedule <- function(BellScheduleGroupBellScheduleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "BellScheduleGroupBellSchedule", BellScheduleGroupBellScheduleID, EntityID)
}
#' Get all BellSchedulingPeriods.
#'
#' This function returns a dataframe of all BellSchedulingPeriods 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 Attendance
#' @return All BellSchedulingPeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllBellSchedulingPeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnBellSchedulingPeriodID = F, returnBellScheduleID = F, returnBellSchedulingPeriodIDClonedFrom = F, returnCreatedTime = F, returnEndTime = F, returnEndTimeWithOverride = F, returnLengthInMinutes = F, returnModifiedTime = F, returnSchedulingPeriodID = F, returnStartTime = F, returnStartTimeWithOverride = 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("Attendance", "BellSchedulingPeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific BellSchedulingPeriod
#'
#' This function returns fields for a BellSchedulingPeriod.
#'
#' @param BellSchedulingPeriodID The id of the BellSchedulingPeriod.\cr Run \code{\link{getAllBellSchedulingPeriods}} for a list of BellSchedulingPeriods.
#' @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 Attendance
#' @return Details for the BellSchedulingPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getBellSchedulingPeriod <- function(BellSchedulingPeriodID, EntityID = 1, returnBellSchedulingPeriodID = F, returnBellScheduleID = F, returnBellSchedulingPeriodIDClonedFrom = F, returnCreatedTime = F, returnEndTime = F, returnEndTimeWithOverride = F, returnLengthInMinutes = F, returnModifiedTime = F, returnSchedulingPeriodID = F, returnStartTime = F, returnStartTimeWithOverride = 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("Attendance", "BellSchedulingPeriod", BellSchedulingPeriodID, searchFields, EntityID)
}
#' Modify a specific BellSchedulingPeriod
#'
#' This function modifies fields for a BellSchedulingPeriod.
#'
#' @param BellSchedulingPeriodID The id of the BellSchedulingPeriod to be modified.\cr Run \code{\link{getAllBellSchedulingPeriods}} for a list of BellSchedulingPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified BellSchedulingPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyBellSchedulingPeriod <- function(BellSchedulingPeriodID, EntityID = 1, setBellScheduleID = NULL, setBellSchedulingPeriodIDClonedFrom = NULL, setEndTime = NULL, setSchedulingPeriodID = NULL, setStartTime = 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("Attendance", "BellSchedulingPeriod", BellSchedulingPeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new BellSchedulingPeriod.
#'
#' This function creates a new BellSchedulingPeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created BellSchedulingPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createBellSchedulingPeriod <- function(EntityID = 1, setBellScheduleID = NULL, setBellSchedulingPeriodIDClonedFrom = NULL, setEndTime = NULL, setSchedulingPeriodID = NULL, setStartTime = 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("Attendance", "BellSchedulingPeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific BellSchedulingPeriod
#'
#' This function deletes a BellSchedulingPeriod.
#'
#' @param BellSchedulingPeriodID The id of the BellSchedulingPeriod.\cr Run \code{\link{getAllBellSchedulingPeriods}} for a list of BellSchedulingPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted BellSchedulingPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteBellSchedulingPeriod <- function(BellSchedulingPeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "BellSchedulingPeriod", BellSchedulingPeriodID, EntityID)
}
#' Get all CalendarDays.
#'
#' This function returns a dataframe of all CalendarDays 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 Attendance
#' @return All CalendarDays in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDays <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDayID = F, returnAttendanceTerm = F, returnBellScheduleGroupSummary = F, returnBellScheduleID = F, returnCalendarID = F, returnComment = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDateWithDayOfWeekAbbreviated = F, returnDayOfTheWeek = F, returnDayOfTheWeekNumber = F, returnDayRotationID = F, returnDynamicRelationshipID = F, returnFoodServicePurchaseExists = F, returnModifiedTime = F, returnNumberOfCalendarDayEvents = 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("Attendance", "CalendarDay", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDay
#'
#' This function returns fields for a CalendarDay.
#'
#' @param CalendarDayID The id of the CalendarDay.\cr Run \code{\link{getAllCalendarDays}} for a list of CalendarDays.
#' @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 Attendance
#' @return Details for the CalendarDay.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDay <- function(CalendarDayID, EntityID = 1, returnCalendarDayID = F, returnAttendanceTerm = F, returnBellScheduleGroupSummary = F, returnBellScheduleID = F, returnCalendarID = F, returnComment = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDateWithDayOfWeekAbbreviated = F, returnDayOfTheWeek = F, returnDayOfTheWeekNumber = F, returnDayRotationID = F, returnDynamicRelationshipID = F, returnFoodServicePurchaseExists = F, returnModifiedTime = F, returnNumberOfCalendarDayEvents = 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("Attendance", "CalendarDay", CalendarDayID, searchFields, EntityID)
}
#' Modify a specific CalendarDay
#'
#' This function modifies fields for a CalendarDay.
#'
#' @param CalendarDayID The id of the CalendarDay to be modified.\cr Run \code{\link{getAllCalendarDays}} for a list of CalendarDays.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDay.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDay <- function(CalendarDayID, EntityID = 1, setBellScheduleID = NULL, setCalendarID = NULL, setComment = NULL, setCountAs = NULL, setDate = NULL, setDayRotationID = NULL, setDynamicRelationshipID = 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("Attendance", "CalendarDay", CalendarDayID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDay.
#'
#' This function creates a new CalendarDay.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDay.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDay <- function(EntityID = 1, setBellScheduleID = NULL, setCalendarID = NULL, setComment = NULL, setCountAs = NULL, setDate = NULL, setDayRotationID = NULL, setDynamicRelationshipID = 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("Attendance", "CalendarDay", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDay
#'
#' This function deletes a CalendarDay.
#'
#' @param CalendarDayID The id of the CalendarDay.\cr Run \code{\link{getAllCalendarDays}} for a list of CalendarDays.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDay.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDay <- function(CalendarDayID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDay", CalendarDayID, EntityID)
}
#' Get all CalendarDayBellScheduleGroupBellSchedules.
#'
#' This function returns a dataframe of all CalendarDayBellScheduleGroupBellSchedules 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 Attendance
#' @return All CalendarDayBellScheduleGroupBellSchedules in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDayBellScheduleGroupBellSchedules <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDayBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupID = F, returnCalendarDayID = 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("Attendance", "CalendarDayBellScheduleGroupBellSchedule", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDayBellScheduleGroupBellSchedule
#'
#' This function returns fields for a CalendarDayBellScheduleGroupBellSchedule.
#'
#' @param CalendarDayBellScheduleGroupBellScheduleID The id of the CalendarDayBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllCalendarDayBellScheduleGroupBellSchedules}} for a list of CalendarDayBellScheduleGroupBellSchedules.
#' @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 Attendance
#' @return Details for the CalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDayBellScheduleGroupBellSchedule <- function(CalendarDayBellScheduleGroupBellScheduleID, EntityID = 1, returnCalendarDayBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupID = F, returnCalendarDayID = 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("Attendance", "CalendarDayBellScheduleGroupBellSchedule", CalendarDayBellScheduleGroupBellScheduleID, searchFields, EntityID)
}
#' Modify a specific CalendarDayBellScheduleGroupBellSchedule
#'
#' This function modifies fields for a CalendarDayBellScheduleGroupBellSchedule.
#'
#' @param CalendarDayBellScheduleGroupBellScheduleID The id of the CalendarDayBellScheduleGroupBellSchedule to be modified.\cr Run \code{\link{getAllCalendarDayBellScheduleGroupBellSchedules}} for a list of CalendarDayBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDayBellScheduleGroupBellSchedule <- function(CalendarDayBellScheduleGroupBellScheduleID, EntityID = 1, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupID = NULL, setCalendarDayID = 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("Attendance", "CalendarDayBellScheduleGroupBellSchedule", CalendarDayBellScheduleGroupBellScheduleID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDayBellScheduleGroupBellSchedule.
#'
#' This function creates a new CalendarDayBellScheduleGroupBellSchedule.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDayBellScheduleGroupBellSchedule <- function(EntityID = 1, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupID = NULL, setCalendarDayID = 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("Attendance", "CalendarDayBellScheduleGroupBellSchedule", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDayBellScheduleGroupBellSchedule
#'
#' This function deletes a CalendarDayBellScheduleGroupBellSchedule.
#'
#' @param CalendarDayBellScheduleGroupBellScheduleID The id of the CalendarDayBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllCalendarDayBellScheduleGroupBellSchedules}} for a list of CalendarDayBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDayBellScheduleGroupBellSchedule <- function(CalendarDayBellScheduleGroupBellScheduleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDayBellScheduleGroupBellSchedule", CalendarDayBellScheduleGroupBellScheduleID, EntityID)
}
#' Get all CalendarDayCalendarEvents.
#'
#' This function returns a dataframe of all CalendarDayCalendarEvents 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 Attendance
#' @return All CalendarDayCalendarEvents in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDayCalendarEvents <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDayCalendarEventID = F, returnCalendarDayID = F, returnCalendarEventID = 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("Attendance", "CalendarDayCalendarEvent", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDayCalendarEvent
#'
#' This function returns fields for a CalendarDayCalendarEvent.
#'
#' @param CalendarDayCalendarEventID The id of the CalendarDayCalendarEvent.\cr Run \code{\link{getAllCalendarDayCalendarEvents}} for a list of CalendarDayCalendarEvents.
#' @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 Attendance
#' @return Details for the CalendarDayCalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDayCalendarEvent <- function(CalendarDayCalendarEventID, EntityID = 1, returnCalendarDayCalendarEventID = F, returnCalendarDayID = F, returnCalendarEventID = 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("Attendance", "CalendarDayCalendarEvent", CalendarDayCalendarEventID, searchFields, EntityID)
}
#' Modify a specific CalendarDayCalendarEvent
#'
#' This function modifies fields for a CalendarDayCalendarEvent.
#'
#' @param CalendarDayCalendarEventID The id of the CalendarDayCalendarEvent to be modified.\cr Run \code{\link{getAllCalendarDayCalendarEvents}} for a list of CalendarDayCalendarEvents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDayCalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDayCalendarEvent <- function(CalendarDayCalendarEventID, EntityID = 1, setCalendarDayID = NULL, setCalendarEventID = 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("Attendance", "CalendarDayCalendarEvent", CalendarDayCalendarEventID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDayCalendarEvent.
#'
#' This function creates a new CalendarDayCalendarEvent.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDayCalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDayCalendarEvent <- function(EntityID = 1, setCalendarDayID = NULL, setCalendarEventID = 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("Attendance", "CalendarDayCalendarEvent", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDayCalendarEvent
#'
#' This function deletes a CalendarDayCalendarEvent.
#'
#' @param CalendarDayCalendarEventID The id of the CalendarDayCalendarEvent.\cr Run \code{\link{getAllCalendarDayCalendarEvents}} for a list of CalendarDayCalendarEvents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDayCalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDayCalendarEvent <- function(CalendarDayCalendarEventID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDayCalendarEvent", CalendarDayCalendarEventID, EntityID)
}
#' Get all CalendarDayDisplayPeriodOverrides.
#'
#' This function returns a dataframe of all CalendarDayDisplayPeriodOverrides 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 Attendance
#' @return All CalendarDayDisplayPeriodOverrides in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDayDisplayPeriodOverrides <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDayDisplayPeriodOverrideID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnLengthMinutes = F, returnModifiedTime = F, returnRemovePeriod = 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("Attendance", "CalendarDayDisplayPeriodOverride", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDayDisplayPeriodOverride
#'
#' This function returns fields for a CalendarDayDisplayPeriodOverride.
#'
#' @param CalendarDayDisplayPeriodOverrideID The id of the CalendarDayDisplayPeriodOverride.\cr Run \code{\link{getAllCalendarDayDisplayPeriodOverrides}} for a list of CalendarDayDisplayPeriodOverrides.
#' @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 Attendance
#' @return Details for the CalendarDayDisplayPeriodOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDayDisplayPeriodOverride <- function(CalendarDayDisplayPeriodOverrideID, EntityID = 1, returnCalendarDayDisplayPeriodOverrideID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnLengthMinutes = F, returnModifiedTime = F, returnRemovePeriod = 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("Attendance", "CalendarDayDisplayPeriodOverride", CalendarDayDisplayPeriodOverrideID, searchFields, EntityID)
}
#' Modify a specific CalendarDayDisplayPeriodOverride
#'
#' This function modifies fields for a CalendarDayDisplayPeriodOverride.
#'
#' @param CalendarDayDisplayPeriodOverrideID The id of the CalendarDayDisplayPeriodOverride to be modified.\cr Run \code{\link{getAllCalendarDayDisplayPeriodOverrides}} for a list of CalendarDayDisplayPeriodOverrides.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDayDisplayPeriodOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDayDisplayPeriodOverride <- function(CalendarDayDisplayPeriodOverrideID, EntityID = 1, setCalendarDayID = NULL, setDisplayPeriodID = NULL, setLengthMinutes = NULL, setRemovePeriod = 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("Attendance", "CalendarDayDisplayPeriodOverride", CalendarDayDisplayPeriodOverrideID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDayDisplayPeriodOverride.
#'
#' This function creates a new CalendarDayDisplayPeriodOverride.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDayDisplayPeriodOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDayDisplayPeriodOverride <- function(EntityID = 1, setCalendarDayID = NULL, setDisplayPeriodID = NULL, setLengthMinutes = NULL, setRemovePeriod = 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("Attendance", "CalendarDayDisplayPeriodOverride", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDayDisplayPeriodOverride
#'
#' This function deletes a CalendarDayDisplayPeriodOverride.
#'
#' @param CalendarDayDisplayPeriodOverrideID The id of the CalendarDayDisplayPeriodOverride.\cr Run \code{\link{getAllCalendarDayDisplayPeriodOverrides}} for a list of CalendarDayDisplayPeriodOverrides.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDayDisplayPeriodOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDayDisplayPeriodOverride <- function(CalendarDayDisplayPeriodOverrideID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDayDisplayPeriodOverride", CalendarDayDisplayPeriodOverrideID, EntityID)
}
#' Get all CalendarDaySchedulingPeriodTimesOverrides.
#'
#' This function returns a dataframe of all CalendarDaySchedulingPeriodTimesOverrides 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 Attendance
#' @return All CalendarDaySchedulingPeriodTimesOverrides in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDaySchedulingPeriodTimesOverrides <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDaySchedulingPeriodTimesOverrideID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDurationInMinutes = F, returnEndTime = F, returnModifiedTime = F, returnSchedulingPeriodID = F, returnStartTime = 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("Attendance", "CalendarDaySchedulingPeriodTimesOverride", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDaySchedulingPeriodTimesOverride
#'
#' This function returns fields for a CalendarDaySchedulingPeriodTimesOverride.
#'
#' @param CalendarDaySchedulingPeriodTimesOverrideID The id of the CalendarDaySchedulingPeriodTimesOverride.\cr Run \code{\link{getAllCalendarDaySchedulingPeriodTimesOverrides}} for a list of CalendarDaySchedulingPeriodTimesOverrides.
#' @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 Attendance
#' @return Details for the CalendarDaySchedulingPeriodTimesOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDaySchedulingPeriodTimesOverride <- function(CalendarDaySchedulingPeriodTimesOverrideID, EntityID = 1, returnCalendarDaySchedulingPeriodTimesOverrideID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDurationInMinutes = F, returnEndTime = F, returnModifiedTime = F, returnSchedulingPeriodID = F, returnStartTime = 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("Attendance", "CalendarDaySchedulingPeriodTimesOverride", CalendarDaySchedulingPeriodTimesOverrideID, searchFields, EntityID)
}
#' Modify a specific CalendarDaySchedulingPeriodTimesOverride
#'
#' This function modifies fields for a CalendarDaySchedulingPeriodTimesOverride.
#'
#' @param CalendarDaySchedulingPeriodTimesOverrideID The id of the CalendarDaySchedulingPeriodTimesOverride to be modified.\cr Run \code{\link{getAllCalendarDaySchedulingPeriodTimesOverrides}} for a list of CalendarDaySchedulingPeriodTimesOverrides.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDaySchedulingPeriodTimesOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDaySchedulingPeriodTimesOverride <- function(CalendarDaySchedulingPeriodTimesOverrideID, EntityID = 1, setCalendarDayID = NULL, setEndTime = NULL, setSchedulingPeriodID = NULL, setStartTime = 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("Attendance", "CalendarDaySchedulingPeriodTimesOverride", CalendarDaySchedulingPeriodTimesOverrideID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDaySchedulingPeriodTimesOverride.
#'
#' This function creates a new CalendarDaySchedulingPeriodTimesOverride.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDaySchedulingPeriodTimesOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDaySchedulingPeriodTimesOverride <- function(EntityID = 1, setCalendarDayID = NULL, setEndTime = NULL, setSchedulingPeriodID = NULL, setStartTime = 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("Attendance", "CalendarDaySchedulingPeriodTimesOverride", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDaySchedulingPeriodTimesOverride
#'
#' This function deletes a CalendarDaySchedulingPeriodTimesOverride.
#'
#' @param CalendarDaySchedulingPeriodTimesOverrideID The id of the CalendarDaySchedulingPeriodTimesOverride.\cr Run \code{\link{getAllCalendarDaySchedulingPeriodTimesOverrides}} for a list of CalendarDaySchedulingPeriodTimesOverrides.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDaySchedulingPeriodTimesOverride.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDaySchedulingPeriodTimesOverride <- function(CalendarDaySchedulingPeriodTimesOverrideID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDaySchedulingPeriodTimesOverride", CalendarDaySchedulingPeriodTimesOverrideID, EntityID)
}
#' Get all CalendarDisplayPeriods.
#'
#' This function returns a dataframe of all CalendarDisplayPeriods 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 Attendance
#' @return All CalendarDisplayPeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarDisplayPeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarDisplayPeriodID = F, returnCalendarDisplayPeriodIDClonedFrom = F, returnCalendarDisplayPeriodIDClonedTo = F, returnCalendarID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnIncludeInClassCounts = F, returnIncludeInTotalCounts = F, returnModifiedTime = F, returnTakeAttendance = 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("Attendance", "CalendarDisplayPeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarDisplayPeriod
#'
#' This function returns fields for a CalendarDisplayPeriod.
#'
#' @param CalendarDisplayPeriodID The id of the CalendarDisplayPeriod.\cr Run \code{\link{getAllCalendarDisplayPeriods}} for a list of CalendarDisplayPeriods.
#' @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 Attendance
#' @return Details for the CalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarDisplayPeriod <- function(CalendarDisplayPeriodID, EntityID = 1, returnCalendarDisplayPeriodID = F, returnCalendarDisplayPeriodIDClonedFrom = F, returnCalendarDisplayPeriodIDClonedTo = F, returnCalendarID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnIncludeInClassCounts = F, returnIncludeInTotalCounts = F, returnModifiedTime = F, returnTakeAttendance = 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("Attendance", "CalendarDisplayPeriod", CalendarDisplayPeriodID, searchFields, EntityID)
}
#' Modify a specific CalendarDisplayPeriod
#'
#' This function modifies fields for a CalendarDisplayPeriod.
#'
#' @param CalendarDisplayPeriodID The id of the CalendarDisplayPeriod to be modified.\cr Run \code{\link{getAllCalendarDisplayPeriods}} for a list of CalendarDisplayPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarDisplayPeriod <- function(CalendarDisplayPeriodID, EntityID = 1, setCalendarDisplayPeriodIDClonedFrom = NULL, setCalendarID = NULL, setDisplayPeriodID = NULL, setIncludeInClassCounts = NULL, setIncludeInTotalCounts = NULL, setTakeAttendance = 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("Attendance", "CalendarDisplayPeriod", CalendarDisplayPeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarDisplayPeriod.
#'
#' This function creates a new CalendarDisplayPeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarDisplayPeriod <- function(EntityID = 1, setCalendarDisplayPeriodIDClonedFrom = NULL, setCalendarID = NULL, setDisplayPeriodID = NULL, setIncludeInClassCounts = NULL, setIncludeInTotalCounts = NULL, setTakeAttendance = 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("Attendance", "CalendarDisplayPeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarDisplayPeriod
#'
#' This function deletes a CalendarDisplayPeriod.
#'
#' @param CalendarDisplayPeriodID The id of the CalendarDisplayPeriod.\cr Run \code{\link{getAllCalendarDisplayPeriods}} for a list of CalendarDisplayPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarDisplayPeriod <- function(CalendarDisplayPeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarDisplayPeriod", CalendarDisplayPeriodID, EntityID)
}
#' Get all CalendarEvents.
#'
#' This function returns a dataframe of all CalendarEvents 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 Attendance
#' @return All CalendarEvents in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendarEvents <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarEventID = F, returnCalendarEventIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEdFiCalendarEventID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "CalendarEvent", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CalendarEvent
#'
#' This function returns fields for a CalendarEvent.
#'
#' @param CalendarEventID The id of the CalendarEvent.\cr Run \code{\link{getAllCalendarEvents}} for a list of CalendarEvents.
#' @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 Attendance
#' @return Details for the CalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendarEvent <- function(CalendarEventID, EntityID = 1, returnCalendarEventID = F, returnCalendarEventIDClonedFrom = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDescription = F, returnEdFiCalendarEventID = F, returnEntityID = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "CalendarEvent", CalendarEventID, searchFields, EntityID)
}
#' Modify a specific CalendarEvent
#'
#' This function modifies fields for a CalendarEvent.
#'
#' @param CalendarEventID The id of the CalendarEvent to be modified.\cr Run \code{\link{getAllCalendarEvents}} for a list of CalendarEvents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendarEvent <- function(CalendarEventID, EntityID = 1, setCalendarEventIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEdFiCalendarEventID = NULL, setEntityID = NULL, setSchoolYearID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Attendance", "CalendarEvent", CalendarEventID, names(functionParams), functionParams, EntityID)
}
#' Create new CalendarEvent.
#'
#' This function creates a new CalendarEvent.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendarEvent <- function(EntityID = 1, setCalendarEventIDClonedFrom = NULL, setCode = NULL, setDescription = NULL, setEdFiCalendarEventID = NULL, setEntityID = NULL, setSchoolYearID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Attendance", "CalendarEvent", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CalendarEvent
#'
#' This function deletes a CalendarEvent.
#'
#' @param CalendarEventID The id of the CalendarEvent.\cr Run \code{\link{getAllCalendarEvents}} for a list of CalendarEvents.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CalendarEvent.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendarEvent <- function(CalendarEventID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CalendarEvent", CalendarEventID, EntityID)
}
#' Get all Calendars.
#'
#' This function returns a dataframe of all Calendars 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 Attendance
#' @return All Calendars in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCalendars <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCalendarID = F, returnAttendanceCalculationMethod = F, returnAttendanceCalculationMethodCode = F, returnCalendarIDClonedFrom = F, returnCalendarIDClonedTo = F, returnCalendarMNID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDefaultDayLengthMinutes = F, returnDescription = F, returnEndDate = F, returnEntityID = F, returnHalfDayHighPeriodCount = F, returnIsDefault = F, returnMCCCAcademicYearImportID = F, returnMCCCCalendarImportID = F, returnModifiedTime = F, returnNorthEastSemesterReportData = F, returnSchoolYearID = F, returnStartDate = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZeroDayHighPeriodCount = 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("Attendance", "Calendar", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Calendar
#'
#' This function returns fields for a Calendar.
#'
#' @param CalendarID The id of the Calendar.\cr Run \code{\link{getAllCalendars}} for a list of Calendars.
#' @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 Attendance
#' @return Details for the Calendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCalendar <- function(CalendarID, EntityID = 1, returnCalendarID = F, returnAttendanceCalculationMethod = F, returnAttendanceCalculationMethodCode = F, returnCalendarIDClonedFrom = F, returnCalendarIDClonedTo = F, returnCalendarMNID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnDefaultDayLengthMinutes = F, returnDescription = F, returnEndDate = F, returnEntityID = F, returnHalfDayHighPeriodCount = F, returnIsDefault = F, returnMCCCAcademicYearImportID = F, returnMCCCCalendarImportID = F, returnModifiedTime = F, returnNorthEastSemesterReportData = F, returnSchoolYearID = F, returnStartDate = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZeroDayHighPeriodCount = 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("Attendance", "Calendar", CalendarID, searchFields, EntityID)
}
#' Modify a specific Calendar
#'
#' This function modifies fields for a Calendar.
#'
#' @param CalendarID The id of the Calendar to be modified.\cr Run \code{\link{getAllCalendars}} for a list of Calendars.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified Calendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCalendar <- function(CalendarID, EntityID = 1, setAttendanceCalculationMethod = NULL, setAttendanceCalculationMethodCode = NULL, setCalendarIDClonedFrom = NULL, setCode = NULL, setDefaultDayLengthMinutes = NULL, setDescription = NULL, setEndDate = NULL, setEntityID = NULL, setHalfDayHighPeriodCount = NULL, setIsDefault = NULL, setMCCCAcademicYearImportID = NULL, setMCCCCalendarImportID = NULL, setSchoolYearID = NULL, setStartDate = NULL, setZeroDayHighPeriodCount = 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("Attendance", "Calendar", CalendarID, names(functionParams), functionParams, EntityID)
}
#' Create new Calendar.
#'
#' This function creates a new Calendar.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created Calendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCalendar <- function(EntityID = 1, setAttendanceCalculationMethod = NULL, setAttendanceCalculationMethodCode = NULL, setCalendarIDClonedFrom = NULL, setCode = NULL, setDefaultDayLengthMinutes = NULL, setDescription = NULL, setEndDate = NULL, setEntityID = NULL, setHalfDayHighPeriodCount = NULL, setIsDefault = NULL, setMCCCAcademicYearImportID = NULL, setMCCCCalendarImportID = NULL, setSchoolYearID = NULL, setStartDate = NULL, setZeroDayHighPeriodCount = 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("Attendance", "Calendar", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Calendar
#'
#' This function deletes a Calendar.
#'
#' @param CalendarID The id of the Calendar.\cr Run \code{\link{getAllCalendars}} for a list of Calendars.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted Calendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCalendar <- function(CalendarID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "Calendar", CalendarID, 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 Attendance
#' @return All ConfigEntityGroupYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigEntityGroupYears <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigEntityGroupYearID = F, returnAttendanceReasonIDTardyDefault = F, returnAttendanceTypeIDTardyDefault = F, returnConfigEntityGroupYearIDClonedFrom = F, returnCreatedTime = F, returnEnableInOutTime = F, returnEntityGroupKey = F, returnEntityID = F, returnIncludeGradeLevelOnLetter = F, returnIncludeParentNameAndOrPhoneNumberOnLetter = F, returnIncludeSchoolOrCampusOnLetter = F, returnIncludeSignatureLineForOfficeOnLetter = F, returnIncludeSignatureLineForParentOnLetter = F, returnIncludeSignatureLineForStudentOnLetter = F, returnIncludeStudentNameAndOrNumberOnLetter = F, returnIncludeTardyCountOnLetter = F, returnModifiedTime = F, returnMultiPeriodClassCountMethod = F, returnMultiPeriodClassCountMethodCode = F, returnPresentBackgroundColor = F, returnPresentBackgroundColorHex = F, returnPresentBackgroundColorRgba = F, returnPrintAttendanceLetterForWindowedEnvelope = F, returnRestrictTeacherAttendanceUpdates = F, returnSchoolYearID = F, returnSpecialClassCountsLabel = F, returnTardyDefaultComment = F, returnTardyKioskTardySlipTitle = F, returnTeacherEntryCutoffDuration = F, returnTeacherEntryCutOffNumberOfMinutesAfter = F, returnTeacherEntryCutOffTime = F, returnTeacherEntryCutOffTimeCode = F, returnTeacherEntryCutoffWindowEndTime = F, returnTeacherEntryCutoffWindowStartTime = F, returnTeacherEntrySpecificCutOffTime = F, returnUseInOutTimeForCalculations = F, returnUseMarkAllStudentsPresentOnTile = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseSpecialClassCounts = F, returnUseTardyCalculator = F, returnUseTardyKiosk = F, returnUseTeacherPerfectAttendanceConfirmation = 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("Attendance", "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 Attendance
#' @return Details for the ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigEntityGroupYear <- function(ConfigEntityGroupYearID, EntityID = 1, returnConfigEntityGroupYearID = F, returnAttendanceReasonIDTardyDefault = F, returnAttendanceTypeIDTardyDefault = F, returnConfigEntityGroupYearIDClonedFrom = F, returnCreatedTime = F, returnEnableInOutTime = F, returnEntityGroupKey = F, returnEntityID = F, returnIncludeGradeLevelOnLetter = F, returnIncludeParentNameAndOrPhoneNumberOnLetter = F, returnIncludeSchoolOrCampusOnLetter = F, returnIncludeSignatureLineForOfficeOnLetter = F, returnIncludeSignatureLineForParentOnLetter = F, returnIncludeSignatureLineForStudentOnLetter = F, returnIncludeStudentNameAndOrNumberOnLetter = F, returnIncludeTardyCountOnLetter = F, returnModifiedTime = F, returnMultiPeriodClassCountMethod = F, returnMultiPeriodClassCountMethodCode = F, returnPresentBackgroundColor = F, returnPresentBackgroundColorHex = F, returnPresentBackgroundColorRgba = F, returnPrintAttendanceLetterForWindowedEnvelope = F, returnRestrictTeacherAttendanceUpdates = F, returnSchoolYearID = F, returnSpecialClassCountsLabel = F, returnTardyDefaultComment = F, returnTardyKioskTardySlipTitle = F, returnTeacherEntryCutoffDuration = F, returnTeacherEntryCutOffNumberOfMinutesAfter = F, returnTeacherEntryCutOffTime = F, returnTeacherEntryCutOffTimeCode = F, returnTeacherEntryCutoffWindowEndTime = F, returnTeacherEntryCutoffWindowStartTime = F, returnTeacherEntrySpecificCutOffTime = F, returnUseInOutTimeForCalculations = F, returnUseMarkAllStudentsPresentOnTile = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUseSpecialClassCounts = F, returnUseTardyCalculator = F, returnUseTardyKiosk = F, returnUseTeacherPerfectAttendanceConfirmation = 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("Attendance", "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 Attendance
#' @return Details of the modified ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigEntityGroupYear <- function(ConfigEntityGroupYearID, EntityID = 1, setAttendanceReasonIDTardyDefault = NULL, setAttendanceTypeIDTardyDefault = NULL, setConfigEntityGroupYearIDClonedFrom = NULL, setEnableInOutTime = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIncludeGradeLevelOnLetter = NULL, setIncludeParentNameAndOrPhoneNumberOnLetter = NULL, setIncludeSchoolOrCampusOnLetter = NULL, setIncludeSignatureLineForOfficeOnLetter = NULL, setIncludeSignatureLineForParentOnLetter = NULL, setIncludeSignatureLineForStudentOnLetter = NULL, setIncludeStudentNameAndOrNumberOnLetter = NULL, setIncludeTardyCountOnLetter = NULL, setMultiPeriodClassCountMethod = NULL, setMultiPeriodClassCountMethodCode = NULL, setPresentBackgroundColor = NULL, setPresentBackgroundColorHex = NULL, setPresentBackgroundColorRgba = NULL, setPrintAttendanceLetterForWindowedEnvelope = NULL, setRestrictTeacherAttendanceUpdates = NULL, setSchoolYearID = NULL, setSpecialClassCountsLabel = NULL, setTardyDefaultComment = NULL, setTardyKioskTardySlipTitle = NULL, setTeacherEntryCutoffDuration = NULL, setTeacherEntryCutOffNumberOfMinutesAfter = NULL, setTeacherEntryCutOffTime = NULL, setTeacherEntryCutOffTimeCode = NULL, setTeacherEntryCutoffWindowEndTime = NULL, setTeacherEntryCutoffWindowStartTime = NULL, setTeacherEntrySpecificCutOffTime = NULL, setUseInOutTimeForCalculations = NULL, setUseMarkAllStudentsPresentOnTile = NULL, setUseSpecialClassCounts = NULL, setUseTardyCalculator = NULL, setUseTardyKiosk = NULL, setUseTeacherPerfectAttendanceConfirmation = 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("Attendance", "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 Attendance
#' @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
createConfigEntityGroupYear <- function(EntityID = 1, setAttendanceReasonIDTardyDefault = NULL, setAttendanceTypeIDTardyDefault = NULL, setConfigEntityGroupYearIDClonedFrom = NULL, setEnableInOutTime = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setIncludeGradeLevelOnLetter = NULL, setIncludeParentNameAndOrPhoneNumberOnLetter = NULL, setIncludeSchoolOrCampusOnLetter = NULL, setIncludeSignatureLineForOfficeOnLetter = NULL, setIncludeSignatureLineForParentOnLetter = NULL, setIncludeSignatureLineForStudentOnLetter = NULL, setIncludeStudentNameAndOrNumberOnLetter = NULL, setIncludeTardyCountOnLetter = NULL, setMultiPeriodClassCountMethod = NULL, setMultiPeriodClassCountMethodCode = NULL, setPresentBackgroundColor = NULL, setPresentBackgroundColorHex = NULL, setPresentBackgroundColorRgba = NULL, setPrintAttendanceLetterForWindowedEnvelope = NULL, setRestrictTeacherAttendanceUpdates = NULL, setSchoolYearID = NULL, setSpecialClassCountsLabel = NULL, setTardyDefaultComment = NULL, setTardyKioskTardySlipTitle = NULL, setTeacherEntryCutoffDuration = NULL, setTeacherEntryCutOffNumberOfMinutesAfter = NULL, setTeacherEntryCutOffTime = NULL, setTeacherEntryCutOffTimeCode = NULL, setTeacherEntryCutoffWindowEndTime = NULL, setTeacherEntryCutoffWindowStartTime = NULL, setTeacherEntrySpecificCutOffTime = NULL, setUseInOutTimeForCalculations = NULL, setUseMarkAllStudentsPresentOnTile = NULL, setUseSpecialClassCounts = NULL, setUseTardyCalculator = NULL, setUseTardyKiosk = NULL, setUseTeacherPerfectAttendanceConfirmation = 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("Attendance", "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 Attendance
#' @return The id of the deleted ConfigEntityGroupYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigEntityGroupYear <- function(ConfigEntityGroupYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "ConfigEntityGroupYear", ConfigEntityGroupYearID, EntityID)
}
#' Get all CrossEntityAttendanceReasons.
#'
#' This function returns a dataframe of all CrossEntityAttendanceReasons 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 Attendance
#' @return All CrossEntityAttendanceReasons in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCrossEntityAttendanceReasons <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCrossEntityAttendanceReasonID = F, returnAttendanceReasonIDFrom = F, returnAttendanceReasonIDTo = F, returnCreatedTime = F, returnEntityIDTo = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "CrossEntityAttendanceReason", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CrossEntityAttendanceReason
#'
#' This function returns fields for a CrossEntityAttendanceReason.
#'
#' @param CrossEntityAttendanceReasonID The id of the CrossEntityAttendanceReason.\cr Run \code{\link{getAllCrossEntityAttendanceReasons}} for a list of CrossEntityAttendanceReasons.
#' @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 Attendance
#' @return Details for the CrossEntityAttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCrossEntityAttendanceReason <- function(CrossEntityAttendanceReasonID, EntityID = 1, returnCrossEntityAttendanceReasonID = F, returnAttendanceReasonIDFrom = F, returnAttendanceReasonIDTo = F, returnCreatedTime = F, returnEntityIDTo = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "CrossEntityAttendanceReason", CrossEntityAttendanceReasonID, searchFields, EntityID)
}
#' Modify a specific CrossEntityAttendanceReason
#'
#' This function modifies fields for a CrossEntityAttendanceReason.
#'
#' @param CrossEntityAttendanceReasonID The id of the CrossEntityAttendanceReason to be modified.\cr Run \code{\link{getAllCrossEntityAttendanceReasons}} for a list of CrossEntityAttendanceReasons.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CrossEntityAttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCrossEntityAttendanceReason <- function(CrossEntityAttendanceReasonID, EntityID = 1, setAttendanceReasonIDFrom = NULL, setAttendanceReasonIDTo = NULL, setEntityIDTo = 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("Attendance", "CrossEntityAttendanceReason", CrossEntityAttendanceReasonID, names(functionParams), functionParams, EntityID)
}
#' Create new CrossEntityAttendanceReason.
#'
#' This function creates a new CrossEntityAttendanceReason.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CrossEntityAttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCrossEntityAttendanceReason <- function(EntityID = 1, setAttendanceReasonIDFrom = NULL, setAttendanceReasonIDTo = NULL, setEntityIDTo = 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("Attendance", "CrossEntityAttendanceReason", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CrossEntityAttendanceReason
#'
#' This function deletes a CrossEntityAttendanceReason.
#'
#' @param CrossEntityAttendanceReasonID The id of the CrossEntityAttendanceReason.\cr Run \code{\link{getAllCrossEntityAttendanceReasons}} for a list of CrossEntityAttendanceReasons.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CrossEntityAttendanceReason.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCrossEntityAttendanceReason <- function(CrossEntityAttendanceReasonID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CrossEntityAttendanceReason", CrossEntityAttendanceReasonID, EntityID)
}
#' Get all CrossEntityAttendanceTypes.
#'
#' This function returns a dataframe of all CrossEntityAttendanceTypes 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 Attendance
#' @return All CrossEntityAttendanceTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCrossEntityAttendanceTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCrossEntityAttendanceTypeID = F, returnAttendanceTypeIDFrom = F, returnAttendanceTypeIDTo = F, returnCreatedTime = F, returnEntityIDTo = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "CrossEntityAttendanceType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CrossEntityAttendanceType
#'
#' This function returns fields for a CrossEntityAttendanceType.
#'
#' @param CrossEntityAttendanceTypeID The id of the CrossEntityAttendanceType.\cr Run \code{\link{getAllCrossEntityAttendanceTypes}} for a list of CrossEntityAttendanceTypes.
#' @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 Attendance
#' @return Details for the CrossEntityAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCrossEntityAttendanceType <- function(CrossEntityAttendanceTypeID, EntityID = 1, returnCrossEntityAttendanceTypeID = F, returnAttendanceTypeIDFrom = F, returnAttendanceTypeIDTo = F, returnCreatedTime = F, returnEntityIDTo = F, returnModifiedTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "CrossEntityAttendanceType", CrossEntityAttendanceTypeID, searchFields, EntityID)
}
#' Modify a specific CrossEntityAttendanceType
#'
#' This function modifies fields for a CrossEntityAttendanceType.
#'
#' @param CrossEntityAttendanceTypeID The id of the CrossEntityAttendanceType to be modified.\cr Run \code{\link{getAllCrossEntityAttendanceTypes}} for a list of CrossEntityAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CrossEntityAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCrossEntityAttendanceType <- function(CrossEntityAttendanceTypeID, EntityID = 1, setAttendanceTypeIDFrom = NULL, setAttendanceTypeIDTo = NULL, setEntityIDTo = 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("Attendance", "CrossEntityAttendanceType", CrossEntityAttendanceTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new CrossEntityAttendanceType.
#'
#' This function creates a new CrossEntityAttendanceType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CrossEntityAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCrossEntityAttendanceType <- function(EntityID = 1, setAttendanceTypeIDFrom = NULL, setAttendanceTypeIDTo = NULL, setEntityIDTo = 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("Attendance", "CrossEntityAttendanceType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CrossEntityAttendanceType
#'
#' This function deletes a CrossEntityAttendanceType.
#'
#' @param CrossEntityAttendanceTypeID The id of the CrossEntityAttendanceType.\cr Run \code{\link{getAllCrossEntityAttendanceTypes}} for a list of CrossEntityAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CrossEntityAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCrossEntityAttendanceType <- function(CrossEntityAttendanceTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CrossEntityAttendanceType", CrossEntityAttendanceTypeID, EntityID)
}
#' Get all CrossEntityCalendarDisplayPeriods.
#'
#' This function returns a dataframe of all CrossEntityCalendarDisplayPeriods 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 Attendance
#' @return All CrossEntityCalendarDisplayPeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllCrossEntityCalendarDisplayPeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnCrossEntityCalendarDisplayPeriodID = F, returnCalendarDisplayPeriodIDFrom = F, returnCalendarDisplayPeriodIDTo = F, returnCreatedTime = F, returnCrossEntityCalendarDisplayPeriodIDClonedFrom = F, returnIsAutoCreated = 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("Attendance", "CrossEntityCalendarDisplayPeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific CrossEntityCalendarDisplayPeriod
#'
#' This function returns fields for a CrossEntityCalendarDisplayPeriod.
#'
#' @param CrossEntityCalendarDisplayPeriodID The id of the CrossEntityCalendarDisplayPeriod.\cr Run \code{\link{getAllCrossEntityCalendarDisplayPeriods}} for a list of CrossEntityCalendarDisplayPeriods.
#' @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 Attendance
#' @return Details for the CrossEntityCalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getCrossEntityCalendarDisplayPeriod <- function(CrossEntityCalendarDisplayPeriodID, EntityID = 1, returnCrossEntityCalendarDisplayPeriodID = F, returnCalendarDisplayPeriodIDFrom = F, returnCalendarDisplayPeriodIDTo = F, returnCreatedTime = F, returnCrossEntityCalendarDisplayPeriodIDClonedFrom = F, returnIsAutoCreated = 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("Attendance", "CrossEntityCalendarDisplayPeriod", CrossEntityCalendarDisplayPeriodID, searchFields, EntityID)
}
#' Modify a specific CrossEntityCalendarDisplayPeriod
#'
#' This function modifies fields for a CrossEntityCalendarDisplayPeriod.
#'
#' @param CrossEntityCalendarDisplayPeriodID The id of the CrossEntityCalendarDisplayPeriod to be modified.\cr Run \code{\link{getAllCrossEntityCalendarDisplayPeriods}} for a list of CrossEntityCalendarDisplayPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified CrossEntityCalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyCrossEntityCalendarDisplayPeriod <- function(CrossEntityCalendarDisplayPeriodID, EntityID = 1, setCalendarDisplayPeriodIDFrom = NULL, setCalendarDisplayPeriodIDTo = NULL, setCrossEntityCalendarDisplayPeriodIDClonedFrom = NULL, setIsAutoCreated = 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("Attendance", "CrossEntityCalendarDisplayPeriod", CrossEntityCalendarDisplayPeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new CrossEntityCalendarDisplayPeriod.
#'
#' This function creates a new CrossEntityCalendarDisplayPeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created CrossEntityCalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createCrossEntityCalendarDisplayPeriod <- function(EntityID = 1, setCalendarDisplayPeriodIDFrom = NULL, setCalendarDisplayPeriodIDTo = NULL, setCrossEntityCalendarDisplayPeriodIDClonedFrom = NULL, setIsAutoCreated = 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("Attendance", "CrossEntityCalendarDisplayPeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific CrossEntityCalendarDisplayPeriod
#'
#' This function deletes a CrossEntityCalendarDisplayPeriod.
#'
#' @param CrossEntityCalendarDisplayPeriodID The id of the CrossEntityCalendarDisplayPeriod.\cr Run \code{\link{getAllCrossEntityCalendarDisplayPeriods}} for a list of CrossEntityCalendarDisplayPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted CrossEntityCalendarDisplayPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteCrossEntityCalendarDisplayPeriod <- function(CrossEntityCalendarDisplayPeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "CrossEntityCalendarDisplayPeriod", CrossEntityCalendarDisplayPeriodID, EntityID)
}
#' Get all DailySectionAttendances.
#'
#' This function returns a dataframe of all DailySectionAttendances 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 Attendance
#' @return All DailySectionAttendances in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDailySectionAttendances <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDailySectionAttendanceID = F, returnAttendancePeriodID = F, returnCalendarDayID = F, returnCreatedTime = F, returnMeetID = 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("Attendance", "DailySectionAttendance", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DailySectionAttendance
#'
#' This function returns fields for a DailySectionAttendance.
#'
#' @param DailySectionAttendanceID The id of the DailySectionAttendance.\cr Run \code{\link{getAllDailySectionAttendances}} for a list of DailySectionAttendances.
#' @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 Attendance
#' @return Details for the DailySectionAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDailySectionAttendance <- function(DailySectionAttendanceID, EntityID = 1, returnDailySectionAttendanceID = F, returnAttendancePeriodID = F, returnCalendarDayID = F, returnCreatedTime = F, returnMeetID = 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("Attendance", "DailySectionAttendance", DailySectionAttendanceID, searchFields, EntityID)
}
#' Modify a specific DailySectionAttendance
#'
#' This function modifies fields for a DailySectionAttendance.
#'
#' @param DailySectionAttendanceID The id of the DailySectionAttendance to be modified.\cr Run \code{\link{getAllDailySectionAttendances}} for a list of DailySectionAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified DailySectionAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDailySectionAttendance <- function(DailySectionAttendanceID, EntityID = 1, setAttendancePeriodID = NULL, setCalendarDayID = NULL, setMeetID = 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("Attendance", "DailySectionAttendance", DailySectionAttendanceID, names(functionParams), functionParams, EntityID)
}
#' Create new DailySectionAttendance.
#'
#' This function creates a new DailySectionAttendance.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created DailySectionAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDailySectionAttendance <- function(EntityID = 1, setAttendancePeriodID = NULL, setCalendarDayID = NULL, setMeetID = 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("Attendance", "DailySectionAttendance", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DailySectionAttendance
#'
#' This function deletes a DailySectionAttendance.
#'
#' @param DailySectionAttendanceID The id of the DailySectionAttendance.\cr Run \code{\link{getAllDailySectionAttendances}} for a list of DailySectionAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted DailySectionAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDailySectionAttendance <- function(DailySectionAttendanceID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "DailySectionAttendance", DailySectionAttendanceID, EntityID)
}
#' Get all DayRotationPatterns.
#'
#' This function returns a dataframe of all DayRotationPatterns 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 Attendance
#' @return All DayRotationPatterns in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDayRotationPatterns <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDayRotationPatternID = F, returnCreatedTime = F, returnDayNumber = F, returnDayRotationID = F, returnDayRotationPatternIDClonedFrom = 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("Attendance", "DayRotationPattern", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DayRotationPattern
#'
#' This function returns fields for a DayRotationPattern.
#'
#' @param DayRotationPatternID The id of the DayRotationPattern.\cr Run \code{\link{getAllDayRotationPatterns}} for a list of DayRotationPatterns.
#' @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 Attendance
#' @return Details for the DayRotationPattern.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDayRotationPattern <- function(DayRotationPatternID, EntityID = 1, returnDayRotationPatternID = F, returnCreatedTime = F, returnDayNumber = F, returnDayRotationID = F, returnDayRotationPatternIDClonedFrom = 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("Attendance", "DayRotationPattern", DayRotationPatternID, searchFields, EntityID)
}
#' Modify a specific DayRotationPattern
#'
#' This function modifies fields for a DayRotationPattern.
#'
#' @param DayRotationPatternID The id of the DayRotationPattern to be modified.\cr Run \code{\link{getAllDayRotationPatterns}} for a list of DayRotationPatterns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified DayRotationPattern.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDayRotationPattern <- function(DayRotationPatternID, EntityID = 1, setDayNumber = NULL, setDayRotationID = NULL, setDayRotationPatternIDClonedFrom = 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("Attendance", "DayRotationPattern", DayRotationPatternID, names(functionParams), functionParams, EntityID)
}
#' Create new DayRotationPattern.
#'
#' This function creates a new DayRotationPattern.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created DayRotationPattern.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDayRotationPattern <- function(EntityID = 1, setDayNumber = NULL, setDayRotationID = NULL, setDayRotationPatternIDClonedFrom = 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("Attendance", "DayRotationPattern", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DayRotationPattern
#'
#' This function deletes a DayRotationPattern.
#'
#' @param DayRotationPatternID The id of the DayRotationPattern.\cr Run \code{\link{getAllDayRotationPatterns}} for a list of DayRotationPatterns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted DayRotationPattern.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDayRotationPattern <- function(DayRotationPatternID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "DayRotationPattern", DayRotationPatternID, EntityID)
}
#' Get all DisciplineThresholds.
#'
#' This function returns a dataframe of all DisciplineThresholds 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 Attendance
#' @return All DisciplineThresholds in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDisciplineThresholds <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDisciplineThresholdID = F, returnActionID = F, returnAllowDisciplineOnCurrentDay = F, returnAttendanceLettersRan = F, returnAttendanceSlipComment = F, returnBuildingIDServing = F, returnCreateDisciplineRecord = F, returnCreatedTime = F, returnDisciplineSlipComment = F, returnDurationToServe = F, returnDurationToServePerDay = F, returnFooterComment = F, returnGenerateActionDetail = F, returnGreeting = F, returnIncidentDefaultComment = F, returnIncidentDescription = F, returnIsRepeatable = F, returnLocationIDServing = F, returnModifiedTime = F, returnOffenseID = F, returnRangeDisplay = F, returnRoomIDServing = F, returnServeOnFriday = F, returnServeOnMonday = F, returnServeOnSaturday = F, returnServeOnSunday = F, returnServeOnThursday = F, returnServeOnTuesday = F, returnServeOnWednesday = F, returnServingTime = F, returnStaffIDAuthorizedBy = F, returnThresholdRangeHigh = F, returnThresholdRangeLow = F, returnThresholdResetRangeID = 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("Attendance", "DisciplineThreshold", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DisciplineThreshold
#'
#' This function returns fields for a DisciplineThreshold.
#'
#' @param DisciplineThresholdID The id of the DisciplineThreshold.\cr Run \code{\link{getAllDisciplineThresholds}} for a list of DisciplineThresholds.
#' @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 Attendance
#' @return Details for the DisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDisciplineThreshold <- function(DisciplineThresholdID, EntityID = 1, returnDisciplineThresholdID = F, returnActionID = F, returnAllowDisciplineOnCurrentDay = F, returnAttendanceLettersRan = F, returnAttendanceSlipComment = F, returnBuildingIDServing = F, returnCreateDisciplineRecord = F, returnCreatedTime = F, returnDisciplineSlipComment = F, returnDurationToServe = F, returnDurationToServePerDay = F, returnFooterComment = F, returnGenerateActionDetail = F, returnGreeting = F, returnIncidentDefaultComment = F, returnIncidentDescription = F, returnIsRepeatable = F, returnLocationIDServing = F, returnModifiedTime = F, returnOffenseID = F, returnRangeDisplay = F, returnRoomIDServing = F, returnServeOnFriday = F, returnServeOnMonday = F, returnServeOnSaturday = F, returnServeOnSunday = F, returnServeOnThursday = F, returnServeOnTuesday = F, returnServeOnWednesday = F, returnServingTime = F, returnStaffIDAuthorizedBy = F, returnThresholdRangeHigh = F, returnThresholdRangeLow = F, returnThresholdResetRangeID = 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("Attendance", "DisciplineThreshold", DisciplineThresholdID, searchFields, EntityID)
}
#' Modify a specific DisciplineThreshold
#'
#' This function modifies fields for a DisciplineThreshold.
#'
#' @param DisciplineThresholdID The id of the DisciplineThreshold to be modified.\cr Run \code{\link{getAllDisciplineThresholds}} for a list of DisciplineThresholds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified DisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDisciplineThreshold <- function(DisciplineThresholdID, EntityID = 1, setActionID = NULL, setAllowDisciplineOnCurrentDay = NULL, setAttendanceSlipComment = NULL, setBuildingIDServing = NULL, setCreateDisciplineRecord = NULL, setDisciplineSlipComment = NULL, setDurationToServe = NULL, setDurationToServePerDay = NULL, setFooterComment = NULL, setGenerateActionDetail = NULL, setGreeting = NULL, setIncidentDefaultComment = NULL, setIncidentDescription = NULL, setIsRepeatable = NULL, setLocationIDServing = NULL, setOffenseID = NULL, setRoomIDServing = NULL, setServeOnFriday = NULL, setServeOnMonday = NULL, setServeOnSaturday = NULL, setServeOnSunday = NULL, setServeOnThursday = NULL, setServeOnTuesday = NULL, setServeOnWednesday = NULL, setServingTime = NULL, setStaffIDAuthorizedBy = NULL, setThresholdRangeHigh = NULL, setThresholdRangeLow = NULL, setThresholdResetRangeID = 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("Attendance", "DisciplineThreshold", DisciplineThresholdID, names(functionParams), functionParams, EntityID)
}
#' Create new DisciplineThreshold.
#'
#' This function creates a new DisciplineThreshold.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created DisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDisciplineThreshold <- function(EntityID = 1, setActionID = NULL, setAllowDisciplineOnCurrentDay = NULL, setAttendanceSlipComment = NULL, setBuildingIDServing = NULL, setCreateDisciplineRecord = NULL, setDisciplineSlipComment = NULL, setDurationToServe = NULL, setDurationToServePerDay = NULL, setFooterComment = NULL, setGenerateActionDetail = NULL, setGreeting = NULL, setIncidentDefaultComment = NULL, setIncidentDescription = NULL, setIsRepeatable = NULL, setLocationIDServing = NULL, setOffenseID = NULL, setRoomIDServing = NULL, setServeOnFriday = NULL, setServeOnMonday = NULL, setServeOnSaturday = NULL, setServeOnSunday = NULL, setServeOnThursday = NULL, setServeOnTuesday = NULL, setServeOnWednesday = NULL, setServingTime = NULL, setStaffIDAuthorizedBy = NULL, setThresholdRangeHigh = NULL, setThresholdRangeLow = NULL, setThresholdResetRangeID = 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("Attendance", "DisciplineThreshold", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DisciplineThreshold
#'
#' This function deletes a DisciplineThreshold.
#'
#' @param DisciplineThresholdID The id of the DisciplineThreshold.\cr Run \code{\link{getAllDisciplineThresholds}} for a list of DisciplineThresholds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted DisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDisciplineThreshold <- function(DisciplineThresholdID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "DisciplineThreshold", DisciplineThresholdID, EntityID)
}
#' Get all DroppedStudentAttendancePeriods.
#'
#' This function returns a dataframe of all DroppedStudentAttendancePeriods 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 Attendance
#' @return All DroppedStudentAttendancePeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllDroppedStudentAttendancePeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnDroppedStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnAttendanceReasonID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnComment = F, returnCreatedTime = F, returnIncidentOffenseNameActionDetailID = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnStudentID = 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("Attendance", "DroppedStudentAttendancePeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific DroppedStudentAttendancePeriod
#'
#' This function returns fields for a DroppedStudentAttendancePeriod.
#'
#' @param DroppedStudentAttendancePeriodID The id of the DroppedStudentAttendancePeriod.\cr Run \code{\link{getAllDroppedStudentAttendancePeriods}} for a list of DroppedStudentAttendancePeriods.
#' @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 Attendance
#' @return Details for the DroppedStudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getDroppedStudentAttendancePeriod <- function(DroppedStudentAttendancePeriodID, EntityID = 1, returnDroppedStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnAttendanceReasonID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnComment = F, returnCreatedTime = F, returnIncidentOffenseNameActionDetailID = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnStudentID = 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("Attendance", "DroppedStudentAttendancePeriod", DroppedStudentAttendancePeriodID, searchFields, EntityID)
}
#' Modify a specific DroppedStudentAttendancePeriod
#'
#' This function modifies fields for a DroppedStudentAttendancePeriod.
#'
#' @param DroppedStudentAttendancePeriodID The id of the DroppedStudentAttendancePeriod to be modified.\cr Run \code{\link{getAllDroppedStudentAttendancePeriods}} for a list of DroppedStudentAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified DroppedStudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyDroppedStudentAttendancePeriod <- function(DroppedStudentAttendancePeriodID, EntityID = 1, setAttendancePeriodID = NULL, setAttendanceReasonID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setComment = NULL, setIncidentOffenseNameActionDetailID = NULL, setIsGuardianNotified = NULL, setStudentID = 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("Attendance", "DroppedStudentAttendancePeriod", DroppedStudentAttendancePeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new DroppedStudentAttendancePeriod.
#'
#' This function creates a new DroppedStudentAttendancePeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created DroppedStudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createDroppedStudentAttendancePeriod <- function(EntityID = 1, setAttendancePeriodID = NULL, setAttendanceReasonID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setComment = NULL, setIncidentOffenseNameActionDetailID = NULL, setIsGuardianNotified = NULL, setStudentID = 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("Attendance", "DroppedStudentAttendancePeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific DroppedStudentAttendancePeriod
#'
#' This function deletes a DroppedStudentAttendancePeriod.
#'
#' @param DroppedStudentAttendancePeriodID The id of the DroppedStudentAttendancePeriod.\cr Run \code{\link{getAllDroppedStudentAttendancePeriods}} for a list of DroppedStudentAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted DroppedStudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteDroppedStudentAttendancePeriod <- function(DroppedStudentAttendancePeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "DroppedStudentAttendancePeriod", DroppedStudentAttendancePeriodID, EntityID)
}
#' Get all MassCreateAttendanceByClassActivityRangeRuns.
#'
#' This function returns a dataframe of all MassCreateAttendanceByClassActivityRangeRuns 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 Attendance
#' @return All MassCreateAttendanceByClassActivityRangeRuns in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllMassCreateAttendanceByClassActivityRangeRuns <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMassCreateAttendanceByClassActivityRangeRunID = F, returnAffectedStudentAttendanceCount = F, returnCreatedTime = F, returnEntityID = F, returnIsActive = F, returnModifiedTime = F, returnRunTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDRunBy = 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("Attendance", "MassCreateAttendanceByClassActivityRangeRun", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific MassCreateAttendanceByClassActivityRangeRun
#'
#' This function returns fields for a MassCreateAttendanceByClassActivityRangeRun.
#'
#' @param MassCreateAttendanceByClassActivityRangeRunID The id of the MassCreateAttendanceByClassActivityRangeRun.\cr Run \code{\link{getAllMassCreateAttendanceByClassActivityRangeRuns}} for a list of MassCreateAttendanceByClassActivityRangeRuns.
#' @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 Attendance
#' @return Details for the MassCreateAttendanceByClassActivityRangeRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getMassCreateAttendanceByClassActivityRangeRun <- function(MassCreateAttendanceByClassActivityRangeRunID, EntityID = 1, returnMassCreateAttendanceByClassActivityRangeRunID = F, returnAffectedStudentAttendanceCount = F, returnCreatedTime = F, returnEntityID = F, returnIsActive = F, returnModifiedTime = F, returnRunTime = F, returnSchoolYearID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDRunBy = 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("Attendance", "MassCreateAttendanceByClassActivityRangeRun", MassCreateAttendanceByClassActivityRangeRunID, searchFields, EntityID)
}
#' Modify a specific MassCreateAttendanceByClassActivityRangeRun
#'
#' This function modifies fields for a MassCreateAttendanceByClassActivityRangeRun.
#'
#' @param MassCreateAttendanceByClassActivityRangeRunID The id of the MassCreateAttendanceByClassActivityRangeRun to be modified.\cr Run \code{\link{getAllMassCreateAttendanceByClassActivityRangeRuns}} for a list of MassCreateAttendanceByClassActivityRangeRuns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified MassCreateAttendanceByClassActivityRangeRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyMassCreateAttendanceByClassActivityRangeRun <- function(MassCreateAttendanceByClassActivityRangeRunID, EntityID = 1, setEntityID = NULL, setIsActive = NULL, setRunTime = NULL, setSchoolYearID = NULL, setUserIDRunBy = 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("Attendance", "MassCreateAttendanceByClassActivityRangeRun", MassCreateAttendanceByClassActivityRangeRunID, names(functionParams), functionParams, EntityID)
}
#' Create new MassCreateAttendanceByClassActivityRangeRun.
#'
#' This function creates a new MassCreateAttendanceByClassActivityRangeRun.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created MassCreateAttendanceByClassActivityRangeRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createMassCreateAttendanceByClassActivityRangeRun <- function(EntityID = 1, setEntityID = NULL, setIsActive = NULL, setRunTime = NULL, setSchoolYearID = NULL, setUserIDRunBy = 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("Attendance", "MassCreateAttendanceByClassActivityRangeRun", names(functionParams), functionParams, EntityID)
}
#' Delete a specific MassCreateAttendanceByClassActivityRangeRun
#'
#' This function deletes a MassCreateAttendanceByClassActivityRangeRun.
#'
#' @param MassCreateAttendanceByClassActivityRangeRunID The id of the MassCreateAttendanceByClassActivityRangeRun.\cr Run \code{\link{getAllMassCreateAttendanceByClassActivityRangeRuns}} for a list of MassCreateAttendanceByClassActivityRangeRuns.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted MassCreateAttendanceByClassActivityRangeRun.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteMassCreateAttendanceByClassActivityRangeRun <- function(MassCreateAttendanceByClassActivityRangeRunID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "MassCreateAttendanceByClassActivityRangeRun", MassCreateAttendanceByClassActivityRangeRunID, EntityID)
}
#' Get all RecordedUnrecordedAttendances.
#'
#' This function returns a dataframe of all RecordedUnrecordedAttendances 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 Attendance
#' @return All RecordedUnrecordedAttendances in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRecordedUnrecordedAttendances <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMeetDisplayPeriodID = F, returnAttendanceTaken = F, returnCountAs = F, returnCreatedTime = F, returnDailySectionAttendanceID = F, returnDate = F, returnDayOfTheWeek = F, returnDisplayPeriodCode = F, returnMeetID = 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("Attendance", "RecordedUnrecordedAttendance", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RecordedUnrecordedAttendance
#'
#' This function returns fields for a RecordedUnrecordedAttendance.
#'
#' @param RecordedUnrecordedAttendanceID The id of the RecordedUnrecordedAttendance.\cr Run \code{\link{getAllRecordedUnrecordedAttendances}} for a list of RecordedUnrecordedAttendances.
#' @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 Attendance
#' @return Details for the RecordedUnrecordedAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRecordedUnrecordedAttendance <- function(RecordedUnrecordedAttendanceID, EntityID = 1, returnMeetDisplayPeriodID = F, returnAttendanceTaken = F, returnCountAs = F, returnCreatedTime = F, returnDailySectionAttendanceID = F, returnDate = F, returnDayOfTheWeek = F, returnDisplayPeriodCode = F, returnMeetID = 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("Attendance", "RecordedUnrecordedAttendance", RecordedUnrecordedAttendanceID, searchFields, EntityID)
}
#' Modify a specific RecordedUnrecordedAttendance
#'
#' This function modifies fields for a RecordedUnrecordedAttendance.
#'
#' @param RecordedUnrecordedAttendanceID The id of the RecordedUnrecordedAttendance to be modified.\cr Run \code{\link{getAllRecordedUnrecordedAttendances}} for a list of RecordedUnrecordedAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified RecordedUnrecordedAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRecordedUnrecordedAttendance <- function(RecordedUnrecordedAttendanceID, EntityID = 1){
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("Attendance", "RecordedUnrecordedAttendance", RecordedUnrecordedAttendanceID, names(functionParams), functionParams, EntityID)
}
#' Create new RecordedUnrecordedAttendance.
#'
#' This function creates a new RecordedUnrecordedAttendance.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created RecordedUnrecordedAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRecordedUnrecordedAttendance <- function(EntityID = 1){
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("Attendance", "RecordedUnrecordedAttendance", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RecordedUnrecordedAttendance
#'
#' This function deletes a RecordedUnrecordedAttendance.
#'
#' @param RecordedUnrecordedAttendanceID The id of the RecordedUnrecordedAttendance.\cr Run \code{\link{getAllRecordedUnrecordedAttendances}} for a list of RecordedUnrecordedAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted RecordedUnrecordedAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRecordedUnrecordedAttendance <- function(RecordedUnrecordedAttendanceID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "RecordedUnrecordedAttendance", RecordedUnrecordedAttendanceID, EntityID)
}
#' Get all RoomLayouts.
#'
#' This function returns a dataframe of all RoomLayouts 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 Attendance
#' @return All RoomLayouts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRoomLayouts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRoomLayoutID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRoomID = 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("Attendance", "RoomLayout", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RoomLayout
#'
#' This function returns fields for a RoomLayout.
#'
#' @param RoomLayoutID The id of the RoomLayout.\cr Run \code{\link{getAllRoomLayouts}} for a list of RoomLayouts.
#' @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 Attendance
#' @return Details for the RoomLayout.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRoomLayout <- function(RoomLayoutID, EntityID = 1, returnRoomLayoutID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRoomID = 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("Attendance", "RoomLayout", RoomLayoutID, searchFields, EntityID)
}
#' Modify a specific RoomLayout
#'
#' This function modifies fields for a RoomLayout.
#'
#' @param RoomLayoutID The id of the RoomLayout to be modified.\cr Run \code{\link{getAllRoomLayouts}} for a list of RoomLayouts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified RoomLayout.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRoomLayout <- function(RoomLayoutID, EntityID = 1, setDescription = NULL, setRoomID = 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("Attendance", "RoomLayout", RoomLayoutID, names(functionParams), functionParams, EntityID)
}
#' Create new RoomLayout.
#'
#' This function creates a new RoomLayout.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created RoomLayout.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRoomLayout <- function(EntityID = 1, setDescription = NULL, setRoomID = 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("Attendance", "RoomLayout", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RoomLayout
#'
#' This function deletes a RoomLayout.
#'
#' @param RoomLayoutID The id of the RoomLayout.\cr Run \code{\link{getAllRoomLayouts}} for a list of RoomLayouts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted RoomLayout.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRoomLayout <- function(RoomLayoutID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "RoomLayout", RoomLayoutID, EntityID)
}
#' Get all RoomLayoutObjects.
#'
#' This function returns a dataframe of all RoomLayoutObjects 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 Attendance
#' @return All RoomLayoutObjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRoomLayoutObjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRoomLayoutObjectID = F, returnCreatedTime = F, returnModifiedTime = F, returnRoomLayoutID = F, returnRoomObjectID = F, returnRotation = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXLocation = F, returnYLocation = 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("Attendance", "RoomLayoutObject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RoomLayoutObject
#'
#' This function returns fields for a RoomLayoutObject.
#'
#' @param RoomLayoutObjectID The id of the RoomLayoutObject.\cr Run \code{\link{getAllRoomLayoutObjects}} for a list of RoomLayoutObjects.
#' @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 Attendance
#' @return Details for the RoomLayoutObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRoomLayoutObject <- function(RoomLayoutObjectID, EntityID = 1, returnRoomLayoutObjectID = F, returnCreatedTime = F, returnModifiedTime = F, returnRoomLayoutID = F, returnRoomObjectID = F, returnRotation = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXLocation = F, returnYLocation = 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("Attendance", "RoomLayoutObject", RoomLayoutObjectID, searchFields, EntityID)
}
#' Modify a specific RoomLayoutObject
#'
#' This function modifies fields for a RoomLayoutObject.
#'
#' @param RoomLayoutObjectID The id of the RoomLayoutObject to be modified.\cr Run \code{\link{getAllRoomLayoutObjects}} for a list of RoomLayoutObjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified RoomLayoutObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRoomLayoutObject <- function(RoomLayoutObjectID, EntityID = 1, setRoomLayoutID = NULL, setRoomObjectID = NULL, setRotation = NULL, setXLocation = NULL, setYLocation = 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("Attendance", "RoomLayoutObject", RoomLayoutObjectID, names(functionParams), functionParams, EntityID)
}
#' Create new RoomLayoutObject.
#'
#' This function creates a new RoomLayoutObject.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created RoomLayoutObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRoomLayoutObject <- function(EntityID = 1, setRoomLayoutID = NULL, setRoomObjectID = NULL, setRotation = NULL, setXLocation = NULL, setYLocation = 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("Attendance", "RoomLayoutObject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RoomLayoutObject
#'
#' This function deletes a RoomLayoutObject.
#'
#' @param RoomLayoutObjectID The id of the RoomLayoutObject.\cr Run \code{\link{getAllRoomLayoutObjects}} for a list of RoomLayoutObjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted RoomLayoutObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRoomLayoutObject <- function(RoomLayoutObjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "RoomLayoutObject", RoomLayoutObjectID, EntityID)
}
#' Get all RoomObjects.
#'
#' This function returns a dataframe of all RoomObjects 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 Attendance
#' @return All RoomObjects in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllRoomObjects <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnRoomObjectID = F, returnCreatedTime = F, returnIsStudentSeat = F, returnLabel = F, returnModifiedTime = F, returnParameters = F, returnSkywardHash = F, returnSkywardID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("Attendance", "RoomObject", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific RoomObject
#'
#' This function returns fields for a RoomObject.
#'
#' @param RoomObjectID The id of the RoomObject.\cr Run \code{\link{getAllRoomObjects}} for a list of RoomObjects.
#' @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 Attendance
#' @return Details for the RoomObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getRoomObject <- function(RoomObjectID, EntityID = 1, returnRoomObjectID = F, returnCreatedTime = F, returnIsStudentSeat = F, returnLabel = F, returnModifiedTime = F, returnParameters = F, returnSkywardHash = F, returnSkywardID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("Attendance", "RoomObject", RoomObjectID, searchFields, EntityID)
}
#' Modify a specific RoomObject
#'
#' This function modifies fields for a RoomObject.
#'
#' @param RoomObjectID The id of the RoomObject to be modified.\cr Run \code{\link{getAllRoomObjects}} for a list of RoomObjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified RoomObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyRoomObject <- function(RoomObjectID, EntityID = 1, setIsStudentSeat = NULL, setLabel = NULL, setParameters = NULL, setSkywardHash = NULL, setSkywardID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("Attendance", "RoomObject", RoomObjectID, names(functionParams), functionParams, EntityID)
}
#' Create new RoomObject.
#'
#' This function creates a new RoomObject.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created RoomObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createRoomObject <- function(EntityID = 1, setIsStudentSeat = NULL, setLabel = NULL, setParameters = NULL, setSkywardHash = NULL, setSkywardID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("Attendance", "RoomObject", names(functionParams), functionParams, EntityID)
}
#' Delete a specific RoomObject
#'
#' This function deletes a RoomObject.
#'
#' @param RoomObjectID The id of the RoomObject.\cr Run \code{\link{getAllRoomObjects}} for a list of RoomObjects.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted RoomObject.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteRoomObject <- function(RoomObjectID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "RoomObject", RoomObjectID, EntityID)
}
#' Get all SeatingCharts.
#'
#' This function returns a dataframe of all SeatingCharts 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 Attendance
#' @return All SeatingCharts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSeatingCharts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSeatingChartID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRoomLayoutID = 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("Attendance", "SeatingChart", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SeatingChart
#'
#' This function returns fields for a SeatingChart.
#'
#' @param SeatingChartID The id of the SeatingChart.\cr Run \code{\link{getAllSeatingCharts}} for a list of SeatingCharts.
#' @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 Attendance
#' @return Details for the SeatingChart.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSeatingChart <- function(SeatingChartID, EntityID = 1, returnSeatingChartID = F, returnCreatedTime = F, returnDescription = F, returnModifiedTime = F, returnRoomLayoutID = 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("Attendance", "SeatingChart", SeatingChartID, searchFields, EntityID)
}
#' Modify a specific SeatingChart
#'
#' This function modifies fields for a SeatingChart.
#'
#' @param SeatingChartID The id of the SeatingChart to be modified.\cr Run \code{\link{getAllSeatingCharts}} for a list of SeatingCharts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified SeatingChart.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySeatingChart <- function(SeatingChartID, EntityID = 1, setDescription = NULL, setRoomLayoutID = 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("Attendance", "SeatingChart", SeatingChartID, names(functionParams), functionParams, EntityID)
}
#' Create new SeatingChart.
#'
#' This function creates a new SeatingChart.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created SeatingChart.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSeatingChart <- function(EntityID = 1, setDescription = NULL, setRoomLayoutID = 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("Attendance", "SeatingChart", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SeatingChart
#'
#' This function deletes a SeatingChart.
#'
#' @param SeatingChartID The id of the SeatingChart.\cr Run \code{\link{getAllSeatingCharts}} for a list of SeatingCharts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted SeatingChart.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSeatingChart <- function(SeatingChartID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "SeatingChart", SeatingChartID, EntityID)
}
#' Get all SeatingChartMeets.
#'
#' This function returns a dataframe of all SeatingChartMeets 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 Attendance
#' @return All SeatingChartMeets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSeatingChartMeets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSeatingChartMeetID = F, returnCreatedTime = F, returnIsCurrent = F, returnMeetID = F, returnModifiedTime = F, returnSeatingChartID = F, returnSectionList = 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("Attendance", "SeatingChartMeet", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SeatingChartMeet
#'
#' This function returns fields for a SeatingChartMeet.
#'
#' @param SeatingChartMeetID The id of the SeatingChartMeet.\cr Run \code{\link{getAllSeatingChartMeets}} for a list of SeatingChartMeets.
#' @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 Attendance
#' @return Details for the SeatingChartMeet.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSeatingChartMeet <- function(SeatingChartMeetID, EntityID = 1, returnSeatingChartMeetID = F, returnCreatedTime = F, returnIsCurrent = F, returnMeetID = F, returnModifiedTime = F, returnSeatingChartID = F, returnSectionList = 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("Attendance", "SeatingChartMeet", SeatingChartMeetID, searchFields, EntityID)
}
#' Modify a specific SeatingChartMeet
#'
#' This function modifies fields for a SeatingChartMeet.
#'
#' @param SeatingChartMeetID The id of the SeatingChartMeet to be modified.\cr Run \code{\link{getAllSeatingChartMeets}} for a list of SeatingChartMeets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified SeatingChartMeet.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySeatingChartMeet <- function(SeatingChartMeetID, EntityID = 1, setIsCurrent = NULL, setMeetID = NULL, setSeatingChartID = 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("Attendance", "SeatingChartMeet", SeatingChartMeetID, names(functionParams), functionParams, EntityID)
}
#' Create new SeatingChartMeet.
#'
#' This function creates a new SeatingChartMeet.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created SeatingChartMeet.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSeatingChartMeet <- function(EntityID = 1, setIsCurrent = NULL, setMeetID = NULL, setSeatingChartID = 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("Attendance", "SeatingChartMeet", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SeatingChartMeet
#'
#' This function deletes a SeatingChartMeet.
#'
#' @param SeatingChartMeetID The id of the SeatingChartMeet.\cr Run \code{\link{getAllSeatingChartMeets}} for a list of SeatingChartMeets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted SeatingChartMeet.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSeatingChartMeet <- function(SeatingChartMeetID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "SeatingChartMeet", SeatingChartMeetID, EntityID)
}
#' Get all SeatingChartSeats.
#'
#' This function returns a dataframe of all SeatingChartSeats 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 Attendance
#' @return All SeatingChartSeats in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSeatingChartSeats <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSeatingChartSeatID = F, returnCreatedTime = F, returnModifiedTime = F, returnRoomLayoutObjectID = F, returnSeatingChartID = F, returnStudentID = 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("Attendance", "SeatingChartSeat", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SeatingChartSeat
#'
#' This function returns fields for a SeatingChartSeat.
#'
#' @param SeatingChartSeatID The id of the SeatingChartSeat.\cr Run \code{\link{getAllSeatingChartSeats}} for a list of SeatingChartSeats.
#' @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 Attendance
#' @return Details for the SeatingChartSeat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSeatingChartSeat <- function(SeatingChartSeatID, EntityID = 1, returnSeatingChartSeatID = F, returnCreatedTime = F, returnModifiedTime = F, returnRoomLayoutObjectID = F, returnSeatingChartID = F, returnStudentID = 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("Attendance", "SeatingChartSeat", SeatingChartSeatID, searchFields, EntityID)
}
#' Modify a specific SeatingChartSeat
#'
#' This function modifies fields for a SeatingChartSeat.
#'
#' @param SeatingChartSeatID The id of the SeatingChartSeat to be modified.\cr Run \code{\link{getAllSeatingChartSeats}} for a list of SeatingChartSeats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified SeatingChartSeat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySeatingChartSeat <- function(SeatingChartSeatID, EntityID = 1, setRoomLayoutObjectID = NULL, setSeatingChartID = NULL, setStudentID = 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("Attendance", "SeatingChartSeat", SeatingChartSeatID, names(functionParams), functionParams, EntityID)
}
#' Create new SeatingChartSeat.
#'
#' This function creates a new SeatingChartSeat.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created SeatingChartSeat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSeatingChartSeat <- function(EntityID = 1, setRoomLayoutObjectID = NULL, setSeatingChartID = NULL, setStudentID = 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("Attendance", "SeatingChartSeat", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SeatingChartSeat
#'
#' This function deletes a SeatingChartSeat.
#'
#' @param SeatingChartSeatID The id of the SeatingChartSeat.\cr Run \code{\link{getAllSeatingChartSeats}} for a list of SeatingChartSeats.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted SeatingChartSeat.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSeatingChartSeat <- function(SeatingChartSeatID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "SeatingChartSeat", SeatingChartSeatID, EntityID)
}
#' Get all SeatingChartUsedLasts.
#'
#' This function returns a dataframe of all SeatingChartUsedLasts 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 Attendance
#' @return All SeatingChartUsedLasts in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSeatingChartUsedLasts <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSeatingChartUsedLastID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnModifiedTime = F, returnRoomID = F, returnSeatingChartID = 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("Attendance", "SeatingChartUsedLast", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SeatingChartUsedLast
#'
#' This function returns fields for a SeatingChartUsedLast.
#'
#' @param SeatingChartUsedLastID The id of the SeatingChartUsedLast.\cr Run \code{\link{getAllSeatingChartUsedLasts}} for a list of SeatingChartUsedLasts.
#' @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 Attendance
#' @return Details for the SeatingChartUsedLast.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSeatingChartUsedLast <- function(SeatingChartUsedLastID, EntityID = 1, returnSeatingChartUsedLastID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnModifiedTime = F, returnRoomID = F, returnSeatingChartID = 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("Attendance", "SeatingChartUsedLast", SeatingChartUsedLastID, searchFields, EntityID)
}
#' Modify a specific SeatingChartUsedLast
#'
#' This function modifies fields for a SeatingChartUsedLast.
#'
#' @param SeatingChartUsedLastID The id of the SeatingChartUsedLast to be modified.\cr Run \code{\link{getAllSeatingChartUsedLasts}} for a list of SeatingChartUsedLasts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified SeatingChartUsedLast.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySeatingChartUsedLast <- function(SeatingChartUsedLastID, EntityID = 1, setDisplayPeriodID = NULL, setRoomID = NULL, setSeatingChartID = 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("Attendance", "SeatingChartUsedLast", SeatingChartUsedLastID, names(functionParams), functionParams, EntityID)
}
#' Create new SeatingChartUsedLast.
#'
#' This function creates a new SeatingChartUsedLast.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created SeatingChartUsedLast.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSeatingChartUsedLast <- function(EntityID = 1, setDisplayPeriodID = NULL, setRoomID = NULL, setSeatingChartID = 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("Attendance", "SeatingChartUsedLast", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SeatingChartUsedLast
#'
#' This function deletes a SeatingChartUsedLast.
#'
#' @param SeatingChartUsedLastID The id of the SeatingChartUsedLast.\cr Run \code{\link{getAllSeatingChartUsedLasts}} for a list of SeatingChartUsedLasts.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted SeatingChartUsedLast.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSeatingChartUsedLast <- function(SeatingChartUsedLastID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "SeatingChartUsedLast", SeatingChartUsedLastID, EntityID)
}
#' Get all StaffMeetSettings.
#'
#' This function returns a dataframe of all StaffMeetSettings 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 Attendance
#' @return All StaffMeetSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStaffMeetSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStaffMeetSettingID = F, returnBrowseViewID = F, returnCreatedTime = F, returnDisplayAttendanceTotalsOnDesktop = F, returnDisplayAttendanceTotalsOnMobile = F, returnDisplayCourseDescription = F, returnDisplayHistoricalAttendanceOnDesktop = F, returnDisplayHistoricalAttendanceOnMobile = F, returnDisplayStudentGradeLevel = F, returnDisplayStudentNumber = F, returnHideLockedColumns = F, returnModifiedTime = F, returnStaffMeetID = F, returnStudentNameDisplayType = F, returnStudentNameDisplayTypeCode = F, returnUseCustomClassRosterSort = 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("Attendance", "StaffMeetSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StaffMeetSetting
#'
#' This function returns fields for a StaffMeetSetting.
#'
#' @param StaffMeetSettingID The id of the StaffMeetSetting.\cr Run \code{\link{getAllStaffMeetSettings}} for a list of StaffMeetSettings.
#' @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 Attendance
#' @return Details for the StaffMeetSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStaffMeetSetting <- function(StaffMeetSettingID, EntityID = 1, returnStaffMeetSettingID = F, returnBrowseViewID = F, returnCreatedTime = F, returnDisplayAttendanceTotalsOnDesktop = F, returnDisplayAttendanceTotalsOnMobile = F, returnDisplayCourseDescription = F, returnDisplayHistoricalAttendanceOnDesktop = F, returnDisplayHistoricalAttendanceOnMobile = F, returnDisplayStudentGradeLevel = F, returnDisplayStudentNumber = F, returnHideLockedColumns = F, returnModifiedTime = F, returnStaffMeetID = F, returnStudentNameDisplayType = F, returnStudentNameDisplayTypeCode = F, returnUseCustomClassRosterSort = 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("Attendance", "StaffMeetSetting", StaffMeetSettingID, searchFields, EntityID)
}
#' Modify a specific StaffMeetSetting
#'
#' This function modifies fields for a StaffMeetSetting.
#'
#' @param StaffMeetSettingID The id of the StaffMeetSetting to be modified.\cr Run \code{\link{getAllStaffMeetSettings}} for a list of StaffMeetSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StaffMeetSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStaffMeetSetting <- function(StaffMeetSettingID, EntityID = 1, setBrowseViewID = NULL, setDisplayAttendanceTotalsOnDesktop = NULL, setDisplayAttendanceTotalsOnMobile = NULL, setDisplayCourseDescription = NULL, setDisplayHistoricalAttendanceOnDesktop = NULL, setDisplayHistoricalAttendanceOnMobile = NULL, setDisplayStudentGradeLevel = NULL, setDisplayStudentNumber = NULL, setHideLockedColumns = NULL, setStaffMeetID = NULL, setStudentNameDisplayType = NULL, setStudentNameDisplayTypeCode = NULL, setUseCustomClassRosterSort = 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("Attendance", "StaffMeetSetting", StaffMeetSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new StaffMeetSetting.
#'
#' This function creates a new StaffMeetSetting.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StaffMeetSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStaffMeetSetting <- function(EntityID = 1, setBrowseViewID = NULL, setDisplayAttendanceTotalsOnDesktop = NULL, setDisplayAttendanceTotalsOnMobile = NULL, setDisplayCourseDescription = NULL, setDisplayHistoricalAttendanceOnDesktop = NULL, setDisplayHistoricalAttendanceOnMobile = NULL, setDisplayStudentGradeLevel = NULL, setDisplayStudentNumber = NULL, setHideLockedColumns = NULL, setStaffMeetID = NULL, setStudentNameDisplayType = NULL, setStudentNameDisplayTypeCode = NULL, setUseCustomClassRosterSort = 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("Attendance", "StaffMeetSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StaffMeetSetting
#'
#' This function deletes a StaffMeetSetting.
#'
#' @param StaffMeetSettingID The id of the StaffMeetSetting.\cr Run \code{\link{getAllStaffMeetSettings}} for a list of StaffMeetSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StaffMeetSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStaffMeetSetting <- function(StaffMeetSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StaffMeetSetting", StaffMeetSettingID, EntityID)
}
#' Get all StudentAttendances.
#'
#' This function returns a dataframe of all StudentAttendances 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 Attendance
#' @return All StudentAttendances in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendances <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendanceID = F, returnCalendarDayID = F, returnComment = F, returnCommentsExistForStudentAttendance = F, returnCreatedTime = F, returnDaysAbsent = F, returnDaysExcused = F, returnDaysOther = F, returnDaysUnexcused = F, returnEntityID = F, returnHideRecordMA = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnSchoolYearID = F, returnStudentID = F, returnTardyCount = 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("Attendance", "StudentAttendance", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendance
#'
#' This function returns fields for a StudentAttendance.
#'
#' @param StudentAttendanceID The id of the StudentAttendance.\cr Run \code{\link{getAllStudentAttendances}} for a list of StudentAttendances.
#' @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 Attendance
#' @return Details for the StudentAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendance <- function(StudentAttendanceID, EntityID = 1, returnStudentAttendanceID = F, returnCalendarDayID = F, returnComment = F, returnCommentsExistForStudentAttendance = F, returnCreatedTime = F, returnDaysAbsent = F, returnDaysExcused = F, returnDaysOther = F, returnDaysUnexcused = F, returnEntityID = F, returnHideRecordMA = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnSchoolYearID = F, returnStudentID = F, returnTardyCount = 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("Attendance", "StudentAttendance", StudentAttendanceID, searchFields, EntityID)
}
#' Modify a specific StudentAttendance
#'
#' This function modifies fields for a StudentAttendance.
#'
#' @param StudentAttendanceID The id of the StudentAttendance to be modified.\cr Run \code{\link{getAllStudentAttendances}} for a list of StudentAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendance <- function(StudentAttendanceID, EntityID = 1, setCalendarDayID = NULL, setComment = NULL, setDaysAbsent = NULL, setDaysExcused = NULL, setDaysOther = NULL, setDaysUnexcused = NULL, setEntityID = NULL, setHideRecordMA = NULL, setIsGuardianNotified = NULL, setSchoolYearID = NULL, setStudentID = NULL, setTardyCount = 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("Attendance", "StudentAttendance", StudentAttendanceID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendance.
#'
#' This function creates a new StudentAttendance.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendance <- function(EntityID = 1, setCalendarDayID = NULL, setComment = NULL, setDaysAbsent = NULL, setDaysExcused = NULL, setDaysOther = NULL, setDaysUnexcused = NULL, setEntityID = NULL, setHideRecordMA = NULL, setIsGuardianNotified = NULL, setSchoolYearID = NULL, setStudentID = NULL, setTardyCount = 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("Attendance", "StudentAttendance", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendance
#'
#' This function deletes a StudentAttendance.
#'
#' @param StudentAttendanceID The id of the StudentAttendance.\cr Run \code{\link{getAllStudentAttendances}} for a list of StudentAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendance <- function(StudentAttendanceID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendance", StudentAttendanceID, EntityID)
}
#' Get all StudentAttendanceEntities.
#'
#' This function returns a dataframe of all StudentAttendanceEntities 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 Attendance
#' @return All StudentAttendanceEntities in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendanceEntities <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendanceID = F, returnEntityID = 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("Attendance", "StudentAttendanceEntity", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendanceEntity
#'
#' This function returns fields for a StudentAttendanceEntity.
#'
#' @param StudentAttendanceEntityID The id of the StudentAttendanceEntity.\cr Run \code{\link{getAllStudentAttendanceEntities}} for a list of StudentAttendanceEntities.
#' @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 Attendance
#' @return Details for the StudentAttendanceEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendanceEntity <- function(StudentAttendanceEntityID, EntityID = 1, returnStudentAttendanceID = F, returnEntityID = 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("Attendance", "StudentAttendanceEntity", StudentAttendanceEntityID, searchFields, EntityID)
}
#' Modify a specific StudentAttendanceEntity
#'
#' This function modifies fields for a StudentAttendanceEntity.
#'
#' @param StudentAttendanceEntityID The id of the StudentAttendanceEntity to be modified.\cr Run \code{\link{getAllStudentAttendanceEntities}} for a list of StudentAttendanceEntitys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendanceEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendanceEntity <- function(StudentAttendanceEntityID, EntityID = 1){
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("Attendance", "StudentAttendanceEntity", StudentAttendanceEntityID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendanceEntity.
#'
#' This function creates a new StudentAttendanceEntity.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendanceEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendanceEntity <- function(EntityID = 1){
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("Attendance", "StudentAttendanceEntity", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendanceEntity
#'
#' This function deletes a StudentAttendanceEntity.
#'
#' @param StudentAttendanceEntityID The id of the StudentAttendanceEntity.\cr Run \code{\link{getAllStudentAttendanceEntities}} for a list of StudentAttendanceEntities.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendanceEntity.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendanceEntity <- function(StudentAttendanceEntityID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendanceEntity", StudentAttendanceEntityID, EntityID)
}
#' Get all StudentAttendancePeriods.
#'
#' This function returns a dataframe of all StudentAttendancePeriods 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 Attendance
#' @return All StudentAttendancePeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendancePeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnAttendanceReasonID = F, returnAttendanceTypeID = F, returnAttendanceTypeWithReason = F, returnComment = F, returnCreatedTime = F, returnCrossWalkedAttendanceTypeWithReason = F, returnEntityIDAttendancePeriod = F, returnEntityIDCourse = F, returnIncidentOffenseNameActionDetailID = F, returnModifiedTime = F, returnStudentAttendanceID = F, returnStudentSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnViewingFromAttendanceEntity = 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("Attendance", "StudentAttendancePeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendancePeriod
#'
#' This function returns fields for a StudentAttendancePeriod.
#'
#' @param StudentAttendancePeriodID The id of the StudentAttendancePeriod.\cr Run \code{\link{getAllStudentAttendancePeriods}} for a list of StudentAttendancePeriods.
#' @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 Attendance
#' @return Details for the StudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendancePeriod <- function(StudentAttendancePeriodID, EntityID = 1, returnStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnAttendanceReasonID = F, returnAttendanceTypeID = F, returnAttendanceTypeWithReason = F, returnComment = F, returnCreatedTime = F, returnCrossWalkedAttendanceTypeWithReason = F, returnEntityIDAttendancePeriod = F, returnEntityIDCourse = F, returnIncidentOffenseNameActionDetailID = F, returnModifiedTime = F, returnStudentAttendanceID = F, returnStudentSectionID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnViewingFromAttendanceEntity = 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("Attendance", "StudentAttendancePeriod", StudentAttendancePeriodID, searchFields, EntityID)
}
#' Modify a specific StudentAttendancePeriod
#'
#' This function modifies fields for a StudentAttendancePeriod.
#'
#' @param StudentAttendancePeriodID The id of the StudentAttendancePeriod to be modified.\cr Run \code{\link{getAllStudentAttendancePeriods}} for a list of StudentAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendancePeriod <- function(StudentAttendancePeriodID, EntityID = 1, setAttendancePeriodID = NULL, setAttendanceReasonID = NULL, setAttendanceTypeID = NULL, setComment = NULL, setEntityIDAttendancePeriod = NULL, setEntityIDCourse = NULL, setIncidentOffenseNameActionDetailID = NULL, setStudentAttendanceID = NULL, setStudentSectionID = NULL, setViewingFromAttendanceEntity = 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("Attendance", "StudentAttendancePeriod", StudentAttendancePeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendancePeriod.
#'
#' This function creates a new StudentAttendancePeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendancePeriod <- function(EntityID = 1, setAttendancePeriodID = NULL, setAttendanceReasonID = NULL, setAttendanceTypeID = NULL, setComment = NULL, setEntityIDAttendancePeriod = NULL, setEntityIDCourse = NULL, setIncidentOffenseNameActionDetailID = NULL, setStudentAttendanceID = NULL, setStudentSectionID = NULL, setViewingFromAttendanceEntity = 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("Attendance", "StudentAttendancePeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendancePeriod
#'
#' This function deletes a StudentAttendancePeriod.
#'
#' @param StudentAttendancePeriodID The id of the StudentAttendancePeriod.\cr Run \code{\link{getAllStudentAttendancePeriods}} for a list of StudentAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendancePeriod <- function(StudentAttendancePeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendancePeriod", StudentAttendancePeriodID, EntityID)
}
#' Get all StudentAttendancePeriodGroups.
#'
#' This function returns a dataframe of all StudentAttendancePeriodGroups 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 Attendance
#' @return All StudentAttendancePeriodGroups in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendancePeriodGroups <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnEntityID = F, returnSchoolYearID = F, returnStudentAttendanceID = F, returnStudentID = 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("Attendance", "StudentAttendancePeriodGroup", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendancePeriodGroup
#'
#' This function returns fields for a StudentAttendancePeriodGroup.
#'
#' @param StudentAttendancePeriodGroupID The id of the StudentAttendancePeriodGroup.\cr Run \code{\link{getAllStudentAttendancePeriodGroups}} for a list of StudentAttendancePeriodGroups.
#' @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 Attendance
#' @return Details for the StudentAttendancePeriodGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendancePeriodGroup <- function(StudentAttendancePeriodGroupID, EntityID = 1, returnStudentAttendancePeriodID = F, returnAttendancePeriodID = F, returnEntityID = F, returnSchoolYearID = F, returnStudentAttendanceID = F, returnStudentID = 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("Attendance", "StudentAttendancePeriodGroup", StudentAttendancePeriodGroupID, searchFields, EntityID)
}
#' Modify a specific StudentAttendancePeriodGroup
#'
#' This function modifies fields for a StudentAttendancePeriodGroup.
#'
#' @param StudentAttendancePeriodGroupID The id of the StudentAttendancePeriodGroup to be modified.\cr Run \code{\link{getAllStudentAttendancePeriodGroups}} for a list of StudentAttendancePeriodGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendancePeriodGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendancePeriodGroup <- function(StudentAttendancePeriodGroupID, EntityID = 1){
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("Attendance", "StudentAttendancePeriodGroup", StudentAttendancePeriodGroupID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendancePeriodGroup.
#'
#' This function creates a new StudentAttendancePeriodGroup.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendancePeriodGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendancePeriodGroup <- function(EntityID = 1){
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("Attendance", "StudentAttendancePeriodGroup", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendancePeriodGroup
#'
#' This function deletes a StudentAttendancePeriodGroup.
#'
#' @param StudentAttendancePeriodGroupID The id of the StudentAttendancePeriodGroup.\cr Run \code{\link{getAllStudentAttendancePeriodGroups}} for a list of StudentAttendancePeriodGroups.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendancePeriodGroup.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendancePeriodGroup <- function(StudentAttendancePeriodGroupID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendancePeriodGroup", StudentAttendancePeriodGroupID, EntityID)
}
#' Get all StudentAttendancePeriodRunHistories.
#'
#' This function returns a dataframe of all StudentAttendancePeriodRunHistories 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 Attendance
#' @return All StudentAttendancePeriodRunHistories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendancePeriodRunHistories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendancePeriodRunHistoryID = F, returnAttendancePeriodID = F, returnCreatedTime = F, returnIsActive = F, returnIsInsert = F, returnModifiedTime = F, returnNewAttendanceReasonID = F, returnNewAttendanceTypeID = F, returnNewComment = F, returnOriginalAttendanceReasonID = F, returnOriginalAttendanceTypeID = F, returnOriginalComment = F, returnProcedure = F, returnStatus = F, returnStudentAttendancePeriodID = F, returnStudentAttendanceRunHistoryID = 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("Attendance", "StudentAttendancePeriodRunHistory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendancePeriodRunHistory
#'
#' This function returns fields for a StudentAttendancePeriodRunHistory.
#'
#' @param StudentAttendancePeriodRunHistoryID The id of the StudentAttendancePeriodRunHistory.\cr Run \code{\link{getAllStudentAttendancePeriodRunHistories}} for a list of StudentAttendancePeriodRunHistories.
#' @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 Attendance
#' @return Details for the StudentAttendancePeriodRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendancePeriodRunHistory <- function(StudentAttendancePeriodRunHistoryID, EntityID = 1, returnStudentAttendancePeriodRunHistoryID = F, returnAttendancePeriodID = F, returnCreatedTime = F, returnIsActive = F, returnIsInsert = F, returnModifiedTime = F, returnNewAttendanceReasonID = F, returnNewAttendanceTypeID = F, returnNewComment = F, returnOriginalAttendanceReasonID = F, returnOriginalAttendanceTypeID = F, returnOriginalComment = F, returnProcedure = F, returnStatus = F, returnStudentAttendancePeriodID = F, returnStudentAttendanceRunHistoryID = 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("Attendance", "StudentAttendancePeriodRunHistory", StudentAttendancePeriodRunHistoryID, searchFields, EntityID)
}
#' Modify a specific StudentAttendancePeriodRunHistory
#'
#' This function modifies fields for a StudentAttendancePeriodRunHistory.
#'
#' @param StudentAttendancePeriodRunHistoryID The id of the StudentAttendancePeriodRunHistory to be modified.\cr Run \code{\link{getAllStudentAttendancePeriodRunHistories}} for a list of StudentAttendancePeriodRunHistorys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendancePeriodRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendancePeriodRunHistory <- function(StudentAttendancePeriodRunHistoryID, EntityID = 1, setAttendancePeriodID = NULL, setIsActive = NULL, setIsInsert = NULL, setNewAttendanceReasonID = NULL, setNewAttendanceTypeID = NULL, setNewComment = NULL, setOriginalAttendanceReasonID = NULL, setOriginalAttendanceTypeID = NULL, setOriginalComment = NULL, setStudentAttendancePeriodID = NULL, setStudentAttendanceRunHistoryID = 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("Attendance", "StudentAttendancePeriodRunHistory", StudentAttendancePeriodRunHistoryID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendancePeriodRunHistory.
#'
#' This function creates a new StudentAttendancePeriodRunHistory.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendancePeriodRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendancePeriodRunHistory <- function(EntityID = 1, setAttendancePeriodID = NULL, setIsActive = NULL, setIsInsert = NULL, setNewAttendanceReasonID = NULL, setNewAttendanceTypeID = NULL, setNewComment = NULL, setOriginalAttendanceReasonID = NULL, setOriginalAttendanceTypeID = NULL, setOriginalComment = NULL, setStudentAttendancePeriodID = NULL, setStudentAttendanceRunHistoryID = 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("Attendance", "StudentAttendancePeriodRunHistory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendancePeriodRunHistory
#'
#' This function deletes a StudentAttendancePeriodRunHistory.
#'
#' @param StudentAttendancePeriodRunHistoryID The id of the StudentAttendancePeriodRunHistory.\cr Run \code{\link{getAllStudentAttendancePeriodRunHistories}} for a list of StudentAttendancePeriodRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendancePeriodRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendancePeriodRunHistory <- function(StudentAttendancePeriodRunHistoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendancePeriodRunHistory", StudentAttendancePeriodRunHistoryID, EntityID)
}
#' Get all StudentAttendanceRunHistories.
#'
#' This function returns a dataframe of all StudentAttendanceRunHistories 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 Attendance
#' @return All StudentAttendanceRunHistories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendanceRunHistories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentAttendanceRunHistoryID = F, returnCalendarDayID = F, returnCreatedTime = F, returnIsActive = F, returnIsInsert = F, returnMassCreateAttendanceByClassActivityRangeRunID = F, returnModifiedTime = F, returnNewComment = F, returnNewIsGuardianNotified = F, returnOriginalComment = F, returnOriginalIsGuardianNotified = F, returnProcedure = F, returnStatus = F, returnStudentAttendanceID = F, returnStudentID = 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("Attendance", "StudentAttendanceRunHistory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendanceRunHistory
#'
#' This function returns fields for a StudentAttendanceRunHistory.
#'
#' @param StudentAttendanceRunHistoryID The id of the StudentAttendanceRunHistory.\cr Run \code{\link{getAllStudentAttendanceRunHistories}} for a list of StudentAttendanceRunHistories.
#' @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 Attendance
#' @return Details for the StudentAttendanceRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendanceRunHistory <- function(StudentAttendanceRunHistoryID, EntityID = 1, returnStudentAttendanceRunHistoryID = F, returnCalendarDayID = F, returnCreatedTime = F, returnIsActive = F, returnIsInsert = F, returnMassCreateAttendanceByClassActivityRangeRunID = F, returnModifiedTime = F, returnNewComment = F, returnNewIsGuardianNotified = F, returnOriginalComment = F, returnOriginalIsGuardianNotified = F, returnProcedure = F, returnStatus = F, returnStudentAttendanceID = F, returnStudentID = 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("Attendance", "StudentAttendanceRunHistory", StudentAttendanceRunHistoryID, searchFields, EntityID)
}
#' Modify a specific StudentAttendanceRunHistory
#'
#' This function modifies fields for a StudentAttendanceRunHistory.
#'
#' @param StudentAttendanceRunHistoryID The id of the StudentAttendanceRunHistory to be modified.\cr Run \code{\link{getAllStudentAttendanceRunHistories}} for a list of StudentAttendanceRunHistorys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendanceRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendanceRunHistory <- function(StudentAttendanceRunHistoryID, EntityID = 1, setCalendarDayID = NULL, setIsActive = NULL, setIsInsert = NULL, setMassCreateAttendanceByClassActivityRangeRunID = NULL, setNewComment = NULL, setNewIsGuardianNotified = NULL, setOriginalComment = NULL, setOriginalIsGuardianNotified = NULL, setStudentAttendanceID = NULL, setStudentID = 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("Attendance", "StudentAttendanceRunHistory", StudentAttendanceRunHistoryID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendanceRunHistory.
#'
#' This function creates a new StudentAttendanceRunHistory.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendanceRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendanceRunHistory <- function(EntityID = 1, setCalendarDayID = NULL, setIsActive = NULL, setIsInsert = NULL, setMassCreateAttendanceByClassActivityRangeRunID = NULL, setNewComment = NULL, setNewIsGuardianNotified = NULL, setOriginalComment = NULL, setOriginalIsGuardianNotified = NULL, setStudentAttendanceID = NULL, setStudentID = 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("Attendance", "StudentAttendanceRunHistory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendanceRunHistory
#'
#' This function deletes a StudentAttendanceRunHistory.
#'
#' @param StudentAttendanceRunHistoryID The id of the StudentAttendanceRunHistory.\cr Run \code{\link{getAllStudentAttendanceRunHistories}} for a list of StudentAttendanceRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendanceRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendanceRunHistory <- function(StudentAttendanceRunHistoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendanceRunHistory", StudentAttendanceRunHistoryID, EntityID)
}
#' Get all StudentAttendanceTerms.
#'
#' This function returns a dataframe of all StudentAttendanceTerms 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 Attendance
#' @return All StudentAttendanceTerms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentAttendanceTerms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentID = F, returnAttendanceTermCode = F, returnAttendanceTermID = F, returnEndDate = F, returnEntityID = F, returnIsDefault = F, returnSchoolYearID = F, returnStartDate = F, returnTotalDaysAbsent = F, returnTotalDaysExcused = F, returnTotalDaysOther = F, returnTotalDaysPossible = F, returnTotalDaysPresent = F, returnTotalDaysUnexcused = F, returnTotalTardyCount = 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("Attendance", "StudentAttendanceTerm", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentAttendanceTerm
#'
#' This function returns fields for a StudentAttendanceTerm.
#'
#' @param StudentAttendanceTermID The id of the StudentAttendanceTerm.\cr Run \code{\link{getAllStudentAttendanceTerms}} for a list of StudentAttendanceTerms.
#' @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 Attendance
#' @return Details for the StudentAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentAttendanceTerm <- function(StudentAttendanceTermID, EntityID = 1, returnStudentID = F, returnAttendanceTermCode = F, returnAttendanceTermID = F, returnEndDate = F, returnEntityID = F, returnIsDefault = F, returnSchoolYearID = F, returnStartDate = F, returnTotalDaysAbsent = F, returnTotalDaysExcused = F, returnTotalDaysOther = F, returnTotalDaysPossible = F, returnTotalDaysPresent = F, returnTotalDaysUnexcused = F, returnTotalTardyCount = 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("Attendance", "StudentAttendanceTerm", StudentAttendanceTermID, searchFields, EntityID)
}
#' Modify a specific StudentAttendanceTerm
#'
#' This function modifies fields for a StudentAttendanceTerm.
#'
#' @param StudentAttendanceTermID The id of the StudentAttendanceTerm to be modified.\cr Run \code{\link{getAllStudentAttendanceTerms}} for a list of StudentAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentAttendanceTerm <- function(StudentAttendanceTermID, EntityID = 1){
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("Attendance", "StudentAttendanceTerm", StudentAttendanceTermID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentAttendanceTerm.
#'
#' This function creates a new StudentAttendanceTerm.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentAttendanceTerm <- function(EntityID = 1){
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("Attendance", "StudentAttendanceTerm", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentAttendanceTerm
#'
#' This function deletes a StudentAttendanceTerm.
#'
#' @param StudentAttendanceTermID The id of the StudentAttendanceTerm.\cr Run \code{\link{getAllStudentAttendanceTerms}} for a list of StudentAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentAttendanceTerm <- function(StudentAttendanceTermID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentAttendanceTerm", StudentAttendanceTermID, EntityID)
}
#' Get all StudentDisciplineThresholdAttendanceReportRunHistories.
#'
#' This function returns a dataframe of all StudentDisciplineThresholdAttendanceReportRunHistories 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 Attendance
#' @return All StudentDisciplineThresholdAttendanceReportRunHistories in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentDisciplineThresholdAttendanceReportRunHistories <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentDisciplineThresholdAttendanceReportRunHistoryID = F, returnAttachmentID = F, returnAttendanceReportRunHistoryID = F, returnBody = F, returnBodyForReport = F, returnCreatedTime = F, returnDisciplineThresholdID = F, returnFooter = F, returnFooterForReport = F, returnHeader = F, returnHeaderForReport = F, returnIsActive = F, returnModifiedTime = F, returnStudentID = 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("Attendance", "StudentDisciplineThresholdAttendanceReportRunHistory", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentDisciplineThresholdAttendanceReportRunHistory
#'
#' This function returns fields for a StudentDisciplineThresholdAttendanceReportRunHistory.
#'
#' @param StudentDisciplineThresholdAttendanceReportRunHistoryID The id of the StudentDisciplineThresholdAttendanceReportRunHistory.\cr Run \code{\link{getAllStudentDisciplineThresholdAttendanceReportRunHistories}} for a list of StudentDisciplineThresholdAttendanceReportRunHistories.
#' @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 Attendance
#' @return Details for the StudentDisciplineThresholdAttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentDisciplineThresholdAttendanceReportRunHistory <- function(StudentDisciplineThresholdAttendanceReportRunHistoryID, EntityID = 1, returnStudentDisciplineThresholdAttendanceReportRunHistoryID = F, returnAttachmentID = F, returnAttendanceReportRunHistoryID = F, returnBody = F, returnBodyForReport = F, returnCreatedTime = F, returnDisciplineThresholdID = F, returnFooter = F, returnFooterForReport = F, returnHeader = F, returnHeaderForReport = F, returnIsActive = F, returnModifiedTime = F, returnStudentID = 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("Attendance", "StudentDisciplineThresholdAttendanceReportRunHistory", StudentDisciplineThresholdAttendanceReportRunHistoryID, searchFields, EntityID)
}
#' Modify a specific StudentDisciplineThresholdAttendanceReportRunHistory
#'
#' This function modifies fields for a StudentDisciplineThresholdAttendanceReportRunHistory.
#'
#' @param StudentDisciplineThresholdAttendanceReportRunHistoryID The id of the StudentDisciplineThresholdAttendanceReportRunHistory to be modified.\cr Run \code{\link{getAllStudentDisciplineThresholdAttendanceReportRunHistories}} for a list of StudentDisciplineThresholdAttendanceReportRunHistorys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentDisciplineThresholdAttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentDisciplineThresholdAttendanceReportRunHistory <- function(StudentDisciplineThresholdAttendanceReportRunHistoryID, EntityID = 1, setAttachmentID = NULL, setAttendanceReportRunHistoryID = NULL, setBody = NULL, setDisciplineThresholdID = NULL, setFooter = NULL, setHeader = NULL, setIsActive = NULL, setStudentID = 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("Attendance", "StudentDisciplineThresholdAttendanceReportRunHistory", StudentDisciplineThresholdAttendanceReportRunHistoryID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentDisciplineThresholdAttendanceReportRunHistory.
#'
#' This function creates a new StudentDisciplineThresholdAttendanceReportRunHistory.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentDisciplineThresholdAttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentDisciplineThresholdAttendanceReportRunHistory <- function(EntityID = 1, setAttachmentID = NULL, setAttendanceReportRunHistoryID = NULL, setBody = NULL, setDisciplineThresholdID = NULL, setFooter = NULL, setHeader = NULL, setIsActive = NULL, setStudentID = 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("Attendance", "StudentDisciplineThresholdAttendanceReportRunHistory", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentDisciplineThresholdAttendanceReportRunHistory
#'
#' This function deletes a StudentDisciplineThresholdAttendanceReportRunHistory.
#'
#' @param StudentDisciplineThresholdAttendanceReportRunHistoryID The id of the StudentDisciplineThresholdAttendanceReportRunHistory.\cr Run \code{\link{getAllStudentDisciplineThresholdAttendanceReportRunHistories}} for a list of StudentDisciplineThresholdAttendanceReportRunHistories.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentDisciplineThresholdAttendanceReportRunHistory.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentDisciplineThresholdAttendanceReportRunHistory <- function(StudentDisciplineThresholdAttendanceReportRunHistoryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentDisciplineThresholdAttendanceReportRunHistory", StudentDisciplineThresholdAttendanceReportRunHistoryID, EntityID)
}
#' Get all StudentInOutTimes.
#'
#' This function returns a dataframe of all StudentInOutTimes 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 Attendance
#' @return All StudentInOutTimes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentInOutTimes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentInOutTimeID = F, returnCreatedTime = F, returnMinutesPresent = F, returnModifiedTime = F, returnPeriodTimes = F, returnStudentAttendanceID = F, returnTimeIn = F, returnTimeOut = 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("Attendance", "StudentInOutTime", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentInOutTime
#'
#' This function returns fields for a StudentInOutTime.
#'
#' @param StudentInOutTimeID The id of the StudentInOutTime.\cr Run \code{\link{getAllStudentInOutTimes}} for a list of StudentInOutTimes.
#' @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 Attendance
#' @return Details for the StudentInOutTime.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentInOutTime <- function(StudentInOutTimeID, EntityID = 1, returnStudentInOutTimeID = F, returnCreatedTime = F, returnMinutesPresent = F, returnModifiedTime = F, returnPeriodTimes = F, returnStudentAttendanceID = F, returnTimeIn = F, returnTimeOut = 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("Attendance", "StudentInOutTime", StudentInOutTimeID, searchFields, EntityID)
}
#' Modify a specific StudentInOutTime
#'
#' This function modifies fields for a StudentInOutTime.
#'
#' @param StudentInOutTimeID The id of the StudentInOutTime to be modified.\cr Run \code{\link{getAllStudentInOutTimes}} for a list of StudentInOutTimes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentInOutTime.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentInOutTime <- function(StudentInOutTimeID, EntityID = 1, setStudentAttendanceID = NULL, setTimeIn = NULL, setTimeOut = 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("Attendance", "StudentInOutTime", StudentInOutTimeID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentInOutTime.
#'
#' This function creates a new StudentInOutTime.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentInOutTime.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentInOutTime <- function(EntityID = 1, setStudentAttendanceID = NULL, setTimeIn = NULL, setTimeOut = 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("Attendance", "StudentInOutTime", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentInOutTime
#'
#' This function deletes a StudentInOutTime.
#'
#' @param StudentInOutTimeID The id of the StudentInOutTime.\cr Run \code{\link{getAllStudentInOutTimes}} for a list of StudentInOutTimes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentInOutTime.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentInOutTime <- function(StudentInOutTimeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentInOutTime", StudentInOutTimeID, EntityID)
}
#' Get all StudentThresholdPeriods.
#'
#' This function returns a dataframe of all StudentThresholdPeriods 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 Attendance
#' @return All StudentThresholdPeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllStudentThresholdPeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnStudentThresholdPeriodID = F, returnAttendancePeriodID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCountsTowardsThreshold = F, returnCreatedTime = F, returnDate = F, returnModifiedTime = F, returnSectionID = F, returnStudentAttendancePeriodID = F, returnStudentDisciplineThresholdAttendanceReportRunHistoryID = 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("Attendance", "StudentThresholdPeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific StudentThresholdPeriod
#'
#' This function returns fields for a StudentThresholdPeriod.
#'
#' @param StudentThresholdPeriodID The id of the StudentThresholdPeriod.\cr Run \code{\link{getAllStudentThresholdPeriods}} for a list of StudentThresholdPeriods.
#' @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 Attendance
#' @return Details for the StudentThresholdPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getStudentThresholdPeriod <- function(StudentThresholdPeriodID, EntityID = 1, returnStudentThresholdPeriodID = F, returnAttendancePeriodID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCountsTowardsThreshold = F, returnCreatedTime = F, returnDate = F, returnModifiedTime = F, returnSectionID = F, returnStudentAttendancePeriodID = F, returnStudentDisciplineThresholdAttendanceReportRunHistoryID = 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("Attendance", "StudentThresholdPeriod", StudentThresholdPeriodID, searchFields, EntityID)
}
#' Modify a specific StudentThresholdPeriod
#'
#' This function modifies fields for a StudentThresholdPeriod.
#'
#' @param StudentThresholdPeriodID The id of the StudentThresholdPeriod to be modified.\cr Run \code{\link{getAllStudentThresholdPeriods}} for a list of StudentThresholdPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified StudentThresholdPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyStudentThresholdPeriod <- function(StudentThresholdPeriodID, EntityID = 1, setAttendancePeriodID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setCountsTowardsThreshold = NULL, setDate = NULL, setSectionID = NULL, setStudentAttendancePeriodID = NULL, setStudentDisciplineThresholdAttendanceReportRunHistoryID = 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("Attendance", "StudentThresholdPeriod", StudentThresholdPeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new StudentThresholdPeriod.
#'
#' This function creates a new StudentThresholdPeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created StudentThresholdPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createStudentThresholdPeriod <- function(EntityID = 1, setAttendancePeriodID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setCountsTowardsThreshold = NULL, setDate = NULL, setSectionID = NULL, setStudentAttendancePeriodID = NULL, setStudentDisciplineThresholdAttendanceReportRunHistoryID = 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("Attendance", "StudentThresholdPeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific StudentThresholdPeriod
#'
#' This function deletes a StudentThresholdPeriod.
#'
#' @param StudentThresholdPeriodID The id of the StudentThresholdPeriod.\cr Run \code{\link{getAllStudentThresholdPeriods}} for a list of StudentThresholdPeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted StudentThresholdPeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteStudentThresholdPeriod <- function(StudentThresholdPeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "StudentThresholdPeriod", StudentThresholdPeriodID, EntityID)
}
#' Get all TeacherEntries.
#'
#' This function returns a dataframe of all TeacherEntries 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 Attendance
#' @return All TeacherEntries in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTeacherEntries <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTeacherEntryID = F, returnBackgroundColor = F, returnBackgroundColorHex = F, returnBackgroundColorRgba = F, returnCreatedTime = F, returnDisplayOrder = F, returnEntityGroupKey = F, returnEntityID = F, returnLabel = F, returnModifiedTime = F, returnSchoolYearID = F, returnTeacherEntryIDClonedFrom = 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("Attendance", "TeacherEntry", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TeacherEntry
#'
#' This function returns fields for a TeacherEntry.
#'
#' @param TeacherEntryID The id of the TeacherEntry.\cr Run \code{\link{getAllTeacherEntries}} for a list of TeacherEntries.
#' @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 Attendance
#' @return Details for the TeacherEntry.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTeacherEntry <- function(TeacherEntryID, EntityID = 1, returnTeacherEntryID = F, returnBackgroundColor = F, returnBackgroundColorHex = F, returnBackgroundColorRgba = F, returnCreatedTime = F, returnDisplayOrder = F, returnEntityGroupKey = F, returnEntityID = F, returnLabel = F, returnModifiedTime = F, returnSchoolYearID = F, returnTeacherEntryIDClonedFrom = 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("Attendance", "TeacherEntry", TeacherEntryID, searchFields, EntityID)
}
#' Modify a specific TeacherEntry
#'
#' This function modifies fields for a TeacherEntry.
#'
#' @param TeacherEntryID The id of the TeacherEntry to be modified.\cr Run \code{\link{getAllTeacherEntries}} for a list of TeacherEntrys.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TeacherEntry.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTeacherEntry <- function(TeacherEntryID, EntityID = 1, setBackgroundColor = NULL, setBackgroundColorHex = NULL, setBackgroundColorRgba = NULL, setDisplayOrder = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setLabel = NULL, setSchoolYearID = NULL, setTeacherEntryIDClonedFrom = 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("Attendance", "TeacherEntry", TeacherEntryID, names(functionParams), functionParams, EntityID)
}
#' Create new TeacherEntry.
#'
#' This function creates a new TeacherEntry.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TeacherEntry.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTeacherEntry <- function(EntityID = 1, setBackgroundColor = NULL, setBackgroundColorHex = NULL, setBackgroundColorRgba = NULL, setDisplayOrder = NULL, setEntityGroupKey = NULL, setEntityID = NULL, setLabel = NULL, setSchoolYearID = NULL, setTeacherEntryIDClonedFrom = 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("Attendance", "TeacherEntry", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TeacherEntry
#'
#' This function deletes a TeacherEntry.
#'
#' @param TeacherEntryID The id of the TeacherEntry.\cr Run \code{\link{getAllTeacherEntries}} for a list of TeacherEntries.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TeacherEntry.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTeacherEntry <- function(TeacherEntryID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TeacherEntry", TeacherEntryID, EntityID)
}
#' Get all TempAffectedCalendarDayRecords.
#'
#' This function returns a dataframe of all TempAffectedCalendarDayRecords 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 Attendance
#' @return All TempAffectedCalendarDayRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAffectedCalendarDayRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAffectedCalendarDayRecordID = F, returnAction = F, returnActionCode = F, returnAffectedPrimaryKey = F, returnCalendar = F, returnCalendarID = F, returnComment = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDayOfTheWeek = F, returnEntity = F, returnFailureReason = F, returnModifiedTime = F, returnNewBellSchedule = F, returnNewCountAs = F, returnNewDayRotation = F, returnNewDayRotationID = F, returnNewFundingPeriod = F, returnNewFundingPeriodID = F, returnNewInstructionalMinutesOverride = F, returnNewOperationalMinutesOverride = F, returnNewStateCalendarWaiverEventTypeCodeTX = F, returnNewStateCalendarWaiverEventTypeCodeTXID = F, returnNewStateSchoolDayEventCodeTX = F, returnNewStateSchoolDayEventCodeTXID = F, returnNewUseInstructionalMinutesOverride = F, returnNewUseOperationalMinutesOverride = F, returnNewWaiverMinutes = F, returnOldBellSchedule = F, returnOldDayRotation = F, returnOldDayRotationID = F, returnOldFundingPeriod = F, returnOldFundingPeriodID = F, returnOldInstructionalMinutesOverride = F, returnOldOperationalMinutesOverride = F, returnOldStateCalendarWaiverEventTypeCodeTX = F, returnOldStateCalendarWaiverEventTypeCodeTXID = F, returnOldStateSchoolDayEventCodeTX = F, returnOldStateSchoolDayEventCodeTXID = F, returnOldUseInstructionalMinutesOverride = F, returnOldUseOperationalMinutesOverride = F, returnOldWaiverMinutes = 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("Attendance", "TempAffectedCalendarDayRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAffectedCalendarDayRecord
#'
#' This function returns fields for a TempAffectedCalendarDayRecord.
#'
#' @param TempAffectedCalendarDayRecordID The id of the TempAffectedCalendarDayRecord.\cr Run \code{\link{getAllTempAffectedCalendarDayRecords}} for a list of TempAffectedCalendarDayRecords.
#' @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 Attendance
#' @return Details for the TempAffectedCalendarDayRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAffectedCalendarDayRecord <- function(TempAffectedCalendarDayRecordID, EntityID = 1, returnTempAffectedCalendarDayRecordID = F, returnAction = F, returnActionCode = F, returnAffectedPrimaryKey = F, returnCalendar = F, returnCalendarID = F, returnComment = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDayOfTheWeek = F, returnEntity = F, returnFailureReason = F, returnModifiedTime = F, returnNewBellSchedule = F, returnNewCountAs = F, returnNewDayRotation = F, returnNewDayRotationID = F, returnNewFundingPeriod = F, returnNewFundingPeriodID = F, returnNewInstructionalMinutesOverride = F, returnNewOperationalMinutesOverride = F, returnNewStateCalendarWaiverEventTypeCodeTX = F, returnNewStateCalendarWaiverEventTypeCodeTXID = F, returnNewStateSchoolDayEventCodeTX = F, returnNewStateSchoolDayEventCodeTXID = F, returnNewUseInstructionalMinutesOverride = F, returnNewUseOperationalMinutesOverride = F, returnNewWaiverMinutes = F, returnOldBellSchedule = F, returnOldDayRotation = F, returnOldDayRotationID = F, returnOldFundingPeriod = F, returnOldFundingPeriodID = F, returnOldInstructionalMinutesOverride = F, returnOldOperationalMinutesOverride = F, returnOldStateCalendarWaiverEventTypeCodeTX = F, returnOldStateCalendarWaiverEventTypeCodeTXID = F, returnOldStateSchoolDayEventCodeTX = F, returnOldStateSchoolDayEventCodeTXID = F, returnOldUseInstructionalMinutesOverride = F, returnOldUseOperationalMinutesOverride = F, returnOldWaiverMinutes = 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("Attendance", "TempAffectedCalendarDayRecord", TempAffectedCalendarDayRecordID, searchFields, EntityID)
}
#' Modify a specific TempAffectedCalendarDayRecord
#'
#' This function modifies fields for a TempAffectedCalendarDayRecord.
#'
#' @param TempAffectedCalendarDayRecordID The id of the TempAffectedCalendarDayRecord to be modified.\cr Run \code{\link{getAllTempAffectedCalendarDayRecords}} for a list of TempAffectedCalendarDayRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempAffectedCalendarDayRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAffectedCalendarDayRecord <- function(TempAffectedCalendarDayRecordID, EntityID = 1, setAction = NULL, setActionCode = NULL, setAffectedPrimaryKey = NULL, setCalendar = NULL, setCalendarID = NULL, setComment = NULL, setCountAs = NULL, setDate = NULL, setDayOfTheWeek = NULL, setEntity = NULL, setFailureReason = NULL, setNewBellSchedule = NULL, setNewCountAs = NULL, setNewDayRotation = NULL, setNewDayRotationID = NULL, setNewFundingPeriod = NULL, setNewFundingPeriodID = NULL, setNewInstructionalMinutesOverride = NULL, setNewOperationalMinutesOverride = NULL, setNewStateCalendarWaiverEventTypeCodeTX = NULL, setNewStateCalendarWaiverEventTypeCodeTXID = NULL, setNewStateSchoolDayEventCodeTX = NULL, setNewStateSchoolDayEventCodeTXID = NULL, setNewUseInstructionalMinutesOverride = NULL, setNewUseOperationalMinutesOverride = NULL, setNewWaiverMinutes = NULL, setOldBellSchedule = NULL, setOldDayRotation = NULL, setOldDayRotationID = NULL, setOldFundingPeriod = NULL, setOldFundingPeriodID = NULL, setOldInstructionalMinutesOverride = NULL, setOldOperationalMinutesOverride = NULL, setOldStateCalendarWaiverEventTypeCodeTX = NULL, setOldStateCalendarWaiverEventTypeCodeTXID = NULL, setOldStateSchoolDayEventCodeTX = NULL, setOldStateSchoolDayEventCodeTXID = NULL, setOldUseInstructionalMinutesOverride = NULL, setOldUseOperationalMinutesOverride = NULL, setOldWaiverMinutes = 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("Attendance", "TempAffectedCalendarDayRecord", TempAffectedCalendarDayRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAffectedCalendarDayRecord.
#'
#' This function creates a new TempAffectedCalendarDayRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempAffectedCalendarDayRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAffectedCalendarDayRecord <- function(EntityID = 1, setAction = NULL, setActionCode = NULL, setAffectedPrimaryKey = NULL, setCalendar = NULL, setCalendarID = NULL, setComment = NULL, setCountAs = NULL, setDate = NULL, setDayOfTheWeek = NULL, setEntity = NULL, setFailureReason = NULL, setNewBellSchedule = NULL, setNewCountAs = NULL, setNewDayRotation = NULL, setNewDayRotationID = NULL, setNewFundingPeriod = NULL, setNewFundingPeriodID = NULL, setNewInstructionalMinutesOverride = NULL, setNewOperationalMinutesOverride = NULL, setNewStateCalendarWaiverEventTypeCodeTX = NULL, setNewStateCalendarWaiverEventTypeCodeTXID = NULL, setNewStateSchoolDayEventCodeTX = NULL, setNewStateSchoolDayEventCodeTXID = NULL, setNewUseInstructionalMinutesOverride = NULL, setNewUseOperationalMinutesOverride = NULL, setNewWaiverMinutes = NULL, setOldBellSchedule = NULL, setOldDayRotation = NULL, setOldDayRotationID = NULL, setOldFundingPeriod = NULL, setOldFundingPeriodID = NULL, setOldInstructionalMinutesOverride = NULL, setOldOperationalMinutesOverride = NULL, setOldStateCalendarWaiverEventTypeCodeTX = NULL, setOldStateCalendarWaiverEventTypeCodeTXID = NULL, setOldStateSchoolDayEventCodeTX = NULL, setOldStateSchoolDayEventCodeTXID = NULL, setOldUseInstructionalMinutesOverride = NULL, setOldUseOperationalMinutesOverride = NULL, setOldWaiverMinutes = 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("Attendance", "TempAffectedCalendarDayRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAffectedCalendarDayRecord
#'
#' This function deletes a TempAffectedCalendarDayRecord.
#'
#' @param TempAffectedCalendarDayRecordID The id of the TempAffectedCalendarDayRecord.\cr Run \code{\link{getAllTempAffectedCalendarDayRecords}} for a list of TempAffectedCalendarDayRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempAffectedCalendarDayRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAffectedCalendarDayRecord <- function(TempAffectedCalendarDayRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempAffectedCalendarDayRecord", TempAffectedCalendarDayRecordID, EntityID)
}
#' Get all TempAffectedStudentAttendancePeriodRecords.
#'
#' This function returns a dataframe of all TempAffectedStudentAttendancePeriodRecords 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 Attendance
#' @return All TempAffectedStudentAttendancePeriodRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAffectedStudentAttendancePeriodRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAffectedStudentAttendancePeriodRecordID = F, returnAction = F, returnActionCode = F, returnAffectedPrimaryKey = F, returnAttendanceCategory = F, returnAttendancePeriodID = F, returnAttendanceReasonCodeDescription = F, returnAttendanceReasonID = F, returnAttendanceTypeCodeDescription = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCECEAttendancePeriodID = F, returnCECEAttendanceReasonID = F, returnCECEAttendanceTypeID = F, returnComment = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnEntity = F, returnFailureReason = F, returnFullName = F, returnIsForCECEAttendancePeriod = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnNewStudentSectionCode = F, returnNewStudentSectionID = F, returnOldStudentSectionCode = F, returnOldStudentSectionID = F, returnPeriodCode = F, returnProcessFromCECEEntity = F, returnStudentAttendanceID = F, returnStudentID = F, returnStudentNumber = 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("Attendance", "TempAffectedStudentAttendancePeriodRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAffectedStudentAttendancePeriodRecord
#'
#' This function returns fields for a TempAffectedStudentAttendancePeriodRecord.
#'
#' @param TempAffectedStudentAttendancePeriodRecordID The id of the TempAffectedStudentAttendancePeriodRecord.\cr Run \code{\link{getAllTempAffectedStudentAttendancePeriodRecords}} for a list of TempAffectedStudentAttendancePeriodRecords.
#' @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 Attendance
#' @return Details for the TempAffectedStudentAttendancePeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAffectedStudentAttendancePeriodRecord <- function(TempAffectedStudentAttendancePeriodRecordID, EntityID = 1, returnTempAffectedStudentAttendancePeriodRecordID = F, returnAction = F, returnActionCode = F, returnAffectedPrimaryKey = F, returnAttendanceCategory = F, returnAttendancePeriodID = F, returnAttendanceReasonCodeDescription = F, returnAttendanceReasonID = F, returnAttendanceTypeCodeDescription = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCECEAttendancePeriodID = F, returnCECEAttendanceReasonID = F, returnCECEAttendanceTypeID = F, returnComment = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnEntity = F, returnFailureReason = F, returnFullName = F, returnIsForCECEAttendancePeriod = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnNewStudentSectionCode = F, returnNewStudentSectionID = F, returnOldStudentSectionCode = F, returnOldStudentSectionID = F, returnPeriodCode = F, returnProcessFromCECEEntity = F, returnStudentAttendanceID = F, returnStudentID = F, returnStudentNumber = 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("Attendance", "TempAffectedStudentAttendancePeriodRecord", TempAffectedStudentAttendancePeriodRecordID, searchFields, EntityID)
}
#' Modify a specific TempAffectedStudentAttendancePeriodRecord
#'
#' This function modifies fields for a TempAffectedStudentAttendancePeriodRecord.
#'
#' @param TempAffectedStudentAttendancePeriodRecordID The id of the TempAffectedStudentAttendancePeriodRecord to be modified.\cr Run \code{\link{getAllTempAffectedStudentAttendancePeriodRecords}} for a list of TempAffectedStudentAttendancePeriodRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempAffectedStudentAttendancePeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAffectedStudentAttendancePeriodRecord <- function(TempAffectedStudentAttendancePeriodRecordID, EntityID = 1, setAction = NULL, setActionCode = NULL, setAffectedPrimaryKey = NULL, setAttendanceCategory = NULL, setAttendancePeriodID = NULL, setAttendanceReasonCodeDescription = NULL, setAttendanceReasonID = NULL, setAttendanceTypeCodeDescription = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setCECEAttendancePeriodID = NULL, setCECEAttendanceReasonID = NULL, setCECEAttendanceTypeID = NULL, setComment = NULL, setDate = NULL, setDayRotationCode = NULL, setEntity = NULL, setFailureReason = NULL, setFullName = NULL, setIsForCECEAttendancePeriod = NULL, setIsGuardianNotified = NULL, setNewStudentSectionCode = NULL, setNewStudentSectionID = NULL, setOldStudentSectionCode = NULL, setOldStudentSectionID = NULL, setPeriodCode = NULL, setProcessFromCECEEntity = NULL, setStudentAttendanceID = NULL, setStudentID = NULL, setStudentNumber = 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("Attendance", "TempAffectedStudentAttendancePeriodRecord", TempAffectedStudentAttendancePeriodRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAffectedStudentAttendancePeriodRecord.
#'
#' This function creates a new TempAffectedStudentAttendancePeriodRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempAffectedStudentAttendancePeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAffectedStudentAttendancePeriodRecord <- function(EntityID = 1, setAction = NULL, setActionCode = NULL, setAffectedPrimaryKey = NULL, setAttendanceCategory = NULL, setAttendancePeriodID = NULL, setAttendanceReasonCodeDescription = NULL, setAttendanceReasonID = NULL, setAttendanceTypeCodeDescription = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setCECEAttendancePeriodID = NULL, setCECEAttendanceReasonID = NULL, setCECEAttendanceTypeID = NULL, setComment = NULL, setDate = NULL, setDayRotationCode = NULL, setEntity = NULL, setFailureReason = NULL, setFullName = NULL, setIsForCECEAttendancePeriod = NULL, setIsGuardianNotified = NULL, setNewStudentSectionCode = NULL, setNewStudentSectionID = NULL, setOldStudentSectionCode = NULL, setOldStudentSectionID = NULL, setPeriodCode = NULL, setProcessFromCECEEntity = NULL, setStudentAttendanceID = NULL, setStudentID = NULL, setStudentNumber = 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("Attendance", "TempAffectedStudentAttendancePeriodRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAffectedStudentAttendancePeriodRecord
#'
#' This function deletes a TempAffectedStudentAttendancePeriodRecord.
#'
#' @param TempAffectedStudentAttendancePeriodRecordID The id of the TempAffectedStudentAttendancePeriodRecord.\cr Run \code{\link{getAllTempAffectedStudentAttendancePeriodRecords}} for a list of TempAffectedStudentAttendancePeriodRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempAffectedStudentAttendancePeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAffectedStudentAttendancePeriodRecord <- function(TempAffectedStudentAttendancePeriodRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempAffectedStudentAttendancePeriodRecord", TempAffectedStudentAttendancePeriodRecordID, EntityID)
}
#' Get all TempAffectedStudentAttendanceRecords.
#'
#' This function returns a dataframe of all TempAffectedStudentAttendanceRecords 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 Attendance
#' @return All TempAffectedStudentAttendanceRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAffectedStudentAttendanceRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAffectedStudentAttendanceRecordID = F, returnAffectedPrimaryKey = F, returnCalendarDayID = F, returnComment = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnFailedStudentAttendancePeriods = F, returnFailureReason = F, returnFullName = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnNewDaysAbsent = F, returnNewDaysExcused = F, returnNewDaysOther = F, returnNewDaysUnexcused = F, returnNewGuardianNotified = F, returnNewStudentAttendancePeriods = F, returnNewTardyCount = F, returnOldDaysAbsent = F, returnOldDaysExcused = F, returnOldDaysOther = F, returnOldDaysUnexcused = F, returnOldStudentAttendancePeriods = F, returnOldTardyCount = F, returnPreviousGuardianNotified = F, returnStudentID = F, returnStudentNumber = 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("Attendance", "TempAffectedStudentAttendanceRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAffectedStudentAttendanceRecord
#'
#' This function returns fields for a TempAffectedStudentAttendanceRecord.
#'
#' @param TempAffectedStudentAttendanceRecordID The id of the TempAffectedStudentAttendanceRecord.\cr Run \code{\link{getAllTempAffectedStudentAttendanceRecords}} for a list of TempAffectedStudentAttendanceRecords.
#' @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 Attendance
#' @return Details for the TempAffectedStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAffectedStudentAttendanceRecord <- function(TempAffectedStudentAttendanceRecordID, EntityID = 1, returnTempAffectedStudentAttendanceRecordID = F, returnAffectedPrimaryKey = F, returnCalendarDayID = F, returnComment = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnFailedStudentAttendancePeriods = F, returnFailureReason = F, returnFullName = F, returnIsGuardianNotified = F, returnModifiedTime = F, returnNewDaysAbsent = F, returnNewDaysExcused = F, returnNewDaysOther = F, returnNewDaysUnexcused = F, returnNewGuardianNotified = F, returnNewStudentAttendancePeriods = F, returnNewTardyCount = F, returnOldDaysAbsent = F, returnOldDaysExcused = F, returnOldDaysOther = F, returnOldDaysUnexcused = F, returnOldStudentAttendancePeriods = F, returnOldTardyCount = F, returnPreviousGuardianNotified = F, returnStudentID = F, returnStudentNumber = 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("Attendance", "TempAffectedStudentAttendanceRecord", TempAffectedStudentAttendanceRecordID, searchFields, EntityID)
}
#' Modify a specific TempAffectedStudentAttendanceRecord
#'
#' This function modifies fields for a TempAffectedStudentAttendanceRecord.
#'
#' @param TempAffectedStudentAttendanceRecordID The id of the TempAffectedStudentAttendanceRecord to be modified.\cr Run \code{\link{getAllTempAffectedStudentAttendanceRecords}} for a list of TempAffectedStudentAttendanceRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempAffectedStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAffectedStudentAttendanceRecord <- function(TempAffectedStudentAttendanceRecordID, EntityID = 1, setAffectedPrimaryKey = NULL, setCalendarDayID = NULL, setComment = NULL, setDate = NULL, setDayRotationCode = NULL, setFailedStudentAttendancePeriods = NULL, setFailureReason = NULL, setFullName = NULL, setIsGuardianNotified = NULL, setNewDaysAbsent = NULL, setNewDaysExcused = NULL, setNewDaysOther = NULL, setNewDaysUnexcused = NULL, setNewGuardianNotified = NULL, setNewStudentAttendancePeriods = NULL, setNewTardyCount = NULL, setOldDaysAbsent = NULL, setOldDaysExcused = NULL, setOldDaysOther = NULL, setOldDaysUnexcused = NULL, setOldStudentAttendancePeriods = NULL, setOldTardyCount = NULL, setPreviousGuardianNotified = NULL, setStudentID = NULL, setStudentNumber = 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("Attendance", "TempAffectedStudentAttendanceRecord", TempAffectedStudentAttendanceRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAffectedStudentAttendanceRecord.
#'
#' This function creates a new TempAffectedStudentAttendanceRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempAffectedStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAffectedStudentAttendanceRecord <- function(EntityID = 1, setAffectedPrimaryKey = NULL, setCalendarDayID = NULL, setComment = NULL, setDate = NULL, setDayRotationCode = NULL, setFailedStudentAttendancePeriods = NULL, setFailureReason = NULL, setFullName = NULL, setIsGuardianNotified = NULL, setNewDaysAbsent = NULL, setNewDaysExcused = NULL, setNewDaysOther = NULL, setNewDaysUnexcused = NULL, setNewGuardianNotified = NULL, setNewStudentAttendancePeriods = NULL, setNewTardyCount = NULL, setOldDaysAbsent = NULL, setOldDaysExcused = NULL, setOldDaysOther = NULL, setOldDaysUnexcused = NULL, setOldStudentAttendancePeriods = NULL, setOldTardyCount = NULL, setPreviousGuardianNotified = NULL, setStudentID = NULL, setStudentNumber = 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("Attendance", "TempAffectedStudentAttendanceRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAffectedStudentAttendanceRecord
#'
#' This function deletes a TempAffectedStudentAttendanceRecord.
#'
#' @param TempAffectedStudentAttendanceRecordID The id of the TempAffectedStudentAttendanceRecord.\cr Run \code{\link{getAllTempAffectedStudentAttendanceRecords}} for a list of TempAffectedStudentAttendanceRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempAffectedStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAffectedStudentAttendanceRecord <- function(TempAffectedStudentAttendanceRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempAffectedStudentAttendanceRecord", TempAffectedStudentAttendanceRecordID, EntityID)
}
#' Get all TempAttendanceTerms.
#'
#' This function returns a dataframe of all TempAttendanceTerms 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 Attendance
#' @return All TempAttendanceTerms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempAttendanceTerms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempAttendanceTermID = F, returnAttendanceTermCode = F, returnAttendanceTermID = F, returnCalendarCode = F, returnCalendarEndDate = F, returnCalendarID = F, returnCalendarStartDate = F, returnCreatedTime = F, returnEndDate = F, returnIsUpdated = F, returnModifiedTime = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnProcessAction = F, returnProcessActionCode = 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("Attendance", "TempAttendanceTerm", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempAttendanceTerm
#'
#' This function returns fields for a TempAttendanceTerm.
#'
#' @param TempAttendanceTermID The id of the TempAttendanceTerm.\cr Run \code{\link{getAllTempAttendanceTerms}} for a list of TempAttendanceTerms.
#' @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 Attendance
#' @return Details for the TempAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempAttendanceTerm <- function(TempAttendanceTermID, EntityID = 1, returnTempAttendanceTermID = F, returnAttendanceTermCode = F, returnAttendanceTermID = F, returnCalendarCode = F, returnCalendarEndDate = F, returnCalendarID = F, returnCalendarStartDate = F, returnCreatedTime = F, returnEndDate = F, returnIsUpdated = F, returnModifiedTime = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnProcessAction = F, returnProcessActionCode = 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("Attendance", "TempAttendanceTerm", TempAttendanceTermID, searchFields, EntityID)
}
#' Modify a specific TempAttendanceTerm
#'
#' This function modifies fields for a TempAttendanceTerm.
#'
#' @param TempAttendanceTermID The id of the TempAttendanceTerm to be modified.\cr Run \code{\link{getAllTempAttendanceTerms}} for a list of TempAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempAttendanceTerm <- function(TempAttendanceTermID, EntityID = 1, setAttendanceTermCode = NULL, setAttendanceTermID = NULL, setCalendarCode = NULL, setCalendarEndDate = NULL, setCalendarID = NULL, setCalendarStartDate = NULL, setEndDate = NULL, setIsUpdated = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setProcessAction = NULL, setProcessActionCode = 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("Attendance", "TempAttendanceTerm", TempAttendanceTermID, names(functionParams), functionParams, EntityID)
}
#' Create new TempAttendanceTerm.
#'
#' This function creates a new TempAttendanceTerm.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempAttendanceTerm <- function(EntityID = 1, setAttendanceTermCode = NULL, setAttendanceTermID = NULL, setCalendarCode = NULL, setCalendarEndDate = NULL, setCalendarID = NULL, setCalendarStartDate = NULL, setEndDate = NULL, setIsUpdated = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setProcessAction = NULL, setProcessActionCode = 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("Attendance", "TempAttendanceTerm", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempAttendanceTerm
#'
#' This function deletes a TempAttendanceTerm.
#'
#' @param TempAttendanceTermID The id of the TempAttendanceTerm.\cr Run \code{\link{getAllTempAttendanceTerms}} for a list of TempAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempAttendanceTerm <- function(TempAttendanceTermID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempAttendanceTerm", TempAttendanceTermID, EntityID)
}
#' Get all TempBellScheduleGroupBellSchedules.
#'
#' This function returns a dataframe of all TempBellScheduleGroupBellSchedules 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 Attendance
#' @return All TempBellScheduleGroupBellSchedules in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempBellScheduleGroupBellSchedules <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupCodeDescription = F, returnBellScheduleGroupID = F, returnBellScheduleID = F, returnCreatedTime = F, returnIsDefault = F, returnModifiedTime = F, returnShouldUpdate = 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("Attendance", "TempBellScheduleGroupBellSchedule", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempBellScheduleGroupBellSchedule
#'
#' This function returns fields for a TempBellScheduleGroupBellSchedule.
#'
#' @param TempBellScheduleGroupBellScheduleID The id of the TempBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllTempBellScheduleGroupBellSchedules}} for a list of TempBellScheduleGroupBellSchedules.
#' @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 Attendance
#' @return Details for the TempBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempBellScheduleGroupBellSchedule <- function(TempBellScheduleGroupBellScheduleID, EntityID = 1, returnTempBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupCodeDescription = F, returnBellScheduleGroupID = F, returnBellScheduleID = F, returnCreatedTime = F, returnIsDefault = F, returnModifiedTime = F, returnShouldUpdate = 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("Attendance", "TempBellScheduleGroupBellSchedule", TempBellScheduleGroupBellScheduleID, searchFields, EntityID)
}
#' Modify a specific TempBellScheduleGroupBellSchedule
#'
#' This function modifies fields for a TempBellScheduleGroupBellSchedule.
#'
#' @param TempBellScheduleGroupBellScheduleID The id of the TempBellScheduleGroupBellSchedule to be modified.\cr Run \code{\link{getAllTempBellScheduleGroupBellSchedules}} for a list of TempBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempBellScheduleGroupBellSchedule <- function(TempBellScheduleGroupBellScheduleID, EntityID = 1, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupCodeDescription = NULL, setBellScheduleGroupID = NULL, setBellScheduleID = NULL, setIsDefault = NULL, setShouldUpdate = 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("Attendance", "TempBellScheduleGroupBellSchedule", TempBellScheduleGroupBellScheduleID, names(functionParams), functionParams, EntityID)
}
#' Create new TempBellScheduleGroupBellSchedule.
#'
#' This function creates a new TempBellScheduleGroupBellSchedule.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempBellScheduleGroupBellSchedule <- function(EntityID = 1, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupCodeDescription = NULL, setBellScheduleGroupID = NULL, setBellScheduleID = NULL, setIsDefault = NULL, setShouldUpdate = 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("Attendance", "TempBellScheduleGroupBellSchedule", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempBellScheduleGroupBellSchedule
#'
#' This function deletes a TempBellScheduleGroupBellSchedule.
#'
#' @param TempBellScheduleGroupBellScheduleID The id of the TempBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllTempBellScheduleGroupBellSchedules}} for a list of TempBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempBellScheduleGroupBellSchedule <- function(TempBellScheduleGroupBellScheduleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempBellScheduleGroupBellSchedule", TempBellScheduleGroupBellScheduleID, EntityID)
}
#' Get all TempCalendars.
#'
#' This function returns a dataframe of all TempCalendars 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 Attendance
#' @return All TempCalendars in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalendars <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalendarID = F, returnAffectedPrimaryKey = F, returnCalendarID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnEndDate = F, returnIsDefault = F, returnIsUpdated = F, returnModifiedTime = F, returnNewEndDate = F, returnNewStartDate = F, returnOldEndDate = F, returnOldStartDate = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnProcessAction = F, returnProcessActionCode = 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("Attendance", "TempCalendar", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalendar
#'
#' This function returns fields for a TempCalendar.
#'
#' @param TempCalendarID The id of the TempCalendar.\cr Run \code{\link{getAllTempCalendars}} for a list of TempCalendars.
#' @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 Attendance
#' @return Details for the TempCalendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalendar <- function(TempCalendarID, EntityID = 1, returnTempCalendarID = F, returnAffectedPrimaryKey = F, returnCalendarID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnEndDate = F, returnIsDefault = F, returnIsUpdated = F, returnModifiedTime = F, returnNewEndDate = F, returnNewStartDate = F, returnOldEndDate = F, returnOldStartDate = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnProcessAction = F, returnProcessActionCode = 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("Attendance", "TempCalendar", TempCalendarID, searchFields, EntityID)
}
#' Modify a specific TempCalendar
#'
#' This function modifies fields for a TempCalendar.
#'
#' @param TempCalendarID The id of the TempCalendar to be modified.\cr Run \code{\link{getAllTempCalendars}} for a list of TempCalendars.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCalendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalendar <- function(TempCalendarID, EntityID = 1, setAffectedPrimaryKey = NULL, setCalendarID = NULL, setCode = NULL, setCodeDescription = NULL, setEndDate = NULL, setIsDefault = NULL, setIsUpdated = NULL, setNewEndDate = NULL, setNewStartDate = NULL, setOldEndDate = NULL, setOldStartDate = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setProcessAction = NULL, setProcessActionCode = 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("Attendance", "TempCalendar", TempCalendarID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalendar.
#'
#' This function creates a new TempCalendar.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCalendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalendar <- function(EntityID = 1, setAffectedPrimaryKey = NULL, setCalendarID = NULL, setCode = NULL, setCodeDescription = NULL, setEndDate = NULL, setIsDefault = NULL, setIsUpdated = NULL, setNewEndDate = NULL, setNewStartDate = NULL, setOldEndDate = NULL, setOldStartDate = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setProcessAction = NULL, setProcessActionCode = 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("Attendance", "TempCalendar", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalendar
#'
#' This function deletes a TempCalendar.
#'
#' @param TempCalendarID The id of the TempCalendar.\cr Run \code{\link{getAllTempCalendars}} for a list of TempCalendars.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCalendar.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalendar <- function(TempCalendarID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCalendar", TempCalendarID, EntityID)
}
#' Get all TempCalendarAttendanceTerms.
#'
#' This function returns a dataframe of all TempCalendarAttendanceTerms 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 Attendance
#' @return All TempCalendarAttendanceTerms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalendarAttendanceTerms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalendarAttendanceTermID = F, returnAttendanceTermID = F, returnCalendarID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnEndDate = F, returnModifiedTime = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnStartDate = F, returnTableType = F, returnTableTypeCode = F, returnTableTypeString = 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("Attendance", "TempCalendarAttendanceTerm", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalendarAttendanceTerm
#'
#' This function returns fields for a TempCalendarAttendanceTerm.
#'
#' @param TempCalendarAttendanceTermID The id of the TempCalendarAttendanceTerm.\cr Run \code{\link{getAllTempCalendarAttendanceTerms}} for a list of TempCalendarAttendanceTerms.
#' @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 Attendance
#' @return Details for the TempCalendarAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalendarAttendanceTerm <- function(TempCalendarAttendanceTermID, EntityID = 1, returnTempCalendarAttendanceTermID = F, returnAttendanceTermID = F, returnCalendarID = F, returnCode = F, returnCodeDescription = F, returnCreatedTime = F, returnEndDate = F, returnModifiedTime = F, returnOriginalEndDate = F, returnOriginalStartDate = F, returnStartDate = F, returnTableType = F, returnTableTypeCode = F, returnTableTypeString = 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("Attendance", "TempCalendarAttendanceTerm", TempCalendarAttendanceTermID, searchFields, EntityID)
}
#' Modify a specific TempCalendarAttendanceTerm
#'
#' This function modifies fields for a TempCalendarAttendanceTerm.
#'
#' @param TempCalendarAttendanceTermID The id of the TempCalendarAttendanceTerm to be modified.\cr Run \code{\link{getAllTempCalendarAttendanceTerms}} for a list of TempCalendarAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCalendarAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalendarAttendanceTerm <- function(TempCalendarAttendanceTermID, EntityID = 1, setAttendanceTermID = NULL, setCalendarID = NULL, setCode = NULL, setCodeDescription = NULL, setEndDate = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setStartDate = NULL, setTableType = NULL, setTableTypeCode = 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("Attendance", "TempCalendarAttendanceTerm", TempCalendarAttendanceTermID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalendarAttendanceTerm.
#'
#' This function creates a new TempCalendarAttendanceTerm.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCalendarAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalendarAttendanceTerm <- function(EntityID = 1, setAttendanceTermID = NULL, setCalendarID = NULL, setCode = NULL, setCodeDescription = NULL, setEndDate = NULL, setOriginalEndDate = NULL, setOriginalStartDate = NULL, setStartDate = NULL, setTableType = NULL, setTableTypeCode = 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("Attendance", "TempCalendarAttendanceTerm", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalendarAttendanceTerm
#'
#' This function deletes a TempCalendarAttendanceTerm.
#'
#' @param TempCalendarAttendanceTermID The id of the TempCalendarAttendanceTerm.\cr Run \code{\link{getAllTempCalendarAttendanceTerms}} for a list of TempCalendarAttendanceTerms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCalendarAttendanceTerm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalendarAttendanceTerm <- function(TempCalendarAttendanceTermID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCalendarAttendanceTerm", TempCalendarAttendanceTermID, EntityID)
}
#' Get all TempCalendarDayBellScheduleGroupBellSchedules.
#'
#' This function returns a dataframe of all TempCalendarDayBellScheduleGroupBellSchedules 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 Attendance
#' @return All TempCalendarDayBellScheduleGroupBellSchedules in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalendarDayBellScheduleGroupBellSchedules <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalendarDayBellScheduleGroupBellScheduleID = F, returnBellScheduleDescription = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupCodeDescription = F, returnBellScheduleGroupID = F, returnBellScheduleID = F, returnCalendar = F, returnCalendarDayID = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnExistingBellScheduleCode = F, returnExistingBellScheduleGroupBellScheduleID = F, returnExistingCalendarDayBellScheduleGroupBellScheduleID = F, returnIsDefault = F, returnModifiedTime = F, returnUpdateBellSchedule = 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("Attendance", "TempCalendarDayBellScheduleGroupBellSchedule", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalendarDayBellScheduleGroupBellSchedule
#'
#' This function returns fields for a TempCalendarDayBellScheduleGroupBellSchedule.
#'
#' @param TempCalendarDayBellScheduleGroupBellScheduleID The id of the TempCalendarDayBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllTempCalendarDayBellScheduleGroupBellSchedules}} for a list of TempCalendarDayBellScheduleGroupBellSchedules.
#' @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 Attendance
#' @return Details for the TempCalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalendarDayBellScheduleGroupBellSchedule <- function(TempCalendarDayBellScheduleGroupBellScheduleID, EntityID = 1, returnTempCalendarDayBellScheduleGroupBellScheduleID = F, returnBellScheduleDescription = F, returnBellScheduleGroupBellScheduleID = F, returnBellScheduleGroupCodeDescription = F, returnBellScheduleGroupID = F, returnBellScheduleID = F, returnCalendar = F, returnCalendarDayID = F, returnCountAs = F, returnCreatedTime = F, returnDate = F, returnDayRotationCode = F, returnExistingBellScheduleCode = F, returnExistingBellScheduleGroupBellScheduleID = F, returnExistingCalendarDayBellScheduleGroupBellScheduleID = F, returnIsDefault = F, returnModifiedTime = F, returnUpdateBellSchedule = 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("Attendance", "TempCalendarDayBellScheduleGroupBellSchedule", TempCalendarDayBellScheduleGroupBellScheduleID, searchFields, EntityID)
}
#' Modify a specific TempCalendarDayBellScheduleGroupBellSchedule
#'
#' This function modifies fields for a TempCalendarDayBellScheduleGroupBellSchedule.
#'
#' @param TempCalendarDayBellScheduleGroupBellScheduleID The id of the TempCalendarDayBellScheduleGroupBellSchedule to be modified.\cr Run \code{\link{getAllTempCalendarDayBellScheduleGroupBellSchedules}} for a list of TempCalendarDayBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalendarDayBellScheduleGroupBellSchedule <- function(TempCalendarDayBellScheduleGroupBellScheduleID, EntityID = 1, setBellScheduleDescription = NULL, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupCodeDescription = NULL, setBellScheduleGroupID = NULL, setBellScheduleID = NULL, setCalendar = NULL, setCalendarDayID = NULL, setCountAs = NULL, setDate = NULL, setDayRotationCode = NULL, setExistingBellScheduleCode = NULL, setExistingBellScheduleGroupBellScheduleID = NULL, setExistingCalendarDayBellScheduleGroupBellScheduleID = NULL, setIsDefault = NULL, setUpdateBellSchedule = 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("Attendance", "TempCalendarDayBellScheduleGroupBellSchedule", TempCalendarDayBellScheduleGroupBellScheduleID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalendarDayBellScheduleGroupBellSchedule.
#'
#' This function creates a new TempCalendarDayBellScheduleGroupBellSchedule.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalendarDayBellScheduleGroupBellSchedule <- function(EntityID = 1, setBellScheduleDescription = NULL, setBellScheduleGroupBellScheduleID = NULL, setBellScheduleGroupCodeDescription = NULL, setBellScheduleGroupID = NULL, setBellScheduleID = NULL, setCalendar = NULL, setCalendarDayID = NULL, setCountAs = NULL, setDate = NULL, setDayRotationCode = NULL, setExistingBellScheduleCode = NULL, setExistingBellScheduleGroupBellScheduleID = NULL, setExistingCalendarDayBellScheduleGroupBellScheduleID = NULL, setIsDefault = NULL, setUpdateBellSchedule = 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("Attendance", "TempCalendarDayBellScheduleGroupBellSchedule", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalendarDayBellScheduleGroupBellSchedule
#'
#' This function deletes a TempCalendarDayBellScheduleGroupBellSchedule.
#'
#' @param TempCalendarDayBellScheduleGroupBellScheduleID The id of the TempCalendarDayBellScheduleGroupBellSchedule.\cr Run \code{\link{getAllTempCalendarDayBellScheduleGroupBellSchedules}} for a list of TempCalendarDayBellScheduleGroupBellSchedules.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCalendarDayBellScheduleGroupBellSchedule.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalendarDayBellScheduleGroupBellSchedule <- function(TempCalendarDayBellScheduleGroupBellScheduleID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCalendarDayBellScheduleGroupBellSchedule", TempCalendarDayBellScheduleGroupBellScheduleID, EntityID)
}
#' Get all TempCalendarDayCalendarEventRecords.
#'
#' This function returns a dataframe of all TempCalendarDayCalendarEventRecords 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 Attendance
#' @return All TempCalendarDayCalendarEventRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCalendarDayCalendarEventRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCalendarDayCalendarEventRecordID = F, returnCalendar = F, returnCalendarDayID = F, returnCalendarEvent = F, returnCalendarEventID = F, returnCreatedTime = F, returnDate = F, returnFailureReason = 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("Attendance", "TempCalendarDayCalendarEventRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCalendarDayCalendarEventRecord
#'
#' This function returns fields for a TempCalendarDayCalendarEventRecord.
#'
#' @param TempCalendarDayCalendarEventRecordID The id of the TempCalendarDayCalendarEventRecord.\cr Run \code{\link{getAllTempCalendarDayCalendarEventRecords}} for a list of TempCalendarDayCalendarEventRecords.
#' @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 Attendance
#' @return Details for the TempCalendarDayCalendarEventRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCalendarDayCalendarEventRecord <- function(TempCalendarDayCalendarEventRecordID, EntityID = 1, returnTempCalendarDayCalendarEventRecordID = F, returnCalendar = F, returnCalendarDayID = F, returnCalendarEvent = F, returnCalendarEventID = F, returnCreatedTime = F, returnDate = F, returnFailureReason = 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("Attendance", "TempCalendarDayCalendarEventRecord", TempCalendarDayCalendarEventRecordID, searchFields, EntityID)
}
#' Modify a specific TempCalendarDayCalendarEventRecord
#'
#' This function modifies fields for a TempCalendarDayCalendarEventRecord.
#'
#' @param TempCalendarDayCalendarEventRecordID The id of the TempCalendarDayCalendarEventRecord to be modified.\cr Run \code{\link{getAllTempCalendarDayCalendarEventRecords}} for a list of TempCalendarDayCalendarEventRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCalendarDayCalendarEventRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCalendarDayCalendarEventRecord <- function(TempCalendarDayCalendarEventRecordID, EntityID = 1, setCalendar = NULL, setCalendarDayID = NULL, setCalendarEvent = NULL, setCalendarEventID = NULL, setDate = NULL, setFailureReason = 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("Attendance", "TempCalendarDayCalendarEventRecord", TempCalendarDayCalendarEventRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCalendarDayCalendarEventRecord.
#'
#' This function creates a new TempCalendarDayCalendarEventRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCalendarDayCalendarEventRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCalendarDayCalendarEventRecord <- function(EntityID = 1, setCalendar = NULL, setCalendarDayID = NULL, setCalendarEvent = NULL, setCalendarEventID = NULL, setDate = NULL, setFailureReason = 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("Attendance", "TempCalendarDayCalendarEventRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCalendarDayCalendarEventRecord
#'
#' This function deletes a TempCalendarDayCalendarEventRecord.
#'
#' @param TempCalendarDayCalendarEventRecordID The id of the TempCalendarDayCalendarEventRecord.\cr Run \code{\link{getAllTempCalendarDayCalendarEventRecords}} for a list of TempCalendarDayCalendarEventRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCalendarDayCalendarEventRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCalendarDayCalendarEventRecord <- function(TempCalendarDayCalendarEventRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCalendarDayCalendarEventRecord", TempCalendarDayCalendarEventRecordID, EntityID)
}
#' Get all TempCloneCalendarErrors.
#'
#' This function returns a dataframe of all TempCloneCalendarErrors 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 Attendance
#' @return All TempCloneCalendarErrors in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCloneCalendarErrors <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCloneCalendarErrorID = F, returnCreatedTime = F, returnDescription = F, returnEntityName = F, returnFailureReason = F, returnModifiedTime = F, returnRecordType = F, returnRecordTypeCode = 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("Attendance", "TempCloneCalendarError", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCloneCalendarError
#'
#' This function returns fields for a TempCloneCalendarError.
#'
#' @param TempCloneCalendarErrorID The id of the TempCloneCalendarError.\cr Run \code{\link{getAllTempCloneCalendarErrors}} for a list of TempCloneCalendarErrors.
#' @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 Attendance
#' @return Details for the TempCloneCalendarError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCloneCalendarError <- function(TempCloneCalendarErrorID, EntityID = 1, returnTempCloneCalendarErrorID = F, returnCreatedTime = F, returnDescription = F, returnEntityName = F, returnFailureReason = F, returnModifiedTime = F, returnRecordType = F, returnRecordTypeCode = 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("Attendance", "TempCloneCalendarError", TempCloneCalendarErrorID, searchFields, EntityID)
}
#' Modify a specific TempCloneCalendarError
#'
#' This function modifies fields for a TempCloneCalendarError.
#'
#' @param TempCloneCalendarErrorID The id of the TempCloneCalendarError to be modified.\cr Run \code{\link{getAllTempCloneCalendarErrors}} for a list of TempCloneCalendarErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCloneCalendarError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCloneCalendarError <- function(TempCloneCalendarErrorID, EntityID = 1, setDescription = NULL, setEntityName = NULL, setFailureReason = NULL, setRecordType = NULL, setRecordTypeCode = 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("Attendance", "TempCloneCalendarError", TempCloneCalendarErrorID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCloneCalendarError.
#'
#' This function creates a new TempCloneCalendarError.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCloneCalendarError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCloneCalendarError <- function(EntityID = 1, setDescription = NULL, setEntityName = NULL, setFailureReason = NULL, setRecordType = NULL, setRecordTypeCode = 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("Attendance", "TempCloneCalendarError", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCloneCalendarError
#'
#' This function deletes a TempCloneCalendarError.
#'
#' @param TempCloneCalendarErrorID The id of the TempCloneCalendarError.\cr Run \code{\link{getAllTempCloneCalendarErrors}} for a list of TempCloneCalendarErrors.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCloneCalendarError.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCloneCalendarError <- function(TempCloneCalendarErrorID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCloneCalendarError", TempCloneCalendarErrorID, EntityID)
}
#' Get all TempCloneCalendarRecords.
#'
#' This function returns a dataframe of all TempCloneCalendarRecords 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 Attendance
#' @return All TempCloneCalendarRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempCloneCalendarRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempCloneCalendarRecordID = F, returnAffectedPrimaryKey = F, returnAttendanceCalculationMethod = F, returnAttendanceCalculationMethodCode = F, returnCode = F, returnCreatedTime = F, returnDefaultDayLengthMinutes = F, returnDescription = F, returnEndDate = F, returnEntity = F, returnEntityID = F, returnHalfDayHighPeriodCount = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnStartDate = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZeroDayHighPeriodCount = 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("Attendance", "TempCloneCalendarRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempCloneCalendarRecord
#'
#' This function returns fields for a TempCloneCalendarRecord.
#'
#' @param TempCloneCalendarRecordID The id of the TempCloneCalendarRecord.\cr Run \code{\link{getAllTempCloneCalendarRecords}} for a list of TempCloneCalendarRecords.
#' @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 Attendance
#' @return Details for the TempCloneCalendarRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempCloneCalendarRecord <- function(TempCloneCalendarRecordID, EntityID = 1, returnTempCloneCalendarRecordID = F, returnAffectedPrimaryKey = F, returnAttendanceCalculationMethod = F, returnAttendanceCalculationMethodCode = F, returnCode = F, returnCreatedTime = F, returnDefaultDayLengthMinutes = F, returnDescription = F, returnEndDate = F, returnEntity = F, returnEntityID = F, returnHalfDayHighPeriodCount = F, returnIsDefault = F, returnModifiedTime = F, returnSchoolYearID = F, returnStartDate = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnZeroDayHighPeriodCount = 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("Attendance", "TempCloneCalendarRecord", TempCloneCalendarRecordID, searchFields, EntityID)
}
#' Modify a specific TempCloneCalendarRecord
#'
#' This function modifies fields for a TempCloneCalendarRecord.
#'
#' @param TempCloneCalendarRecordID The id of the TempCloneCalendarRecord to be modified.\cr Run \code{\link{getAllTempCloneCalendarRecords}} for a list of TempCloneCalendarRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempCloneCalendarRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempCloneCalendarRecord <- function(TempCloneCalendarRecordID, EntityID = 1, setAffectedPrimaryKey = NULL, setAttendanceCalculationMethod = NULL, setAttendanceCalculationMethodCode = NULL, setCode = NULL, setDefaultDayLengthMinutes = NULL, setDescription = NULL, setEndDate = NULL, setEntity = NULL, setEntityID = NULL, setHalfDayHighPeriodCount = NULL, setIsDefault = NULL, setSchoolYearID = NULL, setStartDate = NULL, setZeroDayHighPeriodCount = 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("Attendance", "TempCloneCalendarRecord", TempCloneCalendarRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempCloneCalendarRecord.
#'
#' This function creates a new TempCloneCalendarRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempCloneCalendarRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempCloneCalendarRecord <- function(EntityID = 1, setAffectedPrimaryKey = NULL, setAttendanceCalculationMethod = NULL, setAttendanceCalculationMethodCode = NULL, setCode = NULL, setDefaultDayLengthMinutes = NULL, setDescription = NULL, setEndDate = NULL, setEntity = NULL, setEntityID = NULL, setHalfDayHighPeriodCount = NULL, setIsDefault = NULL, setSchoolYearID = NULL, setStartDate = NULL, setZeroDayHighPeriodCount = 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("Attendance", "TempCloneCalendarRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempCloneCalendarRecord
#'
#' This function deletes a TempCloneCalendarRecord.
#'
#' @param TempCloneCalendarRecordID The id of the TempCloneCalendarRecord.\cr Run \code{\link{getAllTempCloneCalendarRecords}} for a list of TempCloneCalendarRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempCloneCalendarRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempCloneCalendarRecord <- function(TempCloneCalendarRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempCloneCalendarRecord", TempCloneCalendarRecordID, EntityID)
}
#' Get all TempStudentAttendanceRecords.
#'
#' This function returns a dataframe of all TempStudentAttendanceRecords 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 Attendance
#' @return All TempStudentAttendanceRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempStudentAttendanceRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempStudentAttendanceRecordID = F, returnAffectedPrimaryKey = F, returnAttendanceTakenByPeriod = F, returnCreatedTime = F, returnDate = F, returnDayOfTheWeek = F, returnDayRotation = F, returnDayRotationID = F, returnGuardianNotified = F, returnModifiedTime = F, returnStudentName = F, returnStudentNumber = 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("Attendance", "TempStudentAttendanceRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempStudentAttendanceRecord
#'
#' This function returns fields for a TempStudentAttendanceRecord.
#'
#' @param TempStudentAttendanceRecordID The id of the TempStudentAttendanceRecord.\cr Run \code{\link{getAllTempStudentAttendanceRecords}} for a list of TempStudentAttendanceRecords.
#' @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 Attendance
#' @return Details for the TempStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempStudentAttendanceRecord <- function(TempStudentAttendanceRecordID, EntityID = 1, returnTempStudentAttendanceRecordID = F, returnAffectedPrimaryKey = F, returnAttendanceTakenByPeriod = F, returnCreatedTime = F, returnDate = F, returnDayOfTheWeek = F, returnDayRotation = F, returnDayRotationID = F, returnGuardianNotified = F, returnModifiedTime = F, returnStudentName = F, returnStudentNumber = 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("Attendance", "TempStudentAttendanceRecord", TempStudentAttendanceRecordID, searchFields, EntityID)
}
#' Modify a specific TempStudentAttendanceRecord
#'
#' This function modifies fields for a TempStudentAttendanceRecord.
#'
#' @param TempStudentAttendanceRecordID The id of the TempStudentAttendanceRecord to be modified.\cr Run \code{\link{getAllTempStudentAttendanceRecords}} for a list of TempStudentAttendanceRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempStudentAttendanceRecord <- function(TempStudentAttendanceRecordID, EntityID = 1, setAffectedPrimaryKey = NULL, setAttendanceTakenByPeriod = NULL, setDate = NULL, setDayOfTheWeek = NULL, setDayRotation = NULL, setDayRotationID = NULL, setGuardianNotified = NULL, setStudentName = NULL, setStudentNumber = 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("Attendance", "TempStudentAttendanceRecord", TempStudentAttendanceRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempStudentAttendanceRecord.
#'
#' This function creates a new TempStudentAttendanceRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempStudentAttendanceRecord <- function(EntityID = 1, setAffectedPrimaryKey = NULL, setAttendanceTakenByPeriod = NULL, setDate = NULL, setDayOfTheWeek = NULL, setDayRotation = NULL, setDayRotationID = NULL, setGuardianNotified = NULL, setStudentName = NULL, setStudentNumber = 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("Attendance", "TempStudentAttendanceRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempStudentAttendanceRecord
#'
#' This function deletes a TempStudentAttendanceRecord.
#'
#' @param TempStudentAttendanceRecordID The id of the TempStudentAttendanceRecord.\cr Run \code{\link{getAllTempStudentAttendanceRecords}} for a list of TempStudentAttendanceRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempStudentAttendanceRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempStudentAttendanceRecord <- function(TempStudentAttendanceRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempStudentAttendanceRecord", TempStudentAttendanceRecordID, EntityID)
}
#' Get all TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords.
#'
#' This function returns a dataframe of all TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords 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 Attendance
#' @return All TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempStudentDisciplineThresholdAttendanceReportRunHistoryRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = F, returnCountType = F, returnCountTypeCode = F, returnCreatedTime = F, returnDateHigh = F, returnDateLow = F, returnDateType = F, returnDateTypeCode = F, returnDayCountType = F, returnDayCountTypeCode = F, returnDisciplineThresholdID = F, returnModifiedTime = F, returnNumberOfDays = F, returnResetRangeAttendanceTypes = F, returnStudentID = F, returnStudentName = F, returnThresholdValue = 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("Attendance", "TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord
#'
#' This function returns fields for a TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#'
#' @param TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID The id of the TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.\cr Run \code{\link{getAllTempStudentDisciplineThresholdAttendanceReportRunHistoryRecords}} for a list of TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords.
#' @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 Attendance
#' @return Details for the TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempStudentDisciplineThresholdAttendanceReportRunHistoryRecord <- function(TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, EntityID = 1, returnTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = F, returnCountType = F, returnCountTypeCode = F, returnCreatedTime = F, returnDateHigh = F, returnDateLow = F, returnDateType = F, returnDateTypeCode = F, returnDayCountType = F, returnDayCountTypeCode = F, returnDisciplineThresholdID = F, returnModifiedTime = F, returnNumberOfDays = F, returnResetRangeAttendanceTypes = F, returnStudentID = F, returnStudentName = F, returnThresholdValue = 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("Attendance", "TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord", TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, searchFields, EntityID)
}
#' Modify a specific TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord
#'
#' This function modifies fields for a TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#'
#' @param TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID The id of the TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord to be modified.\cr Run \code{\link{getAllTempStudentDisciplineThresholdAttendanceReportRunHistoryRecords}} for a list of TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempStudentDisciplineThresholdAttendanceReportRunHistoryRecord <- function(TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, EntityID = 1, setCountType = NULL, setCountTypeCode = NULL, setDateHigh = NULL, setDateLow = NULL, setDateType = NULL, setDateTypeCode = NULL, setDayCountType = NULL, setDayCountTypeCode = NULL, setDisciplineThresholdID = NULL, setNumberOfDays = NULL, setResetRangeAttendanceTypes = NULL, setStudentID = NULL, setStudentName = NULL, setThresholdValue = 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("Attendance", "TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord", TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#'
#' This function creates a new TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempStudentDisciplineThresholdAttendanceReportRunHistoryRecord <- function(EntityID = 1, setCountType = NULL, setCountTypeCode = NULL, setDateHigh = NULL, setDateLow = NULL, setDateType = NULL, setDateTypeCode = NULL, setDayCountType = NULL, setDayCountTypeCode = NULL, setDisciplineThresholdID = NULL, setNumberOfDays = NULL, setResetRangeAttendanceTypes = NULL, setStudentID = NULL, setStudentName = NULL, setThresholdValue = 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("Attendance", "TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord
#'
#' This function deletes a TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#'
#' @param TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID The id of the TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.\cr Run \code{\link{getAllTempStudentDisciplineThresholdAttendanceReportRunHistoryRecords}} for a list of TempStudentDisciplineThresholdAttendanceReportRunHistoryRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempStudentDisciplineThresholdAttendanceReportRunHistoryRecord <- function(TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempStudentDisciplineThresholdAttendanceReportRunHistoryRecord", TempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID, EntityID)
}
#' Get all TempStudentThresholdPeriodRecords.
#'
#' This function returns a dataframe of all TempStudentThresholdPeriodRecords 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 Attendance
#' @return All TempStudentThresholdPeriodRecords in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempStudentThresholdPeriodRecords <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempStudentThresholdPeriodRecordID = F, returnAttendancePeriodID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDate = F, returnModifiedTime = F, returnSectionID = F, returnStudentAttendancePeriodID = F, returnStudentSectionID = F, returnTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = 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("Attendance", "TempStudentThresholdPeriodRecord", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempStudentThresholdPeriodRecord
#'
#' This function returns fields for a TempStudentThresholdPeriodRecord.
#'
#' @param TempStudentThresholdPeriodRecordID The id of the TempStudentThresholdPeriodRecord.\cr Run \code{\link{getAllTempStudentThresholdPeriodRecords}} for a list of TempStudentThresholdPeriodRecords.
#' @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 Attendance
#' @return Details for the TempStudentThresholdPeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempStudentThresholdPeriodRecord <- function(TempStudentThresholdPeriodRecordID, EntityID = 1, returnTempStudentThresholdPeriodRecordID = F, returnAttendancePeriodID = F, returnAttendanceTypeID = F, returnCalendarDayID = F, returnCreatedTime = F, returnDate = F, returnModifiedTime = F, returnSectionID = F, returnStudentAttendancePeriodID = F, returnStudentSectionID = F, returnTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = 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("Attendance", "TempStudentThresholdPeriodRecord", TempStudentThresholdPeriodRecordID, searchFields, EntityID)
}
#' Modify a specific TempStudentThresholdPeriodRecord
#'
#' This function modifies fields for a TempStudentThresholdPeriodRecord.
#'
#' @param TempStudentThresholdPeriodRecordID The id of the TempStudentThresholdPeriodRecord to be modified.\cr Run \code{\link{getAllTempStudentThresholdPeriodRecords}} for a list of TempStudentThresholdPeriodRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified TempStudentThresholdPeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempStudentThresholdPeriodRecord <- function(TempStudentThresholdPeriodRecordID, EntityID = 1, setAttendancePeriodID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setDate = NULL, setSectionID = NULL, setStudentAttendancePeriodID = NULL, setStudentSectionID = NULL, setTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = 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("Attendance", "TempStudentThresholdPeriodRecord", TempStudentThresholdPeriodRecordID, names(functionParams), functionParams, EntityID)
}
#' Create new TempStudentThresholdPeriodRecord.
#'
#' This function creates a new TempStudentThresholdPeriodRecord.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created TempStudentThresholdPeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempStudentThresholdPeriodRecord <- function(EntityID = 1, setAttendancePeriodID = NULL, setAttendanceTypeID = NULL, setCalendarDayID = NULL, setDate = NULL, setSectionID = NULL, setStudentAttendancePeriodID = NULL, setStudentSectionID = NULL, setTempStudentDisciplineThresholdAttendanceReportRunHistoryRecordID = 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("Attendance", "TempStudentThresholdPeriodRecord", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempStudentThresholdPeriodRecord
#'
#' This function deletes a TempStudentThresholdPeriodRecord.
#'
#' @param TempStudentThresholdPeriodRecordID The id of the TempStudentThresholdPeriodRecord.\cr Run \code{\link{getAllTempStudentThresholdPeriodRecords}} for a list of TempStudentThresholdPeriodRecords.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted TempStudentThresholdPeriodRecord.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempStudentThresholdPeriodRecord <- function(TempStudentThresholdPeriodRecordID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "TempStudentThresholdPeriodRecord", TempStudentThresholdPeriodRecordID, EntityID)
}
#' Get all ThresholdResetRanges.
#'
#' This function returns a dataframe of all ThresholdResetRanges 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 Attendance
#' @return All ThresholdResetRanges in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllThresholdResetRanges <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnThresholdResetRangeID = F, returnAttendanceLettersRan = F, returnAttendanceTypeCodes = F, returnCountType = F, returnCountTypeCode = F, returnCreatedTime = F, returnDateDisplay = F, returnDateHigh = F, returnDateLow = F, returnDateType = F, returnDateTypeCode = F, returnDayCountType = F, returnDayCountTypeCode = F, returnEntityID = F, returnIsForAttendanceLetters = F, returnIsForTardyKiosk = F, returnModifiedTime = F, returnNumberOfDays = F, returnNumberPerDay = F, returnResetRangeAttendanceTypes = F, returnSchoolYearID = F, returnType = F, returnTypeCode = 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("Attendance", "ThresholdResetRange", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ThresholdResetRange
#'
#' This function returns fields for a ThresholdResetRange.
#'
#' @param ThresholdResetRangeID The id of the ThresholdResetRange.\cr Run \code{\link{getAllThresholdResetRanges}} for a list of ThresholdResetRanges.
#' @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 Attendance
#' @return Details for the ThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getThresholdResetRange <- function(ThresholdResetRangeID, EntityID = 1, returnThresholdResetRangeID = F, returnAttendanceLettersRan = F, returnAttendanceTypeCodes = F, returnCountType = F, returnCountTypeCode = F, returnCreatedTime = F, returnDateDisplay = F, returnDateHigh = F, returnDateLow = F, returnDateType = F, returnDateTypeCode = F, returnDayCountType = F, returnDayCountTypeCode = F, returnEntityID = F, returnIsForAttendanceLetters = F, returnIsForTardyKiosk = F, returnModifiedTime = F, returnNumberOfDays = F, returnNumberPerDay = F, returnResetRangeAttendanceTypes = F, returnSchoolYearID = F, returnType = F, returnTypeCode = 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("Attendance", "ThresholdResetRange", ThresholdResetRangeID, searchFields, EntityID)
}
#' Modify a specific ThresholdResetRange
#'
#' This function modifies fields for a ThresholdResetRange.
#'
#' @param ThresholdResetRangeID The id of the ThresholdResetRange to be modified.\cr Run \code{\link{getAllThresholdResetRanges}} for a list of ThresholdResetRanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified ThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyThresholdResetRange <- function(ThresholdResetRangeID, EntityID = 1, setCountType = NULL, setCountTypeCode = NULL, setDateHigh = NULL, setDateLow = NULL, setDateType = NULL, setDateTypeCode = NULL, setDayCountType = NULL, setDayCountTypeCode = NULL, setEntityID = NULL, setNumberOfDays = NULL, setNumberPerDay = NULL, setSchoolYearID = 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("Attendance", "ThresholdResetRange", ThresholdResetRangeID, names(functionParams), functionParams, EntityID)
}
#' Create new ThresholdResetRange.
#'
#' This function creates a new ThresholdResetRange.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created ThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createThresholdResetRange <- function(EntityID = 1, setCountType = NULL, setCountTypeCode = NULL, setDateHigh = NULL, setDateLow = NULL, setDateType = NULL, setDateTypeCode = NULL, setDayCountType = NULL, setDayCountTypeCode = NULL, setEntityID = NULL, setNumberOfDays = NULL, setNumberPerDay = NULL, setSchoolYearID = 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("Attendance", "ThresholdResetRange", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ThresholdResetRange
#'
#' This function deletes a ThresholdResetRange.
#'
#' @param ThresholdResetRangeID The id of the ThresholdResetRange.\cr Run \code{\link{getAllThresholdResetRanges}} for a list of ThresholdResetRanges.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted ThresholdResetRange.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteThresholdResetRange <- function(ThresholdResetRangeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "ThresholdResetRange", ThresholdResetRangeID, EntityID)
}
#' Get all ThresholdResetRangeAttendancePeriods.
#'
#' This function returns a dataframe of all ThresholdResetRangeAttendancePeriods 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 Attendance
#' @return All ThresholdResetRangeAttendancePeriods in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllThresholdResetRangeAttendancePeriods <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnThresholdResetRangeAttendancePeriodID = F, returnAttendancePeriodID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendancePeriod", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ThresholdResetRangeAttendancePeriod
#'
#' This function returns fields for a ThresholdResetRangeAttendancePeriod.
#'
#' @param ThresholdResetRangeAttendancePeriodID The id of the ThresholdResetRangeAttendancePeriod.\cr Run \code{\link{getAllThresholdResetRangeAttendancePeriods}} for a list of ThresholdResetRangeAttendancePeriods.
#' @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 Attendance
#' @return Details for the ThresholdResetRangeAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getThresholdResetRangeAttendancePeriod <- function(ThresholdResetRangeAttendancePeriodID, EntityID = 1, returnThresholdResetRangeAttendancePeriodID = F, returnAttendancePeriodID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendancePeriod", ThresholdResetRangeAttendancePeriodID, searchFields, EntityID)
}
#' Modify a specific ThresholdResetRangeAttendancePeriod
#'
#' This function modifies fields for a ThresholdResetRangeAttendancePeriod.
#'
#' @param ThresholdResetRangeAttendancePeriodID The id of the ThresholdResetRangeAttendancePeriod to be modified.\cr Run \code{\link{getAllThresholdResetRangeAttendancePeriods}} for a list of ThresholdResetRangeAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified ThresholdResetRangeAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyThresholdResetRangeAttendancePeriod <- function(ThresholdResetRangeAttendancePeriodID, EntityID = 1, setAttendancePeriodID = NULL, setThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendancePeriod", ThresholdResetRangeAttendancePeriodID, names(functionParams), functionParams, EntityID)
}
#' Create new ThresholdResetRangeAttendancePeriod.
#'
#' This function creates a new ThresholdResetRangeAttendancePeriod.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created ThresholdResetRangeAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createThresholdResetRangeAttendancePeriod <- function(EntityID = 1, setAttendancePeriodID = NULL, setThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendancePeriod", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ThresholdResetRangeAttendancePeriod
#'
#' This function deletes a ThresholdResetRangeAttendancePeriod.
#'
#' @param ThresholdResetRangeAttendancePeriodID The id of the ThresholdResetRangeAttendancePeriod.\cr Run \code{\link{getAllThresholdResetRangeAttendancePeriods}} for a list of ThresholdResetRangeAttendancePeriods.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted ThresholdResetRangeAttendancePeriod.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteThresholdResetRangeAttendancePeriod <- function(ThresholdResetRangeAttendancePeriodID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "ThresholdResetRangeAttendancePeriod", ThresholdResetRangeAttendancePeriodID, EntityID)
}
#' Get all ThresholdResetRangeAttendanceTypes.
#'
#' This function returns a dataframe of all ThresholdResetRangeAttendanceTypes 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 Attendance
#' @return All ThresholdResetRangeAttendanceTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllThresholdResetRangeAttendanceTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnThresholdResetRangeAttendanceTypeID = F, returnAttendanceTypeID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendanceType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ThresholdResetRangeAttendanceType
#'
#' This function returns fields for a ThresholdResetRangeAttendanceType.
#'
#' @param ThresholdResetRangeAttendanceTypeID The id of the ThresholdResetRangeAttendanceType.\cr Run \code{\link{getAllThresholdResetRangeAttendanceTypes}} for a list of ThresholdResetRangeAttendanceTypes.
#' @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 Attendance
#' @return Details for the ThresholdResetRangeAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getThresholdResetRangeAttendanceType <- function(ThresholdResetRangeAttendanceTypeID, EntityID = 1, returnThresholdResetRangeAttendanceTypeID = F, returnAttendanceTypeID = F, returnCreatedTime = F, returnModifiedTime = F, returnThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendanceType", ThresholdResetRangeAttendanceTypeID, searchFields, EntityID)
}
#' Modify a specific ThresholdResetRangeAttendanceType
#'
#' This function modifies fields for a ThresholdResetRangeAttendanceType.
#'
#' @param ThresholdResetRangeAttendanceTypeID The id of the ThresholdResetRangeAttendanceType to be modified.\cr Run \code{\link{getAllThresholdResetRangeAttendanceTypes}} for a list of ThresholdResetRangeAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return Details of the modified ThresholdResetRangeAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyThresholdResetRangeAttendanceType <- function(ThresholdResetRangeAttendanceTypeID, EntityID = 1, setAttendanceTypeID = NULL, setThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendanceType", ThresholdResetRangeAttendanceTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new ThresholdResetRangeAttendanceType.
#'
#' This function creates a new ThresholdResetRangeAttendanceType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept Attendance
#' @return The fields used to define the newly created ThresholdResetRangeAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createThresholdResetRangeAttendanceType <- function(EntityID = 1, setAttendanceTypeID = NULL, setThresholdResetRangeID = 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("Attendance", "ThresholdResetRangeAttendanceType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ThresholdResetRangeAttendanceType
#'
#' This function deletes a ThresholdResetRangeAttendanceType.
#'
#' @param ThresholdResetRangeAttendanceTypeID The id of the ThresholdResetRangeAttendanceType.\cr Run \code{\link{getAllThresholdResetRangeAttendanceTypes}} for a list of ThresholdResetRangeAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept Attendance
#' @return The id of the deleted ThresholdResetRangeAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteThresholdResetRangeAttendanceType <- function(ThresholdResetRangeAttendanceTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("Attendance", "ThresholdResetRangeAttendanceType", ThresholdResetRangeAttendanceTypeID, EntityID)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.