install.packages("tidyverse")
install.packages("funModeling")
install.packages("Hmisc")
library(funModeling)
library(tidyverse)
library(Hmisc)
View the data frame for domain and channel edges.
data.frame(SerbTme_all_stats)
View the data frame for channel edges only.
data.frame(SerbTme_tme_stats)
Function list
basic_eda <- function(SerbTme_all_stats)
{
glimpse(SerbTme_all_stats)
df_status(SerbTme_all_stats)
freq(SerbTme_all_stats)
profiling_num(SerbTme_all_stats)
plot_num(SerbTme_all_stats)
describe(SerbTme_all_stats)
}
basic_eda(SerbTme_all_stats)
basic_eda <- function(SerbTme_tme_stats)
{
glimpse(SerbTme_tme_stats)
df_status(SerbTme_tme_stats)
freq(SerbTme_tme_stats)
profiling_num(SerbTme_tme_stats)
plot_num(SerbTme_tme_stats)
describe(SerbTme_tme_stats)
}
basic_eda(SerbTme_tme_stats)
basic_eda <- function(SerbTme_tme_edges)
{
glimpse(SerbTme_tme_edges)
df_status(SerbTme_tme_edges)
freq(SerbTme_tme_edges)
profiling_num(SerbTme_tme_edges)
plot_num(SerbTme_tme_edges)
describe(SerbTme_tme_edges)
}
basic_eda(SerbTme_tme_edges)
Frequency for dataset appearance counts and cumulative and absolute percentages.
freq(data=SerbTme_all_stats, input = c('share counts','# datasets'))
freq(data=SerbTme_tme_stats, input = c('share counts','# datasets'))
Profiling numbers.
profiling_num(SerbTme_all_stats)
profiling_num(SerbTme_tme_stats)
Summary statistics for total share counts and dataset appearances per source.
view(SerbTme_all_edges)
summary.data.frame(SerbTme_all_edges)
view(SerbTme_all_stats)
summary.data.frame(SerbTme_all_stats)