Get content access permissions for a group or groups
Value
A tibble with the following columns:
group_guid
: The group's GUIDgroup_name
: The group's namecontent_guid
: The content item's GUIDcontent_name
: The content item's namecontent_title
: The content item's titleaccess_type
: The access type of the content item ("all", "logged_in", or "acl")role
: The access type that members of the group have to the content item, "publisher" or "viewer".
See also
Other groups functions:
get_group_members()
,
get_groups()
Examples
if (FALSE) { # \dontrun{
library(connectapi)
client <- connect()
# Get a data frame of groups
groups <- get_groups(client)
# Get permissions for a single group by passing in the corresponding row.
get_group_content(client, groups[1, "guid"])
dplyr::filter(groups, name = "research_scientists") %>%
dplyr::pull(guid) %>%
get_group_content(client, .)
# Get permissions for all groups by passing in all group guids.
get_group_content(client, groups$guid)
} # }