#' Get all ConfigDistrictYears.
#'
#' This function returns a dataframe of all ConfigDistrictYears in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All ConfigDistrictYears in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigDistrictYearsMessageCenter <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigDistrictYearID = F, returnConfigDistrictYearIDClonedFrom = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnNumberOfDaysAfterWithdrawalToAllowMessages = 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("MessageCenter", "ConfigDistrictYear", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigDistrictYear
#'
#' This function returns fields for a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigDistrictYearMessageCenter <- function(ConfigDistrictYearID, EntityID = 1, returnConfigDistrictYearID = F, returnConfigDistrictYearIDClonedFrom = F, returnCreatedTime = F, returnDistrictID = F, returnModifiedTime = F, returnNumberOfDaysAfterWithdrawalToAllowMessages = 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("MessageCenter", "ConfigDistrictYear", ConfigDistrictYearID, searchFields, EntityID)
}
#' Modify a specific ConfigDistrictYear
#'
#' This function modifies fields for a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear to be modified.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigDistrictYearMessageCenter <- function(ConfigDistrictYearID, EntityID = 1, setConfigDistrictYearIDClonedFrom = NULL, setDistrictID = NULL, setNumberOfDaysAfterWithdrawalToAllowMessages = 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("MessageCenter", "ConfigDistrictYear", ConfigDistrictYearID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigDistrictYear.
#'
#' This function creates a new ConfigDistrictYear.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigDistrictYearMessageCenter <- function(EntityID = 1, setConfigDistrictYearIDClonedFrom = NULL, setDistrictID = NULL, setNumberOfDaysAfterWithdrawalToAllowMessages = 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("MessageCenter", "ConfigDistrictYear", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigDistrictYear
#'
#' This function deletes a ConfigDistrictYear.
#'
#' @param ConfigDistrictYearID The id of the ConfigDistrictYear.\cr Run \code{\link{getAllConfigDistrictYears}} for a list of ConfigDistrictYears.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted ConfigDistrictYear.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigDistrictYearMessageCenter <- function(ConfigDistrictYearID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "ConfigDistrictYear", ConfigDistrictYearID, EntityID)
}
#' Get all ConfigDistrictYearWithdrawalCodes.
#'
#' This function returns a dataframe of all ConfigDistrictYearWithdrawalCodes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All ConfigDistrictYearWithdrawalCodes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllConfigDistrictYearWithdrawalCodesMessageCenter <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnConfigDistrictYearWithdrawalCodeID = F, returnConfigDistrictYearID = F, returnConfigDistrictYearWithdrawalCodeIDClonedFrom = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWithdrawalCodeID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "ConfigDistrictYearWithdrawalCode", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific ConfigDistrictYearWithdrawalCode
#'
#' This function returns fields for a ConfigDistrictYearWithdrawalCode.
#'
#' @param ConfigDistrictYearWithdrawalCodeID The id of the ConfigDistrictYearWithdrawalCode.\cr Run \code{\link{getAllConfigDistrictYearWithdrawalCodes}} for a list of ConfigDistrictYearWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the ConfigDistrictYearWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getConfigDistrictYearWithdrawalCodeMessageCenter <- function(ConfigDistrictYearWithdrawalCodeID, EntityID = 1, returnConfigDistrictYearWithdrawalCodeID = F, returnConfigDistrictYearID = F, returnConfigDistrictYearWithdrawalCodeIDClonedFrom = F, returnCreatedTime = F, returnModifiedTime = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWithdrawalCodeID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "ConfigDistrictYearWithdrawalCode", ConfigDistrictYearWithdrawalCodeID, searchFields, EntityID)
}
#' Modify a specific ConfigDistrictYearWithdrawalCode
#'
#' This function modifies fields for a ConfigDistrictYearWithdrawalCode.
#'
#' @param ConfigDistrictYearWithdrawalCodeID The id of the ConfigDistrictYearWithdrawalCode to be modified.\cr Run \code{\link{getAllConfigDistrictYearWithdrawalCodes}} for a list of ConfigDistrictYearWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified ConfigDistrictYearWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyConfigDistrictYearWithdrawalCodeMessageCenter <- function(ConfigDistrictYearWithdrawalCodeID, EntityID = 1, setConfigDistrictYearID = NULL, setConfigDistrictYearWithdrawalCodeIDClonedFrom = NULL, setWithdrawalCodeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "ConfigDistrictYearWithdrawalCode", ConfigDistrictYearWithdrawalCodeID, names(functionParams), functionParams, EntityID)
}
#' Create new ConfigDistrictYearWithdrawalCode.
#'
#' This function creates a new ConfigDistrictYearWithdrawalCode.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created ConfigDistrictYearWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createConfigDistrictYearWithdrawalCodeMessageCenter <- function(EntityID = 1, setConfigDistrictYearID = NULL, setConfigDistrictYearWithdrawalCodeIDClonedFrom = NULL, setWithdrawalCodeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "ConfigDistrictYearWithdrawalCode", names(functionParams), functionParams, EntityID)
}
#' Delete a specific ConfigDistrictYearWithdrawalCode
#'
#' This function deletes a ConfigDistrictYearWithdrawalCode.
#'
#' @param ConfigDistrictYearWithdrawalCodeID The id of the ConfigDistrictYearWithdrawalCode.\cr Run \code{\link{getAllConfigDistrictYearWithdrawalCodes}} for a list of ConfigDistrictYearWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted ConfigDistrictYearWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteConfigDistrictYearWithdrawalCodeMessageCenter <- function(ConfigDistrictYearWithdrawalCodeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "ConfigDistrictYearWithdrawalCode", ConfigDistrictYearWithdrawalCodeID, EntityID)
}
#' Get all Messages.
#'
#' This function returns a dataframe of all Messages in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All Messages in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllMessages <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMessageID = F, returnContent = F, returnCreatedTime = F, returnEmailRecipientType = F, returnEmailsSent = F, returnFromInformation = F, returnIncludeLinkToObject = F, returnIsHidden = F, returnIsRead = F, returnMessageIDCopiedFrom = F, returnMessageMasterID = F, returnModifiedTime = F, returnNoSourceIDRequired = F, returnObjectIDCreatedFor = F, returnObjectPrimaryKey = F, returnPostDate = F, returnPriorityType = F, returnPriorityTypeCode = F, returnSourceIDCreatedFor = F, returnSubject = F, returnType = F, returnTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDRecipient = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "Message", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Message
#'
#' This function returns fields for a Message.
#'
#' @param MessageID The id of the Message.\cr Run \code{\link{getAllMessages}} for a list of Messages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the Message.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getMessage <- function(MessageID, EntityID = 1, returnMessageID = F, returnContent = F, returnCreatedTime = F, returnEmailRecipientType = F, returnEmailsSent = F, returnFromInformation = F, returnIncludeLinkToObject = F, returnIsHidden = F, returnIsRead = F, returnMessageIDCopiedFrom = F, returnMessageMasterID = F, returnModifiedTime = F, returnNoSourceIDRequired = F, returnObjectIDCreatedFor = F, returnObjectPrimaryKey = F, returnPostDate = F, returnPriorityType = F, returnPriorityTypeCode = F, returnSourceIDCreatedFor = F, returnSubject = F, returnType = F, returnTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDRecipient = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "Message", MessageID, searchFields, EntityID)
}
#' Modify a specific Message
#'
#' This function modifies fields for a Message.
#'
#' @param MessageID The id of the Message to be modified.\cr Run \code{\link{getAllMessages}} for a list of Messages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified Message.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyMessage <- function(MessageID, EntityID = 1, setContent = NULL, setEmailRecipientType = NULL, setFromInformation = NULL, setIsHidden = NULL, setIsRead = NULL, setMessageIDCopiedFrom = NULL, setMessageMasterID = NULL, setNoSourceIDRequired = NULL, setObjectIDCreatedFor = NULL, setObjectPrimaryKey = NULL, setPostDate = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setSourceIDCreatedFor = NULL, setSubject = NULL, setType = NULL, setTypeCode = NULL, setUserIDRecipient = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "Message", MessageID, names(functionParams), functionParams, EntityID)
}
#' Create new Message.
#'
#' This function creates a new Message.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created Message.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createMessage <- function(EntityID = 1, setContent = NULL, setEmailRecipientType = NULL, setFromInformation = NULL, setIsHidden = NULL, setIsRead = NULL, setMessageIDCopiedFrom = NULL, setMessageMasterID = NULL, setNoSourceIDRequired = NULL, setObjectIDCreatedFor = NULL, setObjectPrimaryKey = NULL, setPostDate = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setSourceIDCreatedFor = NULL, setSubject = NULL, setType = NULL, setTypeCode = NULL, setUserIDRecipient = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "Message", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Message
#'
#' This function deletes a Message.
#'
#' @param MessageID The id of the Message.\cr Run \code{\link{getAllMessages}} for a list of Messages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted Message.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteMessage <- function(MessageID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "Message", MessageID, EntityID)
}
#' Get all MessageMasters.
#'
#' This function returns a dataframe of all MessageMasters in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All MessageMasters in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllMessageMasters <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnMessageMasterID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCarbonCopyStaffIDList = F, returnContent = F, returnCreatedTime = F, returnCustomMessageData = F, returnEntityID = F, returnIncludeRestrictedGuardians = F, returnIsDraft = F, returnIsRetracted = F, returnLargestMessagePrimaryKey = F, returnModifiedTime = F, returnObjectIDCreatedFor = F, returnPostedTime = F, returnPriorityType = F, returnPriorityTypeCode = F, returnSchoolYearID = F, returnSearchConditionFilter = F, returnSourceIDCreatedFor = F, returnStatus = F, returnStatusCode = F, returnSubject = F, returnSubjectCleaned = F, returnToWhom = F, returnToWhomCode = F, returnType = F, returnTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXMLFilter = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "MessageMaster", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific MessageMaster
#'
#' This function returns fields for a MessageMaster.
#'
#' @param MessageMasterID The id of the MessageMaster.\cr Run \code{\link{getAllMessageMasters}} for a list of MessageMasters.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the MessageMaster.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getMessageMaster <- function(MessageMasterID, EntityID = 1, returnMessageMasterID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnCarbonCopyStaffIDList = F, returnContent = F, returnCreatedTime = F, returnCustomMessageData = F, returnEntityID = F, returnIncludeRestrictedGuardians = F, returnIsDraft = F, returnIsRetracted = F, returnLargestMessagePrimaryKey = F, returnModifiedTime = F, returnObjectIDCreatedFor = F, returnPostedTime = F, returnPriorityType = F, returnPriorityTypeCode = F, returnSchoolYearID = F, returnSearchConditionFilter = F, returnSourceIDCreatedFor = F, returnStatus = F, returnStatusCode = F, returnSubject = F, returnSubjectCleaned = F, returnToWhom = F, returnToWhomCode = F, returnType = F, returnTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXMLFilter = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "MessageMaster", MessageMasterID, searchFields, EntityID)
}
#' Modify a specific MessageMaster
#'
#' This function modifies fields for a MessageMaster.
#'
#' @param MessageMasterID The id of the MessageMaster to be modified.\cr Run \code{\link{getAllMessageMasters}} for a list of MessageMasters.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified MessageMaster.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyMessageMaster <- function(MessageMasterID, EntityID = 1, setCarbonCopyStaffIDList = NULL, setContent = NULL, setCustomMessageData = NULL, setEntityID = NULL, setIncludeRestrictedGuardians = NULL, setIsDraft = NULL, setObjectIDCreatedFor = NULL, setPostedTime = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setSchoolYearID = NULL, setSearchConditionFilter = NULL, setSourceIDCreatedFor = NULL, setStatus = NULL, setStatusCode = NULL, setSubject = NULL, setToWhom = NULL, setToWhomCode = NULL, setType = NULL, setTypeCode = NULL, setXMLFilter = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "MessageMaster", MessageMasterID, names(functionParams), functionParams, EntityID)
}
#' Create new MessageMaster.
#'
#' This function creates a new MessageMaster.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created MessageMaster.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createMessageMaster <- function(EntityID = 1, setCarbonCopyStaffIDList = NULL, setContent = NULL, setCustomMessageData = NULL, setEntityID = NULL, setIncludeRestrictedGuardians = NULL, setIsDraft = NULL, setObjectIDCreatedFor = NULL, setPostedTime = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setSchoolYearID = NULL, setSearchConditionFilter = NULL, setSourceIDCreatedFor = NULL, setStatus = NULL, setStatusCode = NULL, setSubject = NULL, setToWhom = NULL, setToWhomCode = NULL, setType = NULL, setTypeCode = NULL, setXMLFilter = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "MessageMaster", names(functionParams), functionParams, EntityID)
}
#' Delete a specific MessageMaster
#'
#' This function deletes a MessageMaster.
#'
#' @param MessageMasterID The id of the MessageMaster.\cr Run \code{\link{getAllMessageMasters}} for a list of MessageMasters.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted MessageMaster.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteMessageMaster <- function(MessageMasterID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "MessageMaster", MessageMasterID, EntityID)
}
#' Get all Notifications.
#'
#' This function returns a dataframe of all Notifications in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All Notifications in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotifications <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnAttendanceCategoryForCount = F, returnAttendanceCategoryForCountCode = F, returnAttendanceCountHigh = F, returnAttendanceCountLow = F, returnAttendanceCountMethod = F, returnAttendanceCountMethodCode = F, returnConsiderAllStaffMeets = F, returnCreatedTime = F, returnDayType = F, returnDayTypeCode = F, returnEntityID = F, returnFeeManagementBalanceHigh = F, returnFeeManagementBalanceLow = F, returnFoodServiceBalanceHigh = F, returnFoodServiceBalanceLow = F, returnGradingPeriodEndDaysAfter = F, returnGradingPeriodEndDaysBefore = F, returnIncludeAutoGeneratedMessage = F, returnLastEntryType = F, returnLastEntryTypeCode = F, returnMessage = F, returnModifiedTime = F, returnNumberOfDays = F, returnPriorityType = F, returnPriorityTypeCode = F, returnScheduledTaskID = F, returnScheduleIsAvailableDaysBefore = F, returnSchoolYearID = F, returnSearchConditionFilter = F, returnSendNotificationForDay = F, returnSendNotificationForDayCode = F, returnSendNotificationForPriorDayCount = F, returnSendOnlyIfGuardianNotNotified = F, returnSendToDisciplineOfficer = F, returnSubject = F, returnSubjectCleaned = F, returnToWhom = F, returnToWhomCode = F, returnType = F, returnTypeCode = F, returnUnrecordedAttendanceMinutes = F, returnUnrecordedAttendancePeriodType = F, returnUnrecordedAttendancePeriodTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXMLFilter = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "Notification", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific Notification
#'
#' This function returns fields for a Notification.
#'
#' @param NotificationID The id of the Notification.\cr Run \code{\link{getAllNotifications}} for a list of Notifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the Notification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotification <- function(NotificationID, EntityID = 1, returnNotificationID = F, returnAttachmentCount = F, returnAttachmentIndicatorColumn = F, returnAttendanceCategoryForCount = F, returnAttendanceCategoryForCountCode = F, returnAttendanceCountHigh = F, returnAttendanceCountLow = F, returnAttendanceCountMethod = F, returnAttendanceCountMethodCode = F, returnConsiderAllStaffMeets = F, returnCreatedTime = F, returnDayType = F, returnDayTypeCode = F, returnEntityID = F, returnFeeManagementBalanceHigh = F, returnFeeManagementBalanceLow = F, returnFoodServiceBalanceHigh = F, returnFoodServiceBalanceLow = F, returnGradingPeriodEndDaysAfter = F, returnGradingPeriodEndDaysBefore = F, returnIncludeAutoGeneratedMessage = F, returnLastEntryType = F, returnLastEntryTypeCode = F, returnMessage = F, returnModifiedTime = F, returnNumberOfDays = F, returnPriorityType = F, returnPriorityTypeCode = F, returnScheduledTaskID = F, returnScheduleIsAvailableDaysBefore = F, returnSchoolYearID = F, returnSearchConditionFilter = F, returnSendNotificationForDay = F, returnSendNotificationForDayCode = F, returnSendNotificationForPriorDayCount = F, returnSendOnlyIfGuardianNotNotified = F, returnSendToDisciplineOfficer = F, returnSubject = F, returnSubjectCleaned = F, returnToWhom = F, returnToWhomCode = F, returnType = F, returnTypeCode = F, returnUnrecordedAttendanceMinutes = F, returnUnrecordedAttendancePeriodType = F, returnUnrecordedAttendancePeriodTypeCode = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnXMLFilter = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "Notification", NotificationID, searchFields, EntityID)
}
#' Modify a specific Notification
#'
#' This function modifies fields for a Notification.
#'
#' @param NotificationID The id of the Notification to be modified.\cr Run \code{\link{getAllNotifications}} for a list of Notifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified Notification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotification <- function(NotificationID, EntityID = 1, setAttendanceCategoryForCount = NULL, setAttendanceCategoryForCountCode = NULL, setAttendanceCountHigh = NULL, setAttendanceCountLow = NULL, setAttendanceCountMethod = NULL, setAttendanceCountMethodCode = NULL, setConsiderAllStaffMeets = NULL, setDayType = NULL, setDayTypeCode = NULL, setEntityID = NULL, setFeeManagementBalanceHigh = NULL, setFeeManagementBalanceLow = NULL, setFoodServiceBalanceHigh = NULL, setFoodServiceBalanceLow = NULL, setGradingPeriodEndDaysAfter = NULL, setGradingPeriodEndDaysBefore = NULL, setIncludeAutoGeneratedMessage = NULL, setLastEntryType = NULL, setLastEntryTypeCode = NULL, setMessage = NULL, setNumberOfDays = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setScheduledTaskID = NULL, setScheduleIsAvailableDaysBefore = NULL, setSchoolYearID = NULL, setSearchConditionFilter = NULL, setSendNotificationForDay = NULL, setSendNotificationForDayCode = NULL, setSendNotificationForPriorDayCount = NULL, setSendOnlyIfGuardianNotNotified = NULL, setSendToDisciplineOfficer = NULL, setSubject = NULL, setToWhom = NULL, setToWhomCode = NULL, setType = NULL, setTypeCode = NULL, setUnrecordedAttendanceMinutes = NULL, setUnrecordedAttendancePeriodType = NULL, setUnrecordedAttendancePeriodTypeCode = NULL, setXMLFilter = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "Notification", NotificationID, names(functionParams), functionParams, EntityID)
}
#' Create new Notification.
#'
#' This function creates a new Notification.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created Notification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotification <- function(EntityID = 1, setAttendanceCategoryForCount = NULL, setAttendanceCategoryForCountCode = NULL, setAttendanceCountHigh = NULL, setAttendanceCountLow = NULL, setAttendanceCountMethod = NULL, setAttendanceCountMethodCode = NULL, setConsiderAllStaffMeets = NULL, setDayType = NULL, setDayTypeCode = NULL, setEntityID = NULL, setFeeManagementBalanceHigh = NULL, setFeeManagementBalanceLow = NULL, setFoodServiceBalanceHigh = NULL, setFoodServiceBalanceLow = NULL, setGradingPeriodEndDaysAfter = NULL, setGradingPeriodEndDaysBefore = NULL, setIncludeAutoGeneratedMessage = NULL, setLastEntryType = NULL, setLastEntryTypeCode = NULL, setMessage = NULL, setNumberOfDays = NULL, setPriorityType = NULL, setPriorityTypeCode = NULL, setScheduledTaskID = NULL, setScheduleIsAvailableDaysBefore = NULL, setSchoolYearID = NULL, setSearchConditionFilter = NULL, setSendNotificationForDay = NULL, setSendNotificationForDayCode = NULL, setSendNotificationForPriorDayCount = NULL, setSendOnlyIfGuardianNotNotified = NULL, setSendToDisciplineOfficer = NULL, setSubject = NULL, setToWhom = NULL, setToWhomCode = NULL, setType = NULL, setTypeCode = NULL, setUnrecordedAttendanceMinutes = NULL, setUnrecordedAttendancePeriodType = NULL, setUnrecordedAttendancePeriodTypeCode = NULL, setXMLFilter = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "Notification", names(functionParams), functionParams, EntityID)
}
#' Delete a specific Notification
#'
#' This function deletes a Notification.
#'
#' @param NotificationID The id of the Notification.\cr Run \code{\link{getAllNotifications}} for a list of Notifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted Notification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotification <- function(NotificationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "Notification", NotificationID, EntityID)
}
#' Get all NotificationActions.
#'
#' This function returns a dataframe of all NotificationActions in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationActions in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationActions <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationActionID = F, returnActionID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationAction", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationAction
#'
#' This function returns fields for a NotificationAction.
#'
#' @param NotificationActionID The id of the NotificationAction.\cr Run \code{\link{getAllNotificationActions}} for a list of NotificationActions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationAction.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationAction <- function(NotificationActionID, EntityID = 1, returnNotificationActionID = F, returnActionID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationAction", NotificationActionID, searchFields, EntityID)
}
#' Modify a specific NotificationAction
#'
#' This function modifies fields for a NotificationAction.
#'
#' @param NotificationActionID The id of the NotificationAction to be modified.\cr Run \code{\link{getAllNotificationActions}} for a list of NotificationActions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationAction.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationAction <- function(NotificationActionID, EntityID = 1, setActionID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationAction", NotificationActionID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationAction.
#'
#' This function creates a new NotificationAction.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationAction.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationAction <- function(EntityID = 1, setActionID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationAction", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationAction
#'
#' This function deletes a NotificationAction.
#'
#' @param NotificationActionID The id of the NotificationAction.\cr Run \code{\link{getAllNotificationActions}} for a list of NotificationActions.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationAction.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationAction <- function(NotificationActionID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationAction", NotificationActionID, EntityID)
}
#' Get all NotificationAttendanceTypes.
#'
#' This function returns a dataframe of all NotificationAttendanceTypes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationAttendanceTypes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationAttendanceTypes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationAttendanceTypeID = F, returnAttendanceTypeID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationAttendanceType", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationAttendanceType
#'
#' This function returns fields for a NotificationAttendanceType.
#'
#' @param NotificationAttendanceTypeID The id of the NotificationAttendanceType.\cr Run \code{\link{getAllNotificationAttendanceTypes}} for a list of NotificationAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationAttendanceType <- function(NotificationAttendanceTypeID, EntityID = 1, returnNotificationAttendanceTypeID = F, returnAttendanceTypeID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationAttendanceType", NotificationAttendanceTypeID, searchFields, EntityID)
}
#' Modify a specific NotificationAttendanceType
#'
#' This function modifies fields for a NotificationAttendanceType.
#'
#' @param NotificationAttendanceTypeID The id of the NotificationAttendanceType to be modified.\cr Run \code{\link{getAllNotificationAttendanceTypes}} for a list of NotificationAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationAttendanceType <- function(NotificationAttendanceTypeID, EntityID = 1, setAttendanceTypeID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationAttendanceType", NotificationAttendanceTypeID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationAttendanceType.
#'
#' This function creates a new NotificationAttendanceType.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationAttendanceType <- function(EntityID = 1, setAttendanceTypeID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationAttendanceType", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationAttendanceType
#'
#' This function deletes a NotificationAttendanceType.
#'
#' @param NotificationAttendanceTypeID The id of the NotificationAttendanceType.\cr Run \code{\link{getAllNotificationAttendanceTypes}} for a list of NotificationAttendanceTypes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationAttendanceType.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationAttendanceType <- function(NotificationAttendanceTypeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationAttendanceType", NotificationAttendanceTypeID, EntityID)
}
#' Get all NotificationCarbonCopyStaffs.
#'
#' This function returns a dataframe of all NotificationCarbonCopyStaffs in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationCarbonCopyStaffs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationCarbonCopyStaffs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationCarbonCopyStaffID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationCarbonCopyStaff", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationCarbonCopyStaff
#'
#' This function returns fields for a NotificationCarbonCopyStaff.
#'
#' @param NotificationCarbonCopyStaffID The id of the NotificationCarbonCopyStaff.\cr Run \code{\link{getAllNotificationCarbonCopyStaffs}} for a list of NotificationCarbonCopyStaffs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationCarbonCopyStaff.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationCarbonCopyStaff <- function(NotificationCarbonCopyStaffID, EntityID = 1, returnNotificationCarbonCopyStaffID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationCarbonCopyStaff", NotificationCarbonCopyStaffID, searchFields, EntityID)
}
#' Modify a specific NotificationCarbonCopyStaff
#'
#' This function modifies fields for a NotificationCarbonCopyStaff.
#'
#' @param NotificationCarbonCopyStaffID The id of the NotificationCarbonCopyStaff to be modified.\cr Run \code{\link{getAllNotificationCarbonCopyStaffs}} for a list of NotificationCarbonCopyStaffs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationCarbonCopyStaff.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationCarbonCopyStaff <- function(NotificationCarbonCopyStaffID, EntityID = 1, setNotificationID = 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("MessageCenter", "NotificationCarbonCopyStaff", NotificationCarbonCopyStaffID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationCarbonCopyStaff.
#'
#' This function creates a new NotificationCarbonCopyStaff.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationCarbonCopyStaff.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationCarbonCopyStaff <- function(EntityID = 1, setNotificationID = 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("MessageCenter", "NotificationCarbonCopyStaff", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationCarbonCopyStaff
#'
#' This function deletes a NotificationCarbonCopyStaff.
#'
#' @param NotificationCarbonCopyStaffID The id of the NotificationCarbonCopyStaff.\cr Run \code{\link{getAllNotificationCarbonCopyStaffs}} for a list of NotificationCarbonCopyStaffs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationCarbonCopyStaff.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationCarbonCopyStaff <- function(NotificationCarbonCopyStaffID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationCarbonCopyStaff", NotificationCarbonCopyStaffID, EntityID)
}
#' Get all NotificationDisciplineThresholds.
#'
#' This function returns a dataframe of all NotificationDisciplineThresholds in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationDisciplineThresholds in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationDisciplineThresholds <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationDisciplineThresholdID = F, returnCreatedTime = F, returnDisciplineThresholdID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationDisciplineThreshold", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationDisciplineThreshold
#'
#' This function returns fields for a NotificationDisciplineThreshold.
#'
#' @param NotificationDisciplineThresholdID The id of the NotificationDisciplineThreshold.\cr Run \code{\link{getAllNotificationDisciplineThresholds}} for a list of NotificationDisciplineThresholds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationDisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationDisciplineThreshold <- function(NotificationDisciplineThresholdID, EntityID = 1, returnNotificationDisciplineThresholdID = F, returnCreatedTime = F, returnDisciplineThresholdID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationDisciplineThreshold", NotificationDisciplineThresholdID, searchFields, EntityID)
}
#' Modify a specific NotificationDisciplineThreshold
#'
#' This function modifies fields for a NotificationDisciplineThreshold.
#'
#' @param NotificationDisciplineThresholdID The id of the NotificationDisciplineThreshold to be modified.\cr Run \code{\link{getAllNotificationDisciplineThresholds}} for a list of NotificationDisciplineThresholds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationDisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationDisciplineThreshold <- function(NotificationDisciplineThresholdID, EntityID = 1, setDisciplineThresholdID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationDisciplineThreshold", NotificationDisciplineThresholdID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationDisciplineThreshold.
#'
#' This function creates a new NotificationDisciplineThreshold.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationDisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationDisciplineThreshold <- function(EntityID = 1, setDisciplineThresholdID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationDisciplineThreshold", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationDisciplineThreshold
#'
#' This function deletes a NotificationDisciplineThreshold.
#'
#' @param NotificationDisciplineThresholdID The id of the NotificationDisciplineThreshold.\cr Run \code{\link{getAllNotificationDisciplineThresholds}} for a list of NotificationDisciplineThresholds.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationDisciplineThreshold.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationDisciplineThreshold <- function(NotificationDisciplineThresholdID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationDisciplineThreshold", NotificationDisciplineThresholdID, EntityID)
}
#' Get all NotificationGradeBuckets.
#'
#' This function returns a dataframe of all NotificationGradeBuckets in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationGradeBuckets in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationGradeBuckets <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationGradeBucketID = F, returnCreatedTime = F, returnGradeBucketID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeBucket", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationGradeBucket
#'
#' This function returns fields for a NotificationGradeBucket.
#'
#' @param NotificationGradeBucketID The id of the NotificationGradeBucket.\cr Run \code{\link{getAllNotificationGradeBuckets}} for a list of NotificationGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationGradeBucket <- function(NotificationGradeBucketID, EntityID = 1, returnNotificationGradeBucketID = F, returnCreatedTime = F, returnGradeBucketID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeBucket", NotificationGradeBucketID, searchFields, EntityID)
}
#' Modify a specific NotificationGradeBucket
#'
#' This function modifies fields for a NotificationGradeBucket.
#'
#' @param NotificationGradeBucketID The id of the NotificationGradeBucket to be modified.\cr Run \code{\link{getAllNotificationGradeBuckets}} for a list of NotificationGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationGradeBucket <- function(NotificationGradeBucketID, EntityID = 1, setGradeBucketID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationGradeBucket", NotificationGradeBucketID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationGradeBucket.
#'
#' This function creates a new NotificationGradeBucket.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationGradeBucket <- function(EntityID = 1, setGradeBucketID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationGradeBucket", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationGradeBucket
#'
#' This function deletes a NotificationGradeBucket.
#'
#' @param NotificationGradeBucketID The id of the NotificationGradeBucket.\cr Run \code{\link{getAllNotificationGradeBuckets}} for a list of NotificationGradeBuckets.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationGradeBucket.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationGradeBucket <- function(NotificationGradeBucketID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationGradeBucket", NotificationGradeBucketID, EntityID)
}
#' Get all NotificationGradeMarks.
#'
#' This function returns a dataframe of all NotificationGradeMarks in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationGradeMarks in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationGradeMarks <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationGradeMarkID = F, returnCreatedTime = F, returnGradeMarkID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeMark", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationGradeMark
#'
#' This function returns fields for a NotificationGradeMark.
#'
#' @param NotificationGradeMarkID The id of the NotificationGradeMark.\cr Run \code{\link{getAllNotificationGradeMarks}} for a list of NotificationGradeMarks.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationGradeMark <- function(NotificationGradeMarkID, EntityID = 1, returnNotificationGradeMarkID = F, returnCreatedTime = F, returnGradeMarkID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeMark", NotificationGradeMarkID, searchFields, EntityID)
}
#' Modify a specific NotificationGradeMark
#'
#' This function modifies fields for a NotificationGradeMark.
#'
#' @param NotificationGradeMarkID The id of the NotificationGradeMark to be modified.\cr Run \code{\link{getAllNotificationGradeMarks}} for a list of NotificationGradeMarks.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationGradeMark <- function(NotificationGradeMarkID, EntityID = 1, setGradeMarkID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationGradeMark", NotificationGradeMarkID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationGradeMark.
#'
#' This function creates a new NotificationGradeMark.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationGradeMark <- function(EntityID = 1, setGradeMarkID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationGradeMark", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationGradeMark
#'
#' This function deletes a NotificationGradeMark.
#'
#' @param NotificationGradeMarkID The id of the NotificationGradeMark.\cr Run \code{\link{getAllNotificationGradeMarks}} for a list of NotificationGradeMarks.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationGradeMark.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationGradeMark <- function(NotificationGradeMarkID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationGradeMark", NotificationGradeMarkID, EntityID)
}
#' Get all NotificationGradeReferences.
#'
#' This function returns a dataframe of all NotificationGradeReferences in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationGradeReferences in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationGradeReferences <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationGradeReferenceID = F, returnCreatedTime = F, returnGradeReferenceID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeReference", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationGradeReference
#'
#' This function returns fields for a NotificationGradeReference.
#'
#' @param NotificationGradeReferenceID The id of the NotificationGradeReference.\cr Run \code{\link{getAllNotificationGradeReferences}} for a list of NotificationGradeReferences.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationGradeReference.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationGradeReference <- function(NotificationGradeReferenceID, EntityID = 1, returnNotificationGradeReferenceID = F, returnCreatedTime = F, returnGradeReferenceID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationGradeReference", NotificationGradeReferenceID, searchFields, EntityID)
}
#' Modify a specific NotificationGradeReference
#'
#' This function modifies fields for a NotificationGradeReference.
#'
#' @param NotificationGradeReferenceID The id of the NotificationGradeReference to be modified.\cr Run \code{\link{getAllNotificationGradeReferences}} for a list of NotificationGradeReferences.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationGradeReference.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationGradeReference <- function(NotificationGradeReferenceID, EntityID = 1, setGradeReferenceID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationGradeReference", NotificationGradeReferenceID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationGradeReference.
#'
#' This function creates a new NotificationGradeReference.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationGradeReference.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationGradeReference <- function(EntityID = 1, setGradeReferenceID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationGradeReference", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationGradeReference
#'
#' This function deletes a NotificationGradeReference.
#'
#' @param NotificationGradeReferenceID The id of the NotificationGradeReference.\cr Run \code{\link{getAllNotificationGradeReferences}} for a list of NotificationGradeReferences.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationGradeReference.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationGradeReference <- function(NotificationGradeReferenceID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationGradeReference", NotificationGradeReferenceID, EntityID)
}
#' Get all NotificationOffenses.
#'
#' This function returns a dataframe of all NotificationOffenses in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationOffenses in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationOffenses <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationOffenseID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnOffenseID = 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("MessageCenter", "NotificationOffense", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationOffense
#'
#' This function returns fields for a NotificationOffense.
#'
#' @param NotificationOffenseID The id of the NotificationOffense.\cr Run \code{\link{getAllNotificationOffenses}} for a list of NotificationOffenses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationOffense.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationOffense <- function(NotificationOffenseID, EntityID = 1, returnNotificationOffenseID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnOffenseID = 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("MessageCenter", "NotificationOffense", NotificationOffenseID, searchFields, EntityID)
}
#' Modify a specific NotificationOffense
#'
#' This function modifies fields for a NotificationOffense.
#'
#' @param NotificationOffenseID The id of the NotificationOffense to be modified.\cr Run \code{\link{getAllNotificationOffenses}} for a list of NotificationOffenses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationOffense.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationOffense <- function(NotificationOffenseID, EntityID = 1, setNotificationID = NULL, setOffenseID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationOffense", NotificationOffenseID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationOffense.
#'
#' This function creates a new NotificationOffense.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationOffense.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationOffense <- function(EntityID = 1, setNotificationID = NULL, setOffenseID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationOffense", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationOffense
#'
#' This function deletes a NotificationOffense.
#'
#' @param NotificationOffenseID The id of the NotificationOffense.\cr Run \code{\link{getAllNotificationOffenses}} for a list of NotificationOffenses.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationOffense.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationOffense <- function(NotificationOffenseID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationOffense", NotificationOffenseID, EntityID)
}
#' Get all NotificationOnlineForms.
#'
#' This function returns a dataframe of all NotificationOnlineForms in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationOnlineForms in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationOnlineForms <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationOnlineFormID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnOnlineFormID = 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("MessageCenter", "NotificationOnlineForm", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationOnlineForm
#'
#' This function returns fields for a NotificationOnlineForm.
#'
#' @param NotificationOnlineFormID The id of the NotificationOnlineForm.\cr Run \code{\link{getAllNotificationOnlineForms}} for a list of NotificationOnlineForms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationOnlineForm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationOnlineForm <- function(NotificationOnlineFormID, EntityID = 1, returnNotificationOnlineFormID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnOnlineFormID = 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("MessageCenter", "NotificationOnlineForm", NotificationOnlineFormID, searchFields, EntityID)
}
#' Modify a specific NotificationOnlineForm
#'
#' This function modifies fields for a NotificationOnlineForm.
#'
#' @param NotificationOnlineFormID The id of the NotificationOnlineForm to be modified.\cr Run \code{\link{getAllNotificationOnlineForms}} for a list of NotificationOnlineForms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationOnlineForm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationOnlineForm <- function(NotificationOnlineFormID, EntityID = 1, setNotificationID = NULL, setOnlineFormID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationOnlineForm", NotificationOnlineFormID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationOnlineForm.
#'
#' This function creates a new NotificationOnlineForm.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationOnlineForm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationOnlineForm <- function(EntityID = 1, setNotificationID = NULL, setOnlineFormID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationOnlineForm", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationOnlineForm
#'
#' This function deletes a NotificationOnlineForm.
#'
#' @param NotificationOnlineFormID The id of the NotificationOnlineForm.\cr Run \code{\link{getAllNotificationOnlineForms}} for a list of NotificationOnlineForms.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationOnlineForm.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationOnlineForm <- function(NotificationOnlineFormID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationOnlineForm", NotificationOnlineFormID, EntityID)
}
#' Get all NotificationScheduleIsAvailableSectionLengths.
#'
#' This function returns a dataframe of all NotificationScheduleIsAvailableSectionLengths in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationScheduleIsAvailableSectionLengths in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationScheduleIsAvailableSectionLengths <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationScheduleIsAvailableSectionLengthID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnSectionLengthID = 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("MessageCenter", "NotificationScheduleIsAvailableSectionLength", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationScheduleIsAvailableSectionLength
#'
#' This function returns fields for a NotificationScheduleIsAvailableSectionLength.
#'
#' @param NotificationScheduleIsAvailableSectionLengthID The id of the NotificationScheduleIsAvailableSectionLength.\cr Run \code{\link{getAllNotificationScheduleIsAvailableSectionLengths}} for a list of NotificationScheduleIsAvailableSectionLengths.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationScheduleIsAvailableSectionLength.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationScheduleIsAvailableSectionLength <- function(NotificationScheduleIsAvailableSectionLengthID, EntityID = 1, returnNotificationScheduleIsAvailableSectionLengthID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnSectionLengthID = 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("MessageCenter", "NotificationScheduleIsAvailableSectionLength", NotificationScheduleIsAvailableSectionLengthID, searchFields, EntityID)
}
#' Modify a specific NotificationScheduleIsAvailableSectionLength
#'
#' This function modifies fields for a NotificationScheduleIsAvailableSectionLength.
#'
#' @param NotificationScheduleIsAvailableSectionLengthID The id of the NotificationScheduleIsAvailableSectionLength to be modified.\cr Run \code{\link{getAllNotificationScheduleIsAvailableSectionLengths}} for a list of NotificationScheduleIsAvailableSectionLengths.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationScheduleIsAvailableSectionLength.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationScheduleIsAvailableSectionLength <- function(NotificationScheduleIsAvailableSectionLengthID, EntityID = 1, setNotificationID = NULL, setSectionLengthID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationScheduleIsAvailableSectionLength", NotificationScheduleIsAvailableSectionLengthID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationScheduleIsAvailableSectionLength.
#'
#' This function creates a new NotificationScheduleIsAvailableSectionLength.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationScheduleIsAvailableSectionLength.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationScheduleIsAvailableSectionLength <- function(EntityID = 1, setNotificationID = NULL, setSectionLengthID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationScheduleIsAvailableSectionLength", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationScheduleIsAvailableSectionLength
#'
#' This function deletes a NotificationScheduleIsAvailableSectionLength.
#'
#' @param NotificationScheduleIsAvailableSectionLengthID The id of the NotificationScheduleIsAvailableSectionLength.\cr Run \code{\link{getAllNotificationScheduleIsAvailableSectionLengths}} for a list of NotificationScheduleIsAvailableSectionLengths.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationScheduleIsAvailableSectionLength.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationScheduleIsAvailableSectionLength <- function(NotificationScheduleIsAvailableSectionLengthID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationScheduleIsAvailableSectionLength", NotificationScheduleIsAvailableSectionLengthID, EntityID)
}
#' Get all NotificationUnrecordedClassAttendances.
#'
#' This function returns a dataframe of all NotificationUnrecordedClassAttendances in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationUnrecordedClassAttendances in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationUnrecordedClassAttendances <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationUnrecordedClassAttendanceID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationUnrecordedClassAttendance", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationUnrecordedClassAttendance
#'
#' This function returns fields for a NotificationUnrecordedClassAttendance.
#'
#' @param NotificationUnrecordedClassAttendanceID The id of the NotificationUnrecordedClassAttendance.\cr Run \code{\link{getAllNotificationUnrecordedClassAttendances}} for a list of NotificationUnrecordedClassAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationUnrecordedClassAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationUnrecordedClassAttendance <- function(NotificationUnrecordedClassAttendanceID, EntityID = 1, returnNotificationUnrecordedClassAttendanceID = F, returnCreatedTime = F, returnDisplayPeriodID = F, returnModifiedTime = F, returnNotificationID = 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("MessageCenter", "NotificationUnrecordedClassAttendance", NotificationUnrecordedClassAttendanceID, searchFields, EntityID)
}
#' Modify a specific NotificationUnrecordedClassAttendance
#'
#' This function modifies fields for a NotificationUnrecordedClassAttendance.
#'
#' @param NotificationUnrecordedClassAttendanceID The id of the NotificationUnrecordedClassAttendance to be modified.\cr Run \code{\link{getAllNotificationUnrecordedClassAttendances}} for a list of NotificationUnrecordedClassAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationUnrecordedClassAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationUnrecordedClassAttendance <- function(NotificationUnrecordedClassAttendanceID, EntityID = 1, setDisplayPeriodID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationUnrecordedClassAttendance", NotificationUnrecordedClassAttendanceID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationUnrecordedClassAttendance.
#'
#' This function creates a new NotificationUnrecordedClassAttendance.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationUnrecordedClassAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationUnrecordedClassAttendance <- function(EntityID = 1, setDisplayPeriodID = NULL, setNotificationID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationUnrecordedClassAttendance", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationUnrecordedClassAttendance
#'
#' This function deletes a NotificationUnrecordedClassAttendance.
#'
#' @param NotificationUnrecordedClassAttendanceID The id of the NotificationUnrecordedClassAttendance.\cr Run \code{\link{getAllNotificationUnrecordedClassAttendances}} for a list of NotificationUnrecordedClassAttendances.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationUnrecordedClassAttendance.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationUnrecordedClassAttendance <- function(NotificationUnrecordedClassAttendanceID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationUnrecordedClassAttendance", NotificationUnrecordedClassAttendanceID, EntityID)
}
#' Get all NotificationWithdrawalCodes.
#'
#' This function returns a dataframe of all NotificationWithdrawalCodes in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All NotificationWithdrawalCodes in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllNotificationWithdrawalCodes <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnNotificationWithdrawalCodeID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWithdrawalCodeID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "NotificationWithdrawalCode", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific NotificationWithdrawalCode
#'
#' This function returns fields for a NotificationWithdrawalCode.
#'
#' @param NotificationWithdrawalCodeID The id of the NotificationWithdrawalCode.\cr Run \code{\link{getAllNotificationWithdrawalCodes}} for a list of NotificationWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the NotificationWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getNotificationWithdrawalCode <- function(NotificationWithdrawalCodeID, EntityID = 1, returnNotificationWithdrawalCodeID = F, returnCreatedTime = F, returnModifiedTime = F, returnNotificationID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnWithdrawalCodeID = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "NotificationWithdrawalCode", NotificationWithdrawalCodeID, searchFields, EntityID)
}
#' Modify a specific NotificationWithdrawalCode
#'
#' This function modifies fields for a NotificationWithdrawalCode.
#'
#' @param NotificationWithdrawalCodeID The id of the NotificationWithdrawalCode to be modified.\cr Run \code{\link{getAllNotificationWithdrawalCodes}} for a list of NotificationWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified NotificationWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyNotificationWithdrawalCode <- function(NotificationWithdrawalCodeID, EntityID = 1, setNotificationID = NULL, setWithdrawalCodeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "NotificationWithdrawalCode", NotificationWithdrawalCodeID, names(functionParams), functionParams, EntityID)
}
#' Create new NotificationWithdrawalCode.
#'
#' This function creates a new NotificationWithdrawalCode.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created NotificationWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createNotificationWithdrawalCode <- function(EntityID = 1, setNotificationID = NULL, setWithdrawalCodeID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "NotificationWithdrawalCode", names(functionParams), functionParams, EntityID)
}
#' Delete a specific NotificationWithdrawalCode
#'
#' This function deletes a NotificationWithdrawalCode.
#'
#' @param NotificationWithdrawalCodeID The id of the NotificationWithdrawalCode.\cr Run \code{\link{getAllNotificationWithdrawalCodes}} for a list of NotificationWithdrawalCodes.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted NotificationWithdrawalCode.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteNotificationWithdrawalCode <- function(NotificationWithdrawalCodeID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "NotificationWithdrawalCode", NotificationWithdrawalCodeID, EntityID)
}
#' Get all QueuedCompletedCareerPlanChangeNotifications.
#'
#' This function returns a dataframe of all QueuedCompletedCareerPlanChangeNotifications in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All QueuedCompletedCareerPlanChangeNotifications in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQueuedCompletedCareerPlanChangeNotifications <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQueuedCompletedCareerPlanChangeNotificationID = F, returnCareerPlanGradeLevelIDCurrent = F, returnCareerPlanGradeLevelIDPrevious = F, returnCreatedTime = F, returnCreditsCurrent = F, returnCreditsPrevious = F, returnCurriculumID = F, returnEntityID = F, returnIsDeletedRecord = F, returnIsNewRecord = F, returnIsSent = F, returnIsStudentPermittedToChangeGradeLevelCurrent = F, returnIsStudentPermittedToChangeGradeLevelPrevious = F, returnIsStudentPermittedToDeleteCurrent = F, returnIsStudentPermittedToDeletePrevious = F, returnModifiedTime = F, returnNotificationID = F, returnSchoolYearID = F, returnStudentCareerPlanID = F, returnStudentCourseRequestIDCurrent = F, returnStudentCourseRequestIDPrevious = F, returnStudentID = F, returnStudentSubAreaIDCurrent = F, returnStudentSubAreaIDPrevious = 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("MessageCenter", "QueuedCompletedCareerPlanChangeNotification", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific QueuedCompletedCareerPlanChangeNotification
#'
#' This function returns fields for a QueuedCompletedCareerPlanChangeNotification.
#'
#' @param QueuedCompletedCareerPlanChangeNotificationID The id of the QueuedCompletedCareerPlanChangeNotification.\cr Run \code{\link{getAllQueuedCompletedCareerPlanChangeNotifications}} for a list of QueuedCompletedCareerPlanChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the QueuedCompletedCareerPlanChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQueuedCompletedCareerPlanChangeNotification <- function(QueuedCompletedCareerPlanChangeNotificationID, EntityID = 1, returnQueuedCompletedCareerPlanChangeNotificationID = F, returnCareerPlanGradeLevelIDCurrent = F, returnCareerPlanGradeLevelIDPrevious = F, returnCreatedTime = F, returnCreditsCurrent = F, returnCreditsPrevious = F, returnCurriculumID = F, returnEntityID = F, returnIsDeletedRecord = F, returnIsNewRecord = F, returnIsSent = F, returnIsStudentPermittedToChangeGradeLevelCurrent = F, returnIsStudentPermittedToChangeGradeLevelPrevious = F, returnIsStudentPermittedToDeleteCurrent = F, returnIsStudentPermittedToDeletePrevious = F, returnModifiedTime = F, returnNotificationID = F, returnSchoolYearID = F, returnStudentCareerPlanID = F, returnStudentCourseRequestIDCurrent = F, returnStudentCourseRequestIDPrevious = F, returnStudentID = F, returnStudentSubAreaIDCurrent = F, returnStudentSubAreaIDPrevious = 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("MessageCenter", "QueuedCompletedCareerPlanChangeNotification", QueuedCompletedCareerPlanChangeNotificationID, searchFields, EntityID)
}
#' Modify a specific QueuedCompletedCareerPlanChangeNotification
#'
#' This function modifies fields for a QueuedCompletedCareerPlanChangeNotification.
#'
#' @param QueuedCompletedCareerPlanChangeNotificationID The id of the QueuedCompletedCareerPlanChangeNotification to be modified.\cr Run \code{\link{getAllQueuedCompletedCareerPlanChangeNotifications}} for a list of QueuedCompletedCareerPlanChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified QueuedCompletedCareerPlanChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQueuedCompletedCareerPlanChangeNotification <- function(QueuedCompletedCareerPlanChangeNotificationID, EntityID = 1, setCareerPlanGradeLevelIDCurrent = NULL, setCareerPlanGradeLevelIDPrevious = NULL, setCreditsCurrent = NULL, setCreditsPrevious = NULL, setCurriculumID = NULL, setEntityID = NULL, setIsDeletedRecord = NULL, setIsNewRecord = NULL, setIsSent = NULL, setIsStudentPermittedToChangeGradeLevelCurrent = NULL, setIsStudentPermittedToChangeGradeLevelPrevious = NULL, setIsStudentPermittedToDeleteCurrent = NULL, setIsStudentPermittedToDeletePrevious = NULL, setNotificationID = NULL, setSchoolYearID = NULL, setStudentCareerPlanID = NULL, setStudentCourseRequestIDCurrent = NULL, setStudentCourseRequestIDPrevious = NULL, setStudentID = NULL, setStudentSubAreaIDCurrent = NULL, setStudentSubAreaIDPrevious = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "QueuedCompletedCareerPlanChangeNotification", QueuedCompletedCareerPlanChangeNotificationID, names(functionParams), functionParams, EntityID)
}
#' Create new QueuedCompletedCareerPlanChangeNotification.
#'
#' This function creates a new QueuedCompletedCareerPlanChangeNotification.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created QueuedCompletedCareerPlanChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQueuedCompletedCareerPlanChangeNotification <- function(EntityID = 1, setCareerPlanGradeLevelIDCurrent = NULL, setCareerPlanGradeLevelIDPrevious = NULL, setCreditsCurrent = NULL, setCreditsPrevious = NULL, setCurriculumID = NULL, setEntityID = NULL, setIsDeletedRecord = NULL, setIsNewRecord = NULL, setIsSent = NULL, setIsStudentPermittedToChangeGradeLevelCurrent = NULL, setIsStudentPermittedToChangeGradeLevelPrevious = NULL, setIsStudentPermittedToDeleteCurrent = NULL, setIsStudentPermittedToDeletePrevious = NULL, setNotificationID = NULL, setSchoolYearID = NULL, setStudentCareerPlanID = NULL, setStudentCourseRequestIDCurrent = NULL, setStudentCourseRequestIDPrevious = NULL, setStudentID = NULL, setStudentSubAreaIDCurrent = NULL, setStudentSubAreaIDPrevious = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "QueuedCompletedCareerPlanChangeNotification", names(functionParams), functionParams, EntityID)
}
#' Delete a specific QueuedCompletedCareerPlanChangeNotification
#'
#' This function deletes a QueuedCompletedCareerPlanChangeNotification.
#'
#' @param QueuedCompletedCareerPlanChangeNotificationID The id of the QueuedCompletedCareerPlanChangeNotification.\cr Run \code{\link{getAllQueuedCompletedCareerPlanChangeNotifications}} for a list of QueuedCompletedCareerPlanChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted QueuedCompletedCareerPlanChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQueuedCompletedCareerPlanChangeNotification <- function(QueuedCompletedCareerPlanChangeNotificationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "QueuedCompletedCareerPlanChangeNotification", QueuedCompletedCareerPlanChangeNotificationID, EntityID)
}
#' Get all QueuedCompletedGradeChangeNotifications.
#'
#' This function returns a dataframe of all QueuedCompletedGradeChangeNotifications in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All QueuedCompletedGradeChangeNotifications in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllQueuedCompletedGradeChangeNotifications <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnQueuedCompletedGradeChangeNotificationID = F, returnCreatedTime = F, returnEntityID = F, returnGradeMarkIDCurrent = F, returnGradeMarkIDPrevious = F, returnIsSent = F, returnModifiedTime = F, returnNotificationID = F, returnSchoolYearID = F, returnStudentGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "QueuedCompletedGradeChangeNotification", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific QueuedCompletedGradeChangeNotification
#'
#' This function returns fields for a QueuedCompletedGradeChangeNotification.
#'
#' @param QueuedCompletedGradeChangeNotificationID The id of the QueuedCompletedGradeChangeNotification.\cr Run \code{\link{getAllQueuedCompletedGradeChangeNotifications}} for a list of QueuedCompletedGradeChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the QueuedCompletedGradeChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getQueuedCompletedGradeChangeNotification <- function(QueuedCompletedGradeChangeNotificationID, EntityID = 1, returnQueuedCompletedGradeChangeNotificationID = F, returnCreatedTime = F, returnEntityID = F, returnGradeMarkIDCurrent = F, returnGradeMarkIDPrevious = F, returnIsSent = F, returnModifiedTime = F, returnNotificationID = F, returnSchoolYearID = F, returnStudentGradeBucketID = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "QueuedCompletedGradeChangeNotification", QueuedCompletedGradeChangeNotificationID, searchFields, EntityID)
}
#' Modify a specific QueuedCompletedGradeChangeNotification
#'
#' This function modifies fields for a QueuedCompletedGradeChangeNotification.
#'
#' @param QueuedCompletedGradeChangeNotificationID The id of the QueuedCompletedGradeChangeNotification to be modified.\cr Run \code{\link{getAllQueuedCompletedGradeChangeNotifications}} for a list of QueuedCompletedGradeChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified QueuedCompletedGradeChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyQueuedCompletedGradeChangeNotification <- function(QueuedCompletedGradeChangeNotificationID, EntityID = 1, setEntityID = NULL, setGradeMarkIDCurrent = NULL, setGradeMarkIDPrevious = NULL, setIsSent = NULL, setNotificationID = NULL, setSchoolYearID = NULL, setStudentGradeBucketID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "QueuedCompletedGradeChangeNotification", QueuedCompletedGradeChangeNotificationID, names(functionParams), functionParams, EntityID)
}
#' Create new QueuedCompletedGradeChangeNotification.
#'
#' This function creates a new QueuedCompletedGradeChangeNotification.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created QueuedCompletedGradeChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createQueuedCompletedGradeChangeNotification <- function(EntityID = 1, setEntityID = NULL, setGradeMarkIDCurrent = NULL, setGradeMarkIDPrevious = NULL, setIsSent = NULL, setNotificationID = NULL, setSchoolYearID = NULL, setStudentGradeBucketID = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "QueuedCompletedGradeChangeNotification", names(functionParams), functionParams, EntityID)
}
#' Delete a specific QueuedCompletedGradeChangeNotification
#'
#' This function deletes a QueuedCompletedGradeChangeNotification.
#'
#' @param QueuedCompletedGradeChangeNotificationID The id of the QueuedCompletedGradeChangeNotification.\cr Run \code{\link{getAllQueuedCompletedGradeChangeNotifications}} for a list of QueuedCompletedGradeChangeNotifications.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted QueuedCompletedGradeChangeNotification.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteQueuedCompletedGradeChangeNotification <- function(QueuedCompletedGradeChangeNotificationID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "QueuedCompletedGradeChangeNotification", QueuedCompletedGradeChangeNotificationID, EntityID)
}
#' Get all SystemEmailTypeConfigs.
#'
#' This function returns a dataframe of all SystemEmailTypeConfigs in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All SystemEmailTypeConfigs in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllSystemEmailTypeConfigs <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnSystemEmailTypeConfigID = F, returnCreatedTime = F, returnEmailRecipientType = F, returnEmailTypeID = F, returnModifiedTime = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "SystemEmailTypeConfig", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific SystemEmailTypeConfig
#'
#' This function returns fields for a SystemEmailTypeConfig.
#'
#' @param SystemEmailTypeConfigID The id of the SystemEmailTypeConfig.\cr Run \code{\link{getAllSystemEmailTypeConfigs}} for a list of SystemEmailTypeConfigs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the SystemEmailTypeConfig.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getSystemEmailTypeConfig <- function(SystemEmailTypeConfigID, EntityID = 1, returnSystemEmailTypeConfigID = F, returnCreatedTime = F, returnEmailRecipientType = F, returnEmailTypeID = F, returnModifiedTime = F, returnRank = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "SystemEmailTypeConfig", SystemEmailTypeConfigID, searchFields, EntityID)
}
#' Modify a specific SystemEmailTypeConfig
#'
#' This function modifies fields for a SystemEmailTypeConfig.
#'
#' @param SystemEmailTypeConfigID The id of the SystemEmailTypeConfig to be modified.\cr Run \code{\link{getAllSystemEmailTypeConfigs}} for a list of SystemEmailTypeConfigs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified SystemEmailTypeConfig.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifySystemEmailTypeConfig <- function(SystemEmailTypeConfigID, EntityID = 1, setEmailRecipientType = NULL, setEmailTypeID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "SystemEmailTypeConfig", SystemEmailTypeConfigID, names(functionParams), functionParams, EntityID)
}
#' Create new SystemEmailTypeConfig.
#'
#' This function creates a new SystemEmailTypeConfig.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created SystemEmailTypeConfig.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createSystemEmailTypeConfig <- function(EntityID = 1, setEmailRecipientType = NULL, setEmailTypeID = NULL, setRank = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "SystemEmailTypeConfig", names(functionParams), functionParams, EntityID)
}
#' Delete a specific SystemEmailTypeConfig
#'
#' This function deletes a SystemEmailTypeConfig.
#'
#' @param SystemEmailTypeConfigID The id of the SystemEmailTypeConfig.\cr Run \code{\link{getAllSystemEmailTypeConfigs}} for a list of SystemEmailTypeConfigs.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted SystemEmailTypeConfig.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteSystemEmailTypeConfig <- function(SystemEmailTypeConfigID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "SystemEmailTypeConfig", SystemEmailTypeConfigID, EntityID)
}
#' Get all TempMessages.
#'
#' This function returns a dataframe of all TempMessages in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All TempMessages in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllTempMessages <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnTempMessageID = F, returnCreatedTime = F, returnModifiedTime = F, returnRecipientName = F, returnRelationship = F, returnSectionInfo = F, returnStudentName = 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("MessageCenter", "TempMessage", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific TempMessage
#'
#' This function returns fields for a TempMessage.
#'
#' @param TempMessageID The id of the TempMessage.\cr Run \code{\link{getAllTempMessages}} for a list of TempMessages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the TempMessage.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getTempMessage <- function(TempMessageID, EntityID = 1, returnTempMessageID = F, returnCreatedTime = F, returnModifiedTime = F, returnRecipientName = F, returnRelationship = F, returnSectionInfo = F, returnStudentName = 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("MessageCenter", "TempMessage", TempMessageID, searchFields, EntityID)
}
#' Modify a specific TempMessage
#'
#' This function modifies fields for a TempMessage.
#'
#' @param TempMessageID The id of the TempMessage to be modified.\cr Run \code{\link{getAllTempMessages}} for a list of TempMessages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified TempMessage.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyTempMessage <- function(TempMessageID, EntityID = 1, setRecipientName = NULL, setRelationship = NULL, setSectionInfo = NULL, setStudentName = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "TempMessage", TempMessageID, names(functionParams), functionParams, EntityID)
}
#' Create new TempMessage.
#'
#' This function creates a new TempMessage.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created TempMessage.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createTempMessage <- function(EntityID = 1, setRecipientName = NULL, setRelationship = NULL, setSectionInfo = NULL, setStudentName = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "TempMessage", names(functionParams), functionParams, EntityID)
}
#' Delete a specific TempMessage
#'
#' This function deletes a TempMessage.
#'
#' @param TempMessageID The id of the TempMessage.\cr Run \code{\link{getAllTempMessages}} for a list of TempMessages.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted TempMessage.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteTempMessage <- function(TempMessageID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "TempMessage", TempMessageID, EntityID)
}
#' Get all UserMessageSettings.
#'
#' This function returns a dataframe of all UserMessageSettings in the database.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param searchConditionsList A list of search conditions to filter results which are joined by the searchConditionsGroupType. Of the form {FieldName} {ConditionType} {SearchCondition}. For example, c('StudentID LessEqual 500', 'LastName Like Ander\%'). Run \code{\link{getAllSearchConditionTypes}} for a list of ConditionTypes. Defaults to NULL (unfiltered).
#' @param searchConditionsGroupType The conjunction which joins multiple searchConditions in the searchConditionsList. Either 'Or' or 'And'. Defaults to 'And'.
#' @param searchSortFieldNamesList The list of fields sort results by. Defaults to NULL (unsorted).
#' @param searchSortFieldNamesDescendingList A list of T/F values corresponding to whether to sort each field in searchSortFieldNamesList in descending order. Defaults to F for each FieldName in searchSortFieldNamesList.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return All UserMessageSettings in the database.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getAllUserMessageSettings <- function(EntityID = 1, searchConditionsList = NULL, searchConditionsGroupType = "And", searchSortFieldNamesList = NULL, searchSortFieldNamesDescendingList = rep(F, length(searchSortFieldNamesList)), page = 1, pageSize = "100000", returnUserMessageSettingID = F, returnAssignmentScoreHighNotification = F, returnAssignmentScoreHighNotificationEmail = F, returnAssignmentScoreLowNotification = F, returnAssignmentScoreLowNotificationEmail = F, returnCopyAttendanceMessagesToEmail = F, returnCopyDisciplineMessagesToEmail = F, returnCopyEnrollmentMessagesToEmail = F, returnCopyFamilyAccessMessagesToEmail = F, returnCopyFeeManagementMessagesToEmail = F, returnCopyFoodServiceMessagesToEmail = F, returnCopyGradebookMessagesToEmail = F, returnCopyGradingMessagesToEmail = F, returnCopyGraduationRequirementsMessagesToEmail = F, returnCopyMessagesToEmail = F, returnCopyOnlineFormMessagesToEmail = F, returnCopySchedulingMessagesToEmail = F, returnCreatedTime = F, returnCurrentGradeScoreHighNotification = F, returnCurrentGradeScoreHighNotificationEmail = F, returnCurrentGradeScoreLowNotification = F, returnCurrentGradeScoreLowNotificationEmail = F, returnEnableCompletedCareerPlanChangeNotification = F, returnEnableCompletedCareerPlanChangeNotificationEmail = F, returnEnableCompletedGradeChangeNotification = F, returnEnableCompletedGradeChangeNotificationEmail = F, returnEnableGradebookGradeChangeRequestDeniedEmail = F, returnEnableGradebookGradeChangeRequestNotificationEmail = F, returnEnableGradebookLastEntryNotificationEmail = F, returnEnableOnlineAssignmentAvailableNotificationEmail = F, returnEnableOnlineAssingmentScoresAvailableNotificationEmail = F, returnEnableStudentScheduleChangeNotification = F, returnEnableStudentScheduleChangeNotificationEmail = F, returnGradebookHighAssignmentThreshold = F, returnGradebookHighThreshold = F, returnGradebookLowAssignmentThreshold = F, returnGradebookLowThreshold = F, returnMissingAssignmentNotification = F, returnMissingAssignmentNotificationEmail = F, returnModifiedTime = F, returnOnlySendAssignmentScoreHighNotificationsOncePerAssignment = F, returnOnlySendAssignmentScoreLowNotificationsOncePerAssignment = F, returnOnlySendCurrentGradeScoreHighNotificationsOnce = F, returnOnlySendCurrentGradeScoreLowNotificationsOnce = F, returnOnlySendMissingAssignmentNotificationForCurrentGradingPeriod = F, returnOnlySendMissingAssignmentNotificationsOncePerAssignment = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDOwner = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getAllDataObjectsForObject("MessageCenter", "UserMessageSetting", searchFields, EntityID, searchConditionsList, searchConditionsGroupType, searchSortFieldNamesList, searchSortFieldNamesDescendingList, page, pageSize)
}
#' Get a specific UserMessageSetting
#'
#' This function returns fields for an UserMessageSetting.
#'
#' @param UserMessageSettingID The id of the UserMessageSetting.\cr Run \code{\link{getAllUserMessageSettings}} for a list of UserMessageSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param return{FieldName} A TRUE or FALSE value determining whether or not to return {FieldName} for the given object. Defaults to FALSE for all return fields which for convenience returns all fields for the object.
#' @concept MessageCenter
#' @return Details for the UserMessageSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
getUserMessageSetting <- function(UserMessageSettingID, EntityID = 1, returnUserMessageSettingID = F, returnAssignmentScoreHighNotification = F, returnAssignmentScoreHighNotificationEmail = F, returnAssignmentScoreLowNotification = F, returnAssignmentScoreLowNotificationEmail = F, returnCopyAttendanceMessagesToEmail = F, returnCopyDisciplineMessagesToEmail = F, returnCopyEnrollmentMessagesToEmail = F, returnCopyFamilyAccessMessagesToEmail = F, returnCopyFeeManagementMessagesToEmail = F, returnCopyFoodServiceMessagesToEmail = F, returnCopyGradebookMessagesToEmail = F, returnCopyGradingMessagesToEmail = F, returnCopyGraduationRequirementsMessagesToEmail = F, returnCopyMessagesToEmail = F, returnCopyOnlineFormMessagesToEmail = F, returnCopySchedulingMessagesToEmail = F, returnCreatedTime = F, returnCurrentGradeScoreHighNotification = F, returnCurrentGradeScoreHighNotificationEmail = F, returnCurrentGradeScoreLowNotification = F, returnCurrentGradeScoreLowNotificationEmail = F, returnEnableCompletedCareerPlanChangeNotification = F, returnEnableCompletedCareerPlanChangeNotificationEmail = F, returnEnableCompletedGradeChangeNotification = F, returnEnableCompletedGradeChangeNotificationEmail = F, returnEnableGradebookGradeChangeRequestDeniedEmail = F, returnEnableGradebookGradeChangeRequestNotificationEmail = F, returnEnableGradebookLastEntryNotificationEmail = F, returnEnableOnlineAssignmentAvailableNotificationEmail = F, returnEnableOnlineAssingmentScoresAvailableNotificationEmail = F, returnEnableStudentScheduleChangeNotification = F, returnEnableStudentScheduleChangeNotificationEmail = F, returnGradebookHighAssignmentThreshold = F, returnGradebookHighThreshold = F, returnGradebookLowAssignmentThreshold = F, returnGradebookLowThreshold = F, returnMissingAssignmentNotification = F, returnMissingAssignmentNotificationEmail = F, returnModifiedTime = F, returnOnlySendAssignmentScoreHighNotificationsOncePerAssignment = F, returnOnlySendAssignmentScoreLowNotificationsOncePerAssignment = F, returnOnlySendCurrentGradeScoreHighNotificationsOnce = F, returnOnlySendCurrentGradeScoreLowNotificationsOnce = F, returnOnlySendMissingAssignmentNotificationForCurrentGradingPeriod = F, returnOnlySendMissingAssignmentNotificationsOncePerAssignment = F, returnUserIDCreatedBy = F, returnUserIDModifiedBy = F, returnUserIDOwner = F){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
searchFields <- names(functionParams)[(unlist(lapply(functionParams, function(x) ifelse(length(x) == 1, x == T, F)))) & (names(functionParams) %>% stringr::str_detect("^return"))]
if(length(searchFields) == 0) searchFields <- names(functionParams)[names(functionParams) %>% stringr::str_detect("^return")]
searchFields <- searchFields %>% stringr::str_replace("return", "")
getDataObject("MessageCenter", "UserMessageSetting", UserMessageSettingID, searchFields, EntityID)
}
#' Modify a specific UserMessageSetting
#'
#' This function modifies fields for an UserMessageSetting.
#'
#' @param UserMessageSettingID The id of the UserMessageSetting to be modified.\cr Run \code{\link{getAllUserMessageSettings}} for a list of UserMessageSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return Details of the modified UserMessageSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
modifyUserMessageSetting <- function(UserMessageSettingID, EntityID = 1, setAssignmentScoreHighNotification = NULL, setAssignmentScoreHighNotificationEmail = NULL, setAssignmentScoreLowNotification = NULL, setAssignmentScoreLowNotificationEmail = NULL, setCopyAttendanceMessagesToEmail = NULL, setCopyDisciplineMessagesToEmail = NULL, setCopyEnrollmentMessagesToEmail = NULL, setCopyFamilyAccessMessagesToEmail = NULL, setCopyFeeManagementMessagesToEmail = NULL, setCopyFoodServiceMessagesToEmail = NULL, setCopyGradebookMessagesToEmail = NULL, setCopyGradingMessagesToEmail = NULL, setCopyGraduationRequirementsMessagesToEmail = NULL, setCopyMessagesToEmail = NULL, setCopyOnlineFormMessagesToEmail = NULL, setCopySchedulingMessagesToEmail = NULL, setCurrentGradeScoreHighNotification = NULL, setCurrentGradeScoreHighNotificationEmail = NULL, setCurrentGradeScoreLowNotification = NULL, setCurrentGradeScoreLowNotificationEmail = NULL, setEnableCompletedCareerPlanChangeNotification = NULL, setEnableCompletedCareerPlanChangeNotificationEmail = NULL, setEnableCompletedGradeChangeNotification = NULL, setEnableCompletedGradeChangeNotificationEmail = NULL, setEnableGradebookGradeChangeRequestDeniedEmail = NULL, setEnableGradebookGradeChangeRequestNotificationEmail = NULL, setEnableGradebookLastEntryNotificationEmail = NULL, setEnableOnlineAssignmentAvailableNotificationEmail = NULL, setEnableOnlineAssingmentScoresAvailableNotificationEmail = NULL, setEnableStudentScheduleChangeNotification = NULL, setEnableStudentScheduleChangeNotificationEmail = NULL, setGradebookHighAssignmentThreshold = NULL, setGradebookHighThreshold = NULL, setGradebookLowAssignmentThreshold = NULL, setGradebookLowThreshold = NULL, setMissingAssignmentNotification = NULL, setMissingAssignmentNotificationEmail = NULL, setOnlySendAssignmentScoreHighNotificationsOncePerAssignment = NULL, setOnlySendAssignmentScoreLowNotificationsOncePerAssignment = NULL, setOnlySendCurrentGradeScoreHighNotificationsOnce = NULL, setOnlySendCurrentGradeScoreLowNotificationsOnce = NULL, setOnlySendMissingAssignmentNotificationForCurrentGradingPeriod = NULL, setOnlySendMissingAssignmentNotificationsOncePerAssignment = NULL, setUserIDOwner = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-(1:2)]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
modifyDataObject("MessageCenter", "UserMessageSetting", UserMessageSettingID, names(functionParams), functionParams, EntityID)
}
#' Create new UserMessageSetting.
#'
#' This function creates a new UserMessageSetting.
#'
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @param set{FieldName} Values to set {FieldName} to for the given object. Defaults to NULL for all set fields which does not set the field's value.
#' @concept MessageCenter
#' @return The fields used to define the newly created UserMessageSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
createUserMessageSetting <- function(EntityID = 1, setAssignmentScoreHighNotification = NULL, setAssignmentScoreHighNotificationEmail = NULL, setAssignmentScoreLowNotification = NULL, setAssignmentScoreLowNotificationEmail = NULL, setCopyAttendanceMessagesToEmail = NULL, setCopyDisciplineMessagesToEmail = NULL, setCopyEnrollmentMessagesToEmail = NULL, setCopyFamilyAccessMessagesToEmail = NULL, setCopyFeeManagementMessagesToEmail = NULL, setCopyFoodServiceMessagesToEmail = NULL, setCopyGradebookMessagesToEmail = NULL, setCopyGradingMessagesToEmail = NULL, setCopyGraduationRequirementsMessagesToEmail = NULL, setCopyMessagesToEmail = NULL, setCopyOnlineFormMessagesToEmail = NULL, setCopySchedulingMessagesToEmail = NULL, setCurrentGradeScoreHighNotification = NULL, setCurrentGradeScoreHighNotificationEmail = NULL, setCurrentGradeScoreLowNotification = NULL, setCurrentGradeScoreLowNotificationEmail = NULL, setEnableCompletedCareerPlanChangeNotification = NULL, setEnableCompletedCareerPlanChangeNotificationEmail = NULL, setEnableCompletedGradeChangeNotification = NULL, setEnableCompletedGradeChangeNotificationEmail = NULL, setEnableGradebookGradeChangeRequestDeniedEmail = NULL, setEnableGradebookGradeChangeRequestNotificationEmail = NULL, setEnableGradebookLastEntryNotificationEmail = NULL, setEnableOnlineAssignmentAvailableNotificationEmail = NULL, setEnableOnlineAssingmentScoresAvailableNotificationEmail = NULL, setEnableStudentScheduleChangeNotification = NULL, setEnableStudentScheduleChangeNotificationEmail = NULL, setGradebookHighAssignmentThreshold = NULL, setGradebookHighThreshold = NULL, setGradebookLowAssignmentThreshold = NULL, setGradebookLowThreshold = NULL, setMissingAssignmentNotification = NULL, setMissingAssignmentNotificationEmail = NULL, setOnlySendAssignmentScoreHighNotificationsOncePerAssignment = NULL, setOnlySendAssignmentScoreLowNotificationsOncePerAssignment = NULL, setOnlySendCurrentGradeScoreHighNotificationsOnce = NULL, setOnlySendCurrentGradeScoreLowNotificationsOnce = NULL, setOnlySendMissingAssignmentNotificationForCurrentGradingPeriod = NULL, setOnlySendMissingAssignmentNotificationsOncePerAssignment = NULL, setUserIDOwner = NULL){
suppressMessages(suppressWarnings(require(dplyr)))
functionParams <- as.list(environment())[-1]
functionParams <- functionParams[which(unlist(lapply(functionParams, function(x) length(x) > 0)))]
names(functionParams) <- names(functionParams) %>% stringr::str_replace("set", "")
createDataObject("MessageCenter", "UserMessageSetting", names(functionParams), functionParams, EntityID)
}
#' Delete a specific UserMessageSetting
#'
#' This function deletes an UserMessageSetting.
#'
#' @param UserMessageSettingID The id of the UserMessageSetting.\cr Run \code{\link{getAllUserMessageSettings}} for a list of UserMessageSettings.
#' @param EntityID The id of the entity. Run \code{\link{getAllEntities}} for a list of entities.
#' @concept MessageCenter
#' @return The id of the deleted UserMessageSetting.
#' @section References:
#' \{yourApiUrl\}/swagger\cr\cr
#' \href{https://help.skyward.com/}{Skyward's Knowledge Hub}
#' @export
deleteUserMessageSetting <- function(UserMessageSettingID, EntityID = 1){
suppressMessages(suppressWarnings(require(dplyr)))
deleteDataObject("MessageCenter", "UserMessageSetting", UserMessageSettingID, EntityID)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.