R语言
zaza0_0
这个作者很懒,什么都没留下…
展开
-
【R语言】facet并不包含全部level的处理, 不同facet调节ylim,ggarrange合并两个ggplot保留配色,并且使用全部水平legend
ggplot合并两个facet, facet每个图调刻度原创 2022-11-05 07:13:34 · 693 阅读 · 0 评论 -
【R语言】ggplot pie plot +facet_wrap + txt
ggplot pie chart原创 2022-11-02 00:50:57 · 221 阅读 · 0 评论 -
【R语言】对模拟结果的3维array进行latex表格制作
由于有的表格比较复杂,直接用xtable不好输出,可以先生成csv文件,再用latextablegenerator之类的在线latex表格生成器生成。n_list = c(30, 90)method_list = c(1, 3, 7, 2, 4, 8, 5, 6)metric_list = c(1, 3, 4:(4+p.x-1), 10)weight=5m = 20gen.table <- function(n_list, method_list, metric_list){ tab原创 2021-12-14 16:24:33 · 493 阅读 · 0 评论 -
【R语言】ggplot对3维array模拟结果数据绘图
library(ggplot2)n_list = c(30, 60, 90)method_list = c(1, 3, 7, 2, 4, 8, 5, 6)metric_list = c(1, 3, 4:(4+2*p.x))weight=5m = 20for(n in n_list){ file_name = paste("results/p.x", p.x, "p.z",p.z, "n",n,"m",m, "sigma", sigma,"nrep",nrep, "weight", weig原创 2021-12-14 15:54:55 · 1485 阅读 · 0 评论 -
【R语言】处理3维数组(array)进行折线图绘制的函数
lineplot.process=function(n_list, method_list, metric_list){ plot_meandat = NULL plot_sddat =NULL for(n in n_list) { file_name = paste("results/p.x", p.x, "p.z",p.z, "n",n,"m",m, "sigma", sigma,"nrep",nrep, "weight", weight,"one",onelevel, sep原创 2021-12-04 10:31:43 · 1591 阅读 · 0 评论 -
【R语言】Error in eval(.FLXgetGroupingVar(formula), data) : 数值‘envir‘参数的长度不是一;Error in eval(.FLXgetGr
把矩阵变为Data.frame形式就行了。原创 2021-09-21 16:03:29 · 794 阅读 · 0 评论 -
【R语言】正则表达式提取特定字符串
> tmp = strsplit(as.character(colname[i, ]),'[0-9]') # 先拆分出想要的子字符串> tmp[[1]][1] "" "" [3] " - " "" [5] "原创 2021-09-01 21:52:15 · 2567 阅读 · 0 评论 -
【ggplot】合并两个ggplot图片
library(ggpubr)p=ggarrange(p1, p2, labels = c("A", "B"), ncol = 1, common.legend = TRUE, legend = "none")p原创 2021-05-03 08:55:11 · 1054 阅读 · 0 评论 -
【R语言】创建设计阵model.matrix
x = model.matrix(~.,as.data.frame(x))[,-1]原创 2021-03-10 21:54:49 · 4323 阅读 · 1 评论 -
【R语言】查找重复的长度
group_size(group_by(df,a,b))原创 2021-03-10 20:57:39 · 266 阅读 · 0 评论 -
【R语言】代码美化,等号=变为箭头<-, 对齐空格
formatR::tidy_app()原创 2021-02-24 19:13:17 · 666 阅读 · 0 评论 -
【R语言】产生R包的pdf说明文档
原创 2021-02-21 14:33:41 · 525 阅读 · 0 评论 -
【R语言】一键读取合并同一目录下不同子目录中所有的Excel文件
参考自:https://stackoverflow.com/questions/32888757/how-can-i-read-multiple-excel-files-into-r数据在一个大的目录下有很多子目录,每个子目录里有很多excel文件。R语言读取setwd('C:/Users/test/Desktop/20200331 data')file.list <- list.files(pattern='*.xls', recursive = T)# recursive=T读取所有原创 2021-02-15 16:41:22 · 1346 阅读 · 0 评论 -
【R语言】Error in newdata[[nameZ[i]]] : subscript out of bounds
newdata需要是data.frame原创 2021-01-02 13:19:36 · 6317 阅读 · 0 评论 -
【R语言】设置显示语言
Sys.setenv(LANG = “en”)原创 2020-11-16 15:12:15 · 1090 阅读 · 0 评论 -
【ggplot2】改坐标轴breaks标签,加数学表达式,数学表达式legend对齐(align the text of legend)
figure_display_batch <- function(res) { res_tmp <- res size <- dim(res_tmp)[3] res_list <- list() for (i in 1:size) { res_list[[i]] <- res_tmp[, , i] } res_list <- do.call("rbind", res_list) col_name <- c("Prediction原创 2020-10-21 20:39:39 · 1081 阅读 · 0 评论 -
【ggplot2】箱线图geom_boxplot+facet_wrap时每个facet保留离群值,不去除离群值;或者去掉离群值使每个facet的ylim范围不包含离群值
1. 保留离群值将coef设置为5,如果没有fact,直接在 geom_boxplot(coef = 5)。 calc_stat <- function(x) { coef <- 5 n <- sum(!is.na(x)) # calculate quantiles stats <- quantile(x, probs = c(0.1, 0.25, 0.5, 0.75, 0.9)) names(stats) <- c("ymin", "lowe原创 2020-10-07 16:40:14 · 1850 阅读 · 0 评论 -
【R语言】gather函数宽数据变长数据的理解
假设我们有如下数据:希望用education_level作为横坐标,每一行作为一个分组,绘制折线图。这就需要将数据变为长数据格式,产生三列,一列是数据,一列是分组的标签(“Never”, “Once”,…),一列是教育水平,这是最终效果:实现方法:plot_dat = gather(dat, claim_amount, counts, -education_level)claim_amount:原来除去要用来做横坐标的education_level之外的列们统一叫这个 名字;counts:那些原创 2020-09-25 13:16:51 · 6159 阅读 · 0 评论 -
【Rmarkdown】中文,PDF的设置
pdf输出title: “HW 5”author: “Lian”date: “2020/9/3”output:pdf_document:latex_engine: xelatex中文输出title: “Wilcoxon rank sum 与 t test的功效比较”author: “Lian”date: “2020/9/22”output:pdf_document:includes:header-includes: \usepackage{xeCJK}keep_tex: y原创 2020-09-24 16:54:07 · 403 阅读 · 0 评论 -
c++11: error: ‘random_device’ is not a member of ‘std’ error: ‘mt19937’ is not a member of ‘std’
Rcpp: error: ‘random_device’ is not a member of ‘std’ error: ‘mt19937’ is not a member of ‘std’需要支持c++11需要支持c++11需要在r里面执行下面这句:Sys.setenv(“PKG_CXXFLAGS”="-std=c++11")原创 2020-08-26 09:43:57 · 1362 阅读 · 0 评论 -
RcppEigen比较vector和matrix
前一篇介绍了查找某元素是否在vector,matrix中https://blog.csdn.net/zaza0_0/article/details/104581400这一篇写逐元素比较。//[[Rcpp::depends(RcppEigen)]]#include<RcppEigen.h>#include<Rcpp.h>using namespace std;us...原创 2020-03-01 15:22:47 · 388 阅读 · 0 评论 -
RcppEigen查找某元素是否在eigen::vector,eigen::matrix
//[[Rcpp::depends(RcppEigen)]]#include<RcppEigen.h>#include<Rcpp.h>using namespace std;using namespace Eigen;// [[Rcpp::export]]double testcwiseEqual(VectorXd x,double y){ //说明:A....原创 2020-02-29 20:42:44 · 991 阅读 · 0 评论