Clean up old results
This commit is contained in:
parent
9f04097b9c
commit
62fa8e0ec8
|
@ -1,134 +0,0 @@
|
|||
#!/usr/bin/env Rscript
|
||||
|
||||
library(sqldf)
|
||||
library(plyr)
|
||||
library(plot3D)
|
||||
library(ggplot2)
|
||||
library(gtools)
|
||||
|
||||
|
||||
args = commandArgs(trailingOnly=TRUE)
|
||||
#print(args)
|
||||
#if (2 != length(args)) {
|
||||
#print("Requires 2 parameters)")
|
||||
#q()
|
||||
#}
|
||||
|
||||
#file_db = args[1]
|
||||
#folder_out = args[2]
|
||||
|
||||
file_db = 'results_benchtool.db'
|
||||
folder_out = 'plot_coll_chunked'
|
||||
print(file_db)
|
||||
|
||||
make_facet_label <- function(variable, value){
|
||||
return(paste0(value, " KiB"))
|
||||
}
|
||||
|
||||
|
||||
#connection = dbConnect(SQLite(), dbname='results.ddnime.db')
|
||||
print(file_db)
|
||||
connection = dbConnect(SQLite(), dbname=file_db)
|
||||
|
||||
#dbdata = dbGetQuery(connection,'select mnt, siox, avg(duration) as ad, app, procs, blocksize from p group by mnt, siox, procs, blocksize, app')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where tag=="mpio-individual"')
|
||||
#dbdata = dbGetQuery(connection,'select *, (x*y*z) as blocksize from p where count=8')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where count<5')
|
||||
dbdata = dbGetQuery(connection,'select * from p where nn==10 and ppn=8')
|
||||
dbdata[,"blocksize"] = dbdata$x * dbdata$y * dbdata$z * 4
|
||||
|
||||
|
||||
summary(dbdata)
|
||||
|
||||
nn_lab <- sprintf(fmt="NN %d", unique(dbdata$nn))
|
||||
names(nn_lab) <- unique(dbdata$nn)
|
||||
ppn_lab <- sprintf(fmt="PPN %d", unique(dbdata$ppn))
|
||||
names(ppn_lab) <- unique(dbdata$ppn)
|
||||
breaks <- c(unique(dbdata$blocksize))
|
||||
|
||||
|
||||
fig_w = 4
|
||||
fig_h = 4
|
||||
|
||||
w = c(4, 6, 4)
|
||||
h = c(4, 4, 4)
|
||||
event = c("paper", "isc-pres", "poster")
|
||||
dims_list = data.frame(h, w, event) # df is a data frame
|
||||
|
||||
|
||||
for (scale in c('log', 'linear')) {
|
||||
|
||||
fss = unique(dbdata$fs)
|
||||
for (fs in fss) {
|
||||
data1 = dbdata[fs == dbdata$fs, ] # ime, lustre, fuse
|
||||
ifaces = unique(data1$iface)
|
||||
|
||||
for (iface in ifaces) {
|
||||
data2 = data1[iface == data1$iface, ] # posix, mpio, ime
|
||||
apps = unique(data2$app)
|
||||
|
||||
for (app in apps) {
|
||||
data3 = data2[app == data2$app, ] # ior, benchtool
|
||||
filleds = unique(data3$filled)
|
||||
|
||||
for (filled in filleds) {
|
||||
data4 = data3[filled == data2$filled, ]
|
||||
unlimiteds = unique(data4$unlimited)
|
||||
|
||||
for (unlimited in unlimiteds) {
|
||||
data = data4[unlimited == data3$unlimited, ]
|
||||
|
||||
dat_write <- data.frame(chunked=data$chunked, type=data$type, perf=data$write, blocksize=data$blocksize, access="write")
|
||||
dat_read <- data.frame(chunked=data$chunked, type=data$type, perf=data$read, blocksize=data$blocksize, access="read")
|
||||
|
||||
dat <- rbind(dat_write, dat_read)
|
||||
#dat$lab <- paste0(dat$blocksize/1024, "/", dat$access)
|
||||
dat$lab <- paste0(dat$blocksize/1024)
|
||||
dat$lab_type <- data$type;
|
||||
dat$lab_type[dat$lab_type == "coll"] = "Collective"
|
||||
dat$lab_type[dat$lab_type == "ind"] = "Independent"
|
||||
dat$lab_chunked <- data$chunked;
|
||||
dat$lab_chunked[dat$lab_chunked == "auto"] = "Chunking"
|
||||
dat$lab_chunked[dat$lab_chunked == "notset"] = "No chunking"
|
||||
print(summary(dat))
|
||||
|
||||
|
||||
print(mixedsort(unique(dat$lab)))
|
||||
|
||||
|
||||
p <- ggplot(data=dat, aes(x=lab, y=perf, colour=as.factor(blocksize/1024), group=interaction(access, blocksize)), ymin=0) +
|
||||
#ggtitle("Write") +
|
||||
#facet_grid(ppn ~ ., labeller = labeller(nn = as_labeller(nn_lab), ppn = as_labeller(ppn_lab))) +
|
||||
facet_grid(. ~ lab_type + lab_chunked + access) +
|
||||
xlab("Blocksizes in KiB / Access") +
|
||||
ylab("Performance in MiB/s") +
|
||||
theme(axis.text.x=element_text(angle=90, hjust=0.95, vjust=0.5)) +
|
||||
theme(legend.position="bottom") +
|
||||
#ylim(0, 100000) +
|
||||
#scale_x_continuous(breaks = c(unique(data$nn))) +
|
||||
#scale_color_manual(name="Blocksize in KiB: ", values=c('#999999','#E69F00', '#56B4E9', '#000000'), breaks=sort(unique(data$blocksize)/1024)) +
|
||||
scale_color_manual(name="Blocksize in KiB: ", values=c('#999999','#E69F00', '#56B4E9', '#000000', '#999999','#E69F00', '#56B4E9', '#000000'), breaks=mixedsort(unique(dat$lab))) +
|
||||
scale_fill_manual(name="Blocksize in KiB: ", values=c('#999999','#E69F00', '#56B4E9', '#000000', '#999999','#E69F00', '#56B4E9', '#000000'), breaks=mixedsort(unique(dat$lab))) +
|
||||
#stat_summary(fun.y="median", geom="line", aes(group=factor(blocksize))) +
|
||||
#stat_summary(fun.y="max", geom="line", aes(group=factor(blocksize))) +
|
||||
geom_boxplot()
|
||||
#geom_bar()
|
||||
#geom_point()
|
||||
|
||||
if ('log' == scale) {
|
||||
p = p + scale_y_log10(breaks=c(100, 1000, 10000, 40000))
|
||||
}
|
||||
{
|
||||
p = p + scale_x_discrete(breaks=mixedsort(unique(dat$lab)), limits=mixedsort(unique(dat$lab)))
|
||||
}
|
||||
|
||||
|
||||
filename_eps = sprintf("%s/performance_%s_FS:%s_IFACE:%s_FILLED_%s_LIM:%s_SCALE:%s.eps", folder_out, app, fs, iface, filled, unlimited, scale)
|
||||
filename_png = sprintf("%s/performance_%s_FS:%s_IFACE:%s_FILLED_%s_LIM:%s_SCALE:%s.png", folder_out, app, fs, iface, filled, unlimited, scale)
|
||||
ggsave(filename_eps, width = 8, height = 8)
|
||||
ggsave(filename_png, width = 8, height = 8)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
|
||||
}}}}}}
|
||||
#}}
|
|
@ -1,111 +0,0 @@
|
|||
#!/usr/bin/env Rscript
|
||||
|
||||
library(sqldf)
|
||||
library(plyr)
|
||||
library(plot3D)
|
||||
library(ggplot2)
|
||||
|
||||
|
||||
args = commandArgs(trailingOnly=TRUE)
|
||||
print(args)
|
||||
if (2 != length(args)) {
|
||||
print("Requires 2 parameters)")
|
||||
q()
|
||||
}
|
||||
|
||||
file_db = args[1]
|
||||
folder_out = args[2]
|
||||
print(file_db)
|
||||
|
||||
make_facet_label <- function(variable, value){
|
||||
return(paste0(value, " KiB"))
|
||||
}
|
||||
|
||||
|
||||
#connection = dbConnect(SQLite(), dbname='results.ddnime.db')
|
||||
print(file_db)
|
||||
connection = dbConnect(SQLite(), dbname=file_db)
|
||||
|
||||
#dbdata = dbGetQuery(connection,'select mnt, siox, avg(duration) as ad, app, procs, blocksize from p group by mnt, siox, procs, blocksize, app')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where tag=="mpio-individual"')
|
||||
#dbdata = dbGetQuery(connection,'select *, (x*y*z) as blocksize from p where count=8')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where count<5')
|
||||
dbdata = dbGetQuery(connection,'select *, (nn*ppn) as procs from p ')
|
||||
dbdata[,"blocksize"] = dbdata$x * dbdata$y * dbdata$z * 4
|
||||
|
||||
|
||||
summary(dbdata)
|
||||
|
||||
nn_lab <- sprintf(fmt="NN %d", unique(dbdata$nn))
|
||||
names(nn_lab) <- unique(dbdata$nn)
|
||||
ppn_lab <- sprintf(fmt="PPN %d", unique(dbdata$ppn))
|
||||
names(ppn_lab) <- unique(dbdata$ppn)
|
||||
breaks <- c(unique(dbdata$blocksize))
|
||||
|
||||
|
||||
fig_w = 4
|
||||
fig_h = 4
|
||||
|
||||
w = c(4, 6, 4)
|
||||
h = c(4, 4, 4)
|
||||
event = c("paper", "isc-pres", "poster")
|
||||
dims_list = data.frame(h, w, event) # df is a data frame
|
||||
|
||||
|
||||
|
||||
|
||||
fss = unique(dbdata$fs) # lustre, ime, fuse
|
||||
for (fs in fss) {
|
||||
data1 = dbdata[fs == dbdata$fs, ]
|
||||
ifaces = unique(data1$iface)
|
||||
|
||||
for (iface in ifaces) { # mpio, ime, posix
|
||||
data2 = data1[iface == data1$iface, ]
|
||||
apps = unique(data2$app)
|
||||
|
||||
for (app in apps) { # benchtool, ior
|
||||
data = data2[app == data2$app, ]
|
||||
|
||||
|
||||
#ggplot(data=data, aes(x=nn, y=ropen, colour=as.factor(blocksize/1024), group=blocksize), ymin=0) +
|
||||
ggplot(data=data, aes(x=nn, y=ropen, color=ppn)) +
|
||||
geom_point() +
|
||||
xlab("Nodes") +
|
||||
ylab("Duration in sec") +
|
||||
theme(axis.text.x=element_text(angle=90, hjust=0.95, vjust=0.5)) +
|
||||
theme(legend.position="right") +
|
||||
#scale_y_log10() +
|
||||
scale_x_continuous(breaks = c(unique(data$nn))) +
|
||||
geom_smooth(data=data[data$ppn==8,]) +
|
||||
geom_smooth(data=data[data$ppn==6,]) +
|
||||
geom_smooth(data=data[data$ppn==4,]) +
|
||||
geom_smooth(data=data[data$ppn==2,]) +
|
||||
geom_smooth(data=data[data$ppn==1,]) +
|
||||
scale_colour_gradientn(colours = rainbow(7)) # + geom_abline(slope=0.1089, intercept=0.1315)
|
||||
filename_eps = sprintf("%s/performance_%s_%s_%s_%s.eps", folder_out, app, fs, iface, "readopen")
|
||||
ggsave(filename_eps, width = 6, height = 4)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
|
||||
ggplot(data=data, aes(x=nn, y=wopen, color=ppn)) +
|
||||
geom_point() +
|
||||
xlab("Nodes") +
|
||||
ylab("Duration in sec") +
|
||||
theme(axis.text.x=element_text(angle=90, hjust=0.95, vjust=0.5)) +
|
||||
theme(legend.position="right") +
|
||||
#scale_y_log10() +
|
||||
scale_x_continuous(breaks = c(unique(data$nn))) +
|
||||
geom_smooth(data=data[data$ppn==8,]) +
|
||||
geom_smooth(data=data[data$ppn==6,]) +
|
||||
geom_smooth(data=data[data$ppn==4,]) +
|
||||
geom_smooth(data=data[data$ppn==2,]) +
|
||||
geom_smooth(data=data[data$ppn==1,]) +
|
||||
scale_colour_gradientn(colours = rainbow(7)) # + geom_abline(slope=0.1089, intercept=0.1315)
|
||||
filename_eps = sprintf("%s/performance_%s_%s_%s_%s.eps", folder_out, app, fs, iface, "writeopen")
|
||||
ggsave(filename_eps, width = 6, height = 4)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
|
||||
|
||||
|
||||
}}}
|
|
@ -1,207 +0,0 @@
|
|||
#!/usr/bin/env Rscript
|
||||
|
||||
library(sqldf)
|
||||
library(plyr)
|
||||
library(plot3D)
|
||||
library(ggplot2)
|
||||
require(gridExtra)
|
||||
|
||||
|
||||
theme_set(theme_gray(base_size = 25))
|
||||
|
||||
args = commandArgs(trailingOnly=TRUE)
|
||||
print(args)
|
||||
if (2 != length(args)) {
|
||||
print("Requires 2 parameters)")
|
||||
q()
|
||||
}
|
||||
|
||||
file_db = args[1]
|
||||
folder_out = args[2]
|
||||
print(file_db)
|
||||
|
||||
make_facet_label <- function(variable, value){
|
||||
return(paste0(value, " KiB"))
|
||||
}
|
||||
|
||||
|
||||
#connection = dbConnect(SQLite(), dbname='results.ddnime.db')
|
||||
print(file_db)
|
||||
connection = dbConnect(SQLite(), dbname=file_db)
|
||||
|
||||
#dbdata = dbGetQuery(connection,'select mnt, siox, avg(duration) as ad, app, procs, blocksize from p group by mnt, siox, procs, blocksize, app')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where tag=="mpio-individual"')
|
||||
#dbdata = dbGetQuery(connection,'select *, (x*y*z) as blocksize from p where count=8')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where count<5')
|
||||
#dbdata = dbGetQuery(connection,'select * from p where iface="mpio" and (ppn==1 or ppn=4 or ppn=8)')
|
||||
dbdata = dbGetQuery(connection,'select * from p where (ppn==1 or ppn=4 or ppn=8)')
|
||||
dbdata[,"blocksize"] = dbdata$x * dbdata$y * dbdata$z * 4
|
||||
|
||||
|
||||
#summary(dbdata)
|
||||
|
||||
nn_lab <- sprintf(fmt="NN=%d", unique(dbdata$nn))
|
||||
names(nn_lab) <- unique(dbdata$nn)
|
||||
|
||||
ppn_lab <- sprintf(fmt="PPN=%d", unique(dbdata$ppn))
|
||||
names(ppn_lab) <- unique(dbdata$ppn)
|
||||
|
||||
breaks <- c(unique(dbdata$blocksize))
|
||||
|
||||
|
||||
#fig_w = 4
|
||||
#fig_h = 4
|
||||
|
||||
#w = c(4, 6, 4)
|
||||
#h = c(4, 4, 4)
|
||||
#event = c("paper", "isc-pres", "poster")
|
||||
#dims_list = data.frame(h, w, event) # df is a data frame
|
||||
|
||||
|
||||
|
||||
for (scale in c('log', 'linear')) {
|
||||
fss = unique(dbdata$fs)
|
||||
for (fs in fss) {
|
||||
data1 = dbdata[fs == dbdata$fs, ]
|
||||
#apps = unique(data1$app)
|
||||
ifaces = unique(data1$iface)
|
||||
|
||||
for (iface in ifaces) {
|
||||
data2 = data1[iface == data1$iface, ]
|
||||
apps = unique(data2$app)
|
||||
|
||||
for (app in apps) {
|
||||
data3 = data2[app == data2$app, ]
|
||||
types = unique(data3$type)
|
||||
|
||||
for (type in types) {
|
||||
data4 = data3[type == data3$type, ]
|
||||
chunkeds = unique(data4$chunked)
|
||||
|
||||
for (chunked in chunkeds) {
|
||||
data5 = data4[chunked == data4$chunked, ]
|
||||
filleds = unique(data4$filled)
|
||||
|
||||
for (filled in filleds) {
|
||||
data6 = data5[filled == data5$filled, ]
|
||||
unlimiteds = unique(data5$unlimited)
|
||||
|
||||
for (unlimited in unlimiteds) {
|
||||
data = data6[unlimited == data5$unlimited, ]
|
||||
|
||||
dat_write <- data.frame(real_perf=data$fsize/data$wio/1024^2, nn=data$nn, ppn=data$ppn, iface=data$iface, chunked=data$chunked, type=data$type, perf=data$write, blocksize=data$blocksize, access="write", tio="wio", stringsAsFactors = FALSE)
|
||||
dat_read <- data.frame(real_perf=data$fsize/data$rio/1024^2, nn=data$nn, ppn=data$ppn, iface=data$iface, chunked=data$chunked, type=data$type, perf=data$read, blocksize=data$blocksize, access="read", tio="rio", stringsAsFactors = FALSE)
|
||||
dat <- rbind(dat_write, dat_read)
|
||||
|
||||
|
||||
dat$lab_ppn <- paste0("PPN=", dat$ppn)
|
||||
|
||||
dat$lab_iface <- dat$iface
|
||||
dat$lab_iface[dat$lab_iface == "posix"] = "POSIX"
|
||||
dat$lab_iface[dat$lab_iface == "mpio"] = "MPIIO"
|
||||
dat$lab_iface[dat$lab_iface == "ime"] = "IME"
|
||||
|
||||
dat$lab_access <- dat$access
|
||||
dat$lab_access[dat$lab_access == "write"] = "Write"
|
||||
dat$lab_access[dat$lab_access == "read"] = "Read"
|
||||
|
||||
|
||||
print(summary(dat))
|
||||
#print(dat[0:10])
|
||||
|
||||
|
||||
#library(ggplot2)
|
||||
#p = qplot(1, 1)
|
||||
#grid.arrange(p, p, respect=TRUE) # both viewports are square
|
||||
#grid.arrange(p, p, respect=TRUE, heights=c(1,2)) # relative heights
|
||||
|
||||
#p1 = p + theme(aspect.ratio=3)
|
||||
#grid.arrange(p,p1, respect=TRUE) # one is square, the other thinner
|
||||
|
||||
|
||||
for (print_legend in c("yes", "no")) {
|
||||
|
||||
#p <- ggplot(data=dat, aes(x=nn, y=perf, colour=as.factor(blocksize/1024), group=blocksize), ymin=0) +
|
||||
p <- ggplot(data=dat, aes(x=nn, y=real_perf, colour=as.factor(blocksize/1024), group=blocksize), ymin=0) +
|
||||
#ggtitle("Write") +
|
||||
#facet_grid(ppn ~ ., labeller = labeller(nn = as_labeller(lab), ppn = as_labeller(lab))) +
|
||||
#facet_grid(lab_ppn ~ lab_iface + lab_access) +
|
||||
facet_grid(lab_ppn ~ lab_access) +
|
||||
xlab("Nodes") +
|
||||
ylab("Performance in MiB/s") +
|
||||
theme(axis.text.x=element_text(angle=90, hjust=0.95, vjust=0.5)) +
|
||||
#scale_y_log10() +
|
||||
scale_x_continuous(breaks = c(unique(data$nn))) +
|
||||
scale_color_manual(name="Blocksize in KiB: ", values=c('#999999','#E69F00', '#56B4E9', '#000000'), breaks=sort(unique(data$blocksize)/1024)) +
|
||||
#stat_summary(fun.y="median", geom="line", aes(group=factor(blocksize))) +
|
||||
stat_summary(fun.y="max", geom="line", aes(group=factor(blocksize))) +
|
||||
#coord_fixed(ratio=1) +
|
||||
theme(aspect.ratio=1) +
|
||||
theme(plot.margin=grid::unit(c(0,0,0,0), "mm")) +
|
||||
#geom_boxplot()
|
||||
geom_point()
|
||||
|
||||
|
||||
#grid.arrange(p, p, respect=TRUE) # both viewports are square
|
||||
|
||||
|
||||
#p1 = p + theme(aspect.ratio=3)
|
||||
#grid.arrange(p,p1, respect=TRUE) # one is square, the other thinner
|
||||
|
||||
#p = qplot(1, 1)
|
||||
#grid.arrange(p, p, respect=TRUE) # both viewports are square
|
||||
#grid.arrange(p, p, respect=TRUE, heights=c(1,2)) # relative heights
|
||||
|
||||
if(fs=="lustre") {
|
||||
print("Lustre limit")
|
||||
p = p + ylim(0, 20000)
|
||||
}
|
||||
#if(fs=="fuse") {
|
||||
#p = p + theme(legend.position="bottom")
|
||||
#}
|
||||
if(print_legend=="yes") {
|
||||
p = p + theme(legend.position="bottom")
|
||||
}
|
||||
else {
|
||||
p = p + theme(legend.position="none")
|
||||
}
|
||||
|
||||
if ('log' == scale) {
|
||||
p = p + scale_y_log10()
|
||||
p = p + scale_x_log10(breaks = c(unique(data$nn)))
|
||||
#p = p + scale_y_log10(breaks=c(100, 1000, 10000, 40000))
|
||||
}
|
||||
{
|
||||
#p = p + scale_x_discrete(breaks=mixedsort(unique(dat$lab)), limits=mixedsort(unique(dat$lab)))
|
||||
}
|
||||
|
||||
filename_eps_base = sprintf("%s/performance_%s_%s_%s_%s_CHUNK:%s_FILL:%s_LIM:%s_legend:%s_SCALE:%s", folder_out, app, fs, iface, type, chunked, filled, unlimited, print_legend, scale)
|
||||
filenmae_eps=""
|
||||
|
||||
if(fs=="ime") {
|
||||
filename = sprintf("%s_size:%dx%d", filename_eps_base, 6, 8)
|
||||
filename_eps = sprintf("%s.eps", filename)
|
||||
filename_png = sprintf("%s.png", filename)
|
||||
filename_pdf = sprintf("%s.pdf", filename)
|
||||
ggsave(filename_eps, width = 6, height = 6)
|
||||
ggsave(filename_png, dpi=300)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
system(sprintf("pdfcrop %s %s", filename_pdf, filename_pdf))
|
||||
}
|
||||
|
||||
#filename = sprintf("%s_size:%dx%d", filename_eps_base, 12, 8)
|
||||
filename = sprintf("%s_size:%dx%d", filename_eps_base, 9, 6)
|
||||
filename_eps = sprintf("%s.eps", filename)
|
||||
filename_png = sprintf("%s.png", filename)
|
||||
filename_pdf = sprintf("%s.pdf", filename)
|
||||
#ggsave(filename_eps, width = 12, height = 6)
|
||||
ggsave(filename_eps, dpi=300)
|
||||
ggsave(filename_png, dpi=300)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
system(sprintf("pdfcrop %s %s", filename_pdf, filename_pdf))
|
||||
} # for legend
|
||||
|
||||
}}}}}}}
|
||||
} # scale
|
|
@ -1,75 +0,0 @@
|
|||
#!/usr/bin/env Rscript
|
||||
|
||||
library(sqldf)
|
||||
library(plyr)
|
||||
library(plot3D)
|
||||
library(ggplot2)
|
||||
library(gtools)
|
||||
|
||||
|
||||
args = commandArgs(trailingOnly=TRUE)
|
||||
#print(args)
|
||||
#if (2 != length(args)) {
|
||||
#print("Requires 2 parameters)")
|
||||
#q()
|
||||
#}
|
||||
|
||||
#file_db = args[1]
|
||||
#folder_out = args[2]
|
||||
|
||||
file_db_random = 'results_random.db'
|
||||
file_db_sequential = 'results_sequential.db'
|
||||
folder_out = 'plot_read_write'
|
||||
|
||||
#file_db = file_db_sequential
|
||||
file_db = file_db_random
|
||||
|
||||
make_facet_label <- function(variable, value){
|
||||
return(paste0(value, " KiB"))
|
||||
}
|
||||
|
||||
|
||||
#connection = dbConnect(SQLite(), dbname='results.ddnime.db')
|
||||
print(file_db)
|
||||
connection = dbConnect(SQLite(), dbname=file_db)
|
||||
|
||||
dbdata = dbGetQuery(connection,'select * from p')
|
||||
dbdata[,"blocksize"] = dbdata$x * dbdata$y * dbdata$z * 4
|
||||
|
||||
dbdata$nn_lab <- sprintf(fmt="NN=%d; PPN=1-10", dbdata$nn)
|
||||
dbdata$nn_lab_f <- factor(dbdata$nn_lab, sprintf(fmt="NN=%d; PPN=1-10", sort(unique(dbdata$nn))))
|
||||
print(dbdata$nn_lab)
|
||||
#names(nn_lab) <- unique(dbdata$nn)
|
||||
|
||||
summary(dbdata)
|
||||
|
||||
fss = unique(dbdata$fs)
|
||||
for (fs in fss) {
|
||||
data = dbdata[fs == dbdata$fs, ]
|
||||
|
||||
ggplot(data=data, aes(x=read, y=write, colour=as.factor(blocksize/1024), group=blocksize), ymin=0, xmin=0) +
|
||||
#ggtitle("Write") +
|
||||
facet_grid(. ~ nn_lab_f) +
|
||||
facet_wrap(~ nn_lab_f) +
|
||||
xlab("Read Performance in MiB/s") +
|
||||
ylab("Write Performance in MiB/s") +
|
||||
#theme(axis.text.x=element_text(angle=90, hjust=0.95, vjust=0.5)) +
|
||||
theme(legend.position="bottom") +
|
||||
theme(aspect.ratio=1) +
|
||||
scale_y_log10() +
|
||||
scale_x_log10() +
|
||||
scale_color_manual(name="Blocksize in KiB: ", values=c('#999999','#E69F00', '#56B4E9', '#000000','#999999','#E69F00', '#56B4E9', '#000000','#999999','#E69F00', '#56B4E9', '#000000' )) +
|
||||
geom_point()
|
||||
|
||||
filename = sprintf("%s/performance_overview_rnd_%s", folder_out, fs)
|
||||
filename_eps = sprintf("%s.eps", filename)
|
||||
filename_png = sprintf("%s.png", filename)
|
||||
filename_pdf = sprintf("%s.pdf", filename)
|
||||
#ggsave(filename_eps, width = 12, height = 6)
|
||||
#ggsave(filename_eps, dpi=1000)
|
||||
ggsave(filename_eps, width = 16)
|
||||
ggsave(filename_png, dpi=300)
|
||||
system(sprintf("epstopdf %s", filename_eps))
|
||||
system(sprintf("rm %s", filename_eps))
|
||||
system(sprintf("pdfcrop %s %s", filename_pdf, filename_pdf))
|
||||
}
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:23:25 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:23:25 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 14564761600.
|
||||
write 226.59 157286400 100.00 0.001550 61.30 0.000260 61.30 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 14794547200.
|
||||
write 234.39 157286400 100.00 0.001500 60.19 0.000187 60.20 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161055641600.
|
||||
WARNING: Using actual aggregate bytes moved = 15000166400.
|
||||
write 237.98 157286400 100.00 0.017489 60.09 0.000163 60.11 2
|
||||
|
||||
Max Write: 237.98 MiB/sec (249.54 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 237.98 226.59 232.98 4.76 60.53637 0 1 1 3 0 0 1 0 0 1 161061273600 102400 14564761600 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:26:37 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:26:41 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:26:41 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 827084800.
|
||||
read 13.12 157286400 100.00 0.001573 60.10 0.000181 60.10 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 836710400.
|
||||
read 13.28 157286400 100.00 0.000471 60.10 0.000155 60.10 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 855961600.
|
||||
read 13.58 157286400 100.00 0.000498 60.10 0.000212 60.10 2
|
||||
|
||||
Max Read: 13.58 MiB/sec (14.24 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 13.58 13.12 13.33 0.19 60.09874 0 1 1 3 0 0 1 0 0 1 161061273600 102400 827084800 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:29:41 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463344 0xbe2cf0 0
|
||||
1 12644630 0xc0f116 0
|
||||
|
|
@ -1,95 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 22:38:39 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:38:39 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 1200.79 137871360 1024.00 0.001562 112.12 0.000251 112.13 0
|
||||
write 1203.01 137871360 1024.00 0.049815 111.87 0.000188 111.92 1
|
||||
write 1196.68 137871360 1024.00 0.001396 112.51 0.000207 112.51 2
|
||||
|
||||
Max Write: 1203.01 MiB/sec (1261.44 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1203.01 1196.68 1200.16 2.62 112.18573 0 1 1 3 0 0 1 0 0 1 141180272640 1048576 141180272640 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 22:44:26 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 22:44:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:44:31 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 12832473088.
|
||||
read 101.97 137871360 1024.00 0.002383 120.01 0.000238 120.01 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 14103347200.
|
||||
read 112.07 137871360 1024.00 0.000527 120.01 0.000175 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 15566110720.
|
||||
read 123.69 137871360 1024.00 0.000479 120.01 0.000169 120.02 2
|
||||
|
||||
Max Read: 123.69 MiB/sec (129.70 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 123.69 101.97 112.58 8.87 120.01440 0 1 1 3 0 0 1 0 0 1 141180272640 1048576 12832473088 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 22:50:31 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591863 0xc022f7 0
|
||||
0 12420249 0xbd8499 0
|
||||
|
|
@ -1,85 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 16:08:59 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 16:08:59 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 1254.27 137871360 10240 0.001584 107.34 0.000219 107.35 0
|
||||
write 1266.86 137871360 10240 0.001460 106.28 0.000206 106.28 1
|
||||
write 1245.55 137871360 10240 0.036590 108.06 0.000175 108.10 2
|
||||
|
||||
Max Write: 1266.86 MiB/sec (1328.40 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1266.86 1245.55 1255.56 8.75 107.24007 0 1 1 3 0 0 1 0 0 1 141180272640 10485760 141180272640 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 16:14:31 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 16:14:37 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 16:14:37 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 45183139840.
|
||||
read 358.77 137871360 10240 0.093677 120.01 0.000213 120.10 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 54473523200.
|
||||
read 432.87 137871360 10240 0.000489 120.01 0.000175 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 53267660800.
|
||||
read 423.20 137871360 10240 0.000498 120.04 0.000167 120.04 2
|
||||
|
||||
Max Read: 432.87 MiB/sec (453.90 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 432.87 358.77 404.95 32.89 120.05124 0 1 1 3 0 0 1 0 0 1 141180272640 10485760 45183139840 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 16:20:37 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 00:46:45 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:46:45 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180190720.
|
||||
WARNING: Using actual aggregate bytes moved = 5065080832.
|
||||
write 39.86 137871360 16.00 0.001628 121.19 0.000224 121.19 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179682816.
|
||||
WARNING: Using actual aggregate bytes moved = 5168660480.
|
||||
write 40.46 137871360 16.00 0.018273 121.80 0.000166 121.82 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179699200.
|
||||
WARNING: Using actual aggregate bytes moved = 4824580096.
|
||||
write 38.02 137871360 16.00 0.000969 121.01 0.000177 121.02 2
|
||||
|
||||
Max Write: 40.46 MiB/sec (42.43 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 40.46 38.02 39.45 1.04 121.34342 0 1 1 3 0 0 1 0 0 1 141180272640 16384 5065080832 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:53:21 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 00:53:23 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:53:23 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 474710016.
|
||||
read 3.75 137871360 16.00 0.005226 120.74 0.000198 120.75 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 481837056.
|
||||
read 3.81 137871360 16.00 0.000473 120.74 0.000144 120.74 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 479100928.
|
||||
read 3.78 137871360 16.00 0.000469 120.75 0.000163 120.75 2
|
||||
|
||||
Max Read: 3.81 MiB/sec (3.99 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3.81 3.75 3.78 0.02 120.74686 0 1 1 3 0 0 1 0 0 1 141180272640 16384 474710016 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:59:26 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638255 0xc0d82f 0
|
||||
3 12486567 0xbe87a7 0
|
||||
|
|
@ -1,102 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:17:05 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:17:05 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059430400.
|
||||
WARNING: Using actual aggregate bytes moved = 14742425600.
|
||||
write 222.75 157286400 100.00 0.000200 63.12 0.000128 63.12 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161058508800.
|
||||
WARNING: Using actual aggregate bytes moved = 14849945600.
|
||||
write 224.83 157286400 100.00 0.000409 62.99 0.000118 62.99 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059840000.
|
||||
WARNING: Using actual aggregate bytes moved = 14929920000.
|
||||
write 226.41 157286400 100.00 0.000409 62.89 0.000124 62.89 2
|
||||
|
||||
Max Write: 226.41 MiB/sec (237.41 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 226.41 222.75 224.66 1.50 62.99806 0 1 1 3 1 0 1 0 0 1 161061273600 102400 14742425600 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:20:19 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:20:25 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:20:25 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 540057600.
|
||||
read 8.58 157286400 100.00 0.000167 60.05 0.000121 60.05 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 535040000.
|
||||
read 8.50 157286400 100.00 0.000140 60.04 0.000117 60.04 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 550707200.
|
||||
read 8.75 157286400 100.00 0.000152 60.04 0.000120 60.04 2
|
||||
|
||||
Max Read: 8.75 MiB/sec (9.17 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 8.75 8.50 8.61 0.10 60.04260 0 1 1 3 1 0 1 0 0 1 161061273600 102400 540057600 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:23:25 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463343 0xbe2cef 0
|
||||
1 12644629 0xc0f115 0
|
||||
|
|
@ -1,99 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:26:34 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:26:34 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179224064.
|
||||
WARNING: Using actual aggregate bytes moved = 133425004544.
|
||||
write 1053.09 137871360 1024.00 0.000198 120.83 0.000132 120.83 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 132905959424.
|
||||
write 1050.83 137871360 1024.00 0.000405 120.62 0.000126 120.62 1
|
||||
write 1164.88 137871360 1024.00 0.000585 115.58 0.000123 115.58 2
|
||||
|
||||
Max Write: 1164.88 MiB/sec (1221.46 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1164.88 1050.83 1089.60 53.24 119.01027 0 1 1 3 1 0 1 0 0 1 141180272640 1048576 133425004544 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 22:32:32 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:32:38 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:32:38 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 11049893888.
|
||||
read 87.80 137871360 1024.00 0.000177 120.02 0.000132 120.02 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 12142510080.
|
||||
read 96.49 137871360 1024.00 0.000134 120.01 0.000118 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 13043236864.
|
||||
read 103.65 137871360 1024.00 0.000133 120.01 0.000120 120.01 2
|
||||
|
||||
Max Read: 103.65 MiB/sec (108.69 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 103.65 87.80 95.98 6.48 120.01393 0 1 1 3 1 0 1 0 0 1 141180272640 1048576 11049893888 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 22:38:38 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591862 0xc022f6 0
|
||||
0 12420248 0xbd8498 0
|
||||
|
|
@ -1,93 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:58:37 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:58:37 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 1139.69 137871360 10240 0.000205 118.14 0.000172 118.14 0
|
||||
write 1311.72 137871360 10240 0.000421 102.64 0.000130 102.64 1
|
||||
write 1314.63 137871360 10240 0.000412 102.42 0.000166 102.42 2
|
||||
|
||||
Max Write: 1314.63 MiB/sec (1378.49 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1314.63 1139.69 1255.35 81.79 107.73261 0 1 1 3 1 0 1 0 0 1 141180272640 10485760 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:04:02 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:04:07 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:04:07 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 14784921600.
|
||||
read 117.45 137871360 10240 0.000182 120.05 0.000133 120.05 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 16294871040.
|
||||
read 129.47 137871360 10240 0.000146 120.03 0.000125 120.03 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 18192793600.
|
||||
read 144.52 137871360 10240 0.000143 120.05 0.000127 120.05 2
|
||||
|
||||
Max Read: 144.52 MiB/sec (151.54 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 144.52 117.45 130.48 11.07 120.04435 0 1 1 3 1 0 1 0 0 1 141180272640 10485760 14784921600 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:10:08 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638213 0xc0d805 0
|
||||
3 12486523 0xbe877b 0
|
||||
|
|
@ -1,102 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 00:33:52 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:33:52 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180223488.
|
||||
WARNING: Using actual aggregate bytes moved = 4903501824.
|
||||
write 34.60 137871360 16.00 0.000200 135.16 0.000113 135.16 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179682816.
|
||||
WARNING: Using actual aggregate bytes moved = 5213257728.
|
||||
write 36.91 137871360 16.00 0.000426 134.70 0.000104 134.70 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179633664.
|
||||
WARNING: Using actual aggregate bytes moved = 5065080832.
|
||||
write 35.76 137871360 16.00 0.000415 135.10 0.000099 135.10 2
|
||||
|
||||
Max Write: 36.91 MiB/sec (38.70 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 36.91 34.60 35.75 0.94 134.98834 0 1 1 3 1 0 1 0 0 1 141180272640 16384 4903501824 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 00:40:40 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 1 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:1#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 00:40:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:40:43 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 1 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 264077312.
|
||||
read 2.09 137871360 16.00 0.000170 120.42 0.000128 120.42 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 264945664.
|
||||
read 2.10 137871360 16.00 0.000134 120.42 0.000124 120.42 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 265240576.
|
||||
read 2.10 137871360 16.00 0.000139 120.43 0.000129 120.43 2
|
||||
|
||||
Max Read: 2.10 MiB/sec (2.20 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 2.10 2.09 2.10 0.00 120.42428 0 1 1 3 1 0 1 0 0 1 141180272640 16384 264077312 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 00:46:44 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638254 0xc0d82e 0
|
||||
3 12486566 0xbe87a6 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:48:53 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:48:53 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060556800.
|
||||
WARNING: Using actual aggregate bytes moved = 15162880000.
|
||||
write 239.86 78643200 100.00 0.003220 60.28 0.000273 60.29 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059123200.
|
||||
WARNING: Using actual aggregate bytes moved = 14554009600.
|
||||
write 228.51 78643200 100.00 0.016505 60.72 0.000201 60.74 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161057792000.
|
||||
WARNING: Using actual aggregate bytes moved = 15849881600.
|
||||
write 251.13 78643200 100.00 0.030138 60.16 0.000190 60.19 2
|
||||
|
||||
Max Write: 251.13 MiB/sec (263.33 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 251.13 228.51 239.83 9.23 60.40618 0 2 2 3 0 0 1 0 0 1 80530636800 102400 15162880000 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:52:04 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:52:11 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:52:11 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2116505600.
|
||||
read 33.59 78643200 100.00 0.001503 60.10 0.000510 60.10 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2126131200.
|
||||
read 33.74 78643200 100.00 0.000598 60.10 0.000234 60.10 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2150195200.
|
||||
read 34.12 78643200 100.00 0.000571 60.09 0.000161 60.09 2
|
||||
|
||||
Max Read: 34.12 MiB/sec (35.78 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 34.12 33.59 33.82 0.23 60.09716 0 2 2 3 0 0 1 0 0 1 80530636800 102400 2116505600 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:55:12 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514730 0xbef5aa 0
|
||||
7 12463352 0xbe2cf8 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 22:15:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:15:03 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141162446848.
|
||||
write 1274.07 68935680 1024.00 0.001456 105.66 0.000487 105.66 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179224064.
|
||||
WARNING: Using actual aggregate bytes moved = 141345947648.
|
||||
write 1260.08 68935680 1024.00 0.050349 106.93 0.000219 106.98 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179224064.
|
||||
WARNING: Using actual aggregate bytes moved = 140948537344.
|
||||
write 1303.71 68935680 1024.00 0.001498 103.10 0.000228 103.10 2
|
||||
|
||||
Max Write: 1303.71 MiB/sec (1367.04 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1303.71 1260.08 1279.29 18.19 105.24803 0 2 2 3 0 0 1 0 0 1 70590136320 1048576 141162446848 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 22:20:25 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 22:20:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:20:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 26353860608.
|
||||
read 209.40 68935680 1024.00 0.007453 120.02 0.001721 120.03 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 32643219456.
|
||||
read 259.40 68935680 1024.00 0.000607 120.01 0.000201 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 36842766336.
|
||||
read 292.77 68935680 1024.00 0.000661 120.01 0.000191 120.01 2
|
||||
|
||||
Max Read: 292.77 MiB/sec (306.99 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 292.77 209.40 253.86 34.26 120.01655 0 2 2 3 0 0 1 0 0 1 70590136320 1048576 26353860608 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 22:26:33 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591861 0xc022f5 0
|
||||
0 12420247 0xbd8497 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:52:47 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:52:47 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141159301120.
|
||||
WARNING: Using actual aggregate bytes moved = 139817123840.
|
||||
write 1637.59 68935680 10240 0.001477 81.42 0.000244 81.42 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141169786880.
|
||||
WARNING: Using actual aggregate bytes moved = 142438563840.
|
||||
write 1627.79 68935680 10240 0.237321 83.21 0.000253 83.45 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141694074880.
|
||||
write 1600.18 68935680 10240 0.001663 84.45 0.000219 84.45 2
|
||||
|
||||
Max Write: 1637.59 MiB/sec (1717.14 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1637.59 1600.18 1621.85 15.84 83.10728 0 2 2 3 0 0 1 0 0 1 70590136320 10485760 139817123840 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:57:06 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:57:14 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:57:14 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 98817802240.
|
||||
read 783.70 68935680 10240 0.241708 120.01 0.000258 120.25 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 109020446720.
|
||||
read 866.12 68935680 10240 0.000593 120.04 0.000207 120.04 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 107489525760.
|
||||
read 853.98 68935680 10240 0.000554 120.04 0.000177 120.04 2
|
||||
|
||||
Max Read: 866.12 MiB/sec (908.19 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 866.12 783.70 834.60 36.33 120.10975 0 2 2 3 0 0 1 0 0 1 70590136320 10485760 98817802240 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 16:03:15 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 00:21:26 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:21:26 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179469824.
|
||||
WARNING: Using actual aggregate bytes moved = 5164302336.
|
||||
write 40.52 68935680 16.00 0.001840 121.54 0.000237 121.55 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179469824.
|
||||
WARNING: Using actual aggregate bytes moved = 5294505984.
|
||||
write 40.73 68935680 16.00 0.006822 123.95 0.000245 123.96 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179404288.
|
||||
WARNING: Using actual aggregate bytes moved = 5482807296.
|
||||
write 42.99 68935680 16.00 0.047784 121.58 0.000187 121.63 2
|
||||
|
||||
Max Write: 42.99 MiB/sec (45.08 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 42.99 40.52 41.41 1.12 122.37880 0 2 2 3 0 0 1 0 0 1 70590136320 16384 5164302336 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:27:46 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 00:27:50 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:27:50 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1085882368.
|
||||
read 8.59 68935680 16.00 0.001933 120.57 0.000227 120.57 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1100529664.
|
||||
read 8.70 68935680 16.00 0.000612 120.58 0.000172 120.58 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1114898432.
|
||||
read 8.82 68935680 16.00 0.000570 120.57 0.000168 120.57 2
|
||||
|
||||
Max Read: 8.82 MiB/sec (9.25 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 8.82 8.59 8.70 0.09 120.57250 0 2 2 3 0 0 1 0 0 1 70590136320 16384 1085882368 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:33:52 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638253 0xc0d82d 0
|
||||
3 12486565 0xbe87a5 0
|
||||
|
|
@ -1,112 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:42:29 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:42:29 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 30632038400.
|
||||
write 474.39 78643200 100.00 0.000420 61.58 0.000147 61.58 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061068800.
|
||||
WARNING: Using actual aggregate bytes moved = 30516838400.
|
||||
write 460.34 78643200 100.00 0.000706 63.22 0.000131 63.22 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059430400.
|
||||
WARNING: Using actual aggregate bytes moved = 30322176000.
|
||||
write 454.71 78643200 100.00 0.000663 63.59 0.000250 63.59 2
|
||||
|
||||
Max Write: 474.39 MiB/sec (497.43 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 474.39 454.71 463.15 8.27 62.79877 0 2 2 3 1 0 1 0 0 1 80530636800 102400 30632038400 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:45:44 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:45:52 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:45:52 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 1250201600.
|
||||
read 19.86 78643200 100.00 0.000162 60.02 0.000138 60.02 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 1249177600.
|
||||
read 19.84 78643200 100.00 0.000168 60.03 0.000139 60.03 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 1258393600.
|
||||
read 19.99 78643200 100.00 0.000163 60.02 0.000138 60.02 2
|
||||
|
||||
Max Read: 19.99 MiB/sec (20.97 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 19.99 19.84 19.90 0.07 60.02582 0 2 2 3 1 0 1 0 0 1 80530636800 102400 1250201600 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:48:52 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426653 0xbd9d9d 0
|
||||
2 12572991 0xbfd93f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514729 0xbef5a9 0
|
||||
7 12463351 0xbe2cf7 0
|
||||
|
|
@ -1,103 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:05:54 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:05:54 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2040.06 68935680 1024.00 0.000439 66.00 0.000176 66.00 0
|
||||
write 2420.07 68935680 1024.00 0.000691 55.63 0.000173 55.63 1
|
||||
write 2502.54 68935680 1024.00 0.000652 53.80 0.000160 53.80 2
|
||||
|
||||
Max Write: 2502.54 MiB/sec (2624.11 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2502.54 2040.06 2320.89 201.41 58.47800 0 2 2 3 1 0 1 0 0 1 70590136320 1048576 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 22:08:54 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:09:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:09:02 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 26806845440.
|
||||
read 213.03 68935680 1024.00 0.000171 120.01 0.000136 120.01 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 31547457536.
|
||||
read 250.70 68935680 1024.00 0.000157 120.01 0.000140 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 39363543040.
|
||||
read 312.79 68935680 1024.00 0.000190 120.02 0.000143 120.02 2
|
||||
|
||||
Max Read: 312.79 MiB/sec (327.98 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 312.79 213.03 258.84 41.13 120.01022 0 2 2 3 1 0 1 0 0 1 70590136320 1048576 26806845440 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 22:15:02 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486542 0xbe878e 0
|
||||
5 12378597 0xbce1e5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591860 0xc022f4 0
|
||||
0 12420246 0xbd8496 0
|
||||
|
|
@ -1,103 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:49:39 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:49:39 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2396.14 68935680 10240 0.000421 56.19 0.000192 56.19 0
|
||||
write 2463.72 68935680 10240 0.002461 54.65 0.000157 54.65 1
|
||||
write 2537.98 68935680 10240 0.000687 53.05 0.000181 53.05 2
|
||||
|
||||
Max Write: 2537.98 MiB/sec (2661.27 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2537.98 2396.14 2465.95 57.93 54.62977 0 2 2 3 1 0 1 0 0 1 70590136320 10485760 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:52:28 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:52:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:52:36 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 37203476480.
|
||||
read 295.55 68935680 10240 0.000163 120.05 0.000140 120.05 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 42446356480.
|
||||
read 337.12 68935680 10240 0.000161 120.07 0.000138 120.07 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 50394562560.
|
||||
read 400.45 68935680 10240 0.000163 120.01 0.000149 120.01 2
|
||||
|
||||
Max Read: 400.45 MiB/sec (419.90 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 400.45 295.55 344.38 43.13 120.04549 0 2 2 3 1 0 1 0 0 1 70590136320 10485760 37203476480 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:58:36 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508297 0xbedc89 0
|
||||
7 12456937 0xbe13e9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638212 0xc0d804 0
|
||||
3 12486522 0xbe877a 0
|
||||
|
|
@ -1,112 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 00:08:35 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:08:35 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180043264.
|
||||
WARNING: Using actual aggregate bytes moved = 10365878272.
|
||||
write 75.84 68935680 16.00 0.000423 130.34 0.000137 130.34 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179813888.
|
||||
WARNING: Using actual aggregate bytes moved = 9952854016.
|
||||
write 68.99 68935680 16.00 0.000696 137.58 0.000120 137.59 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 10229530624.
|
||||
write 74.02 68935680 16.00 0.000714 131.80 0.000125 131.80 2
|
||||
|
||||
Max Write: 75.84 MiB/sec (79.53 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 75.84 68.99 72.95 2.90 133.24379 0 2 2 3 1 0 1 0 0 1 70590136320 16384 10365878272 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 00:15:18 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 00:15:24 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:15:24 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 631586816.
|
||||
read 5.01 68935680 16.00 0.000313 120.18 0.000136 120.18 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 640942080.
|
||||
read 5.09 68935680 16.00 0.000159 120.19 0.000141 120.19 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 655769600.
|
||||
read 5.20 68935680 16.00 0.000163 120.19 0.000135 120.19 2
|
||||
|
||||
Max Read: 5.20 MiB/sec (5.46 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 5.20 5.01 5.10 0.08 120.18716 0 2 2 3 1 0 1 0 0 1 70590136320 16384 631586816 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 00:21:25 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638252 0xc0d82c 0
|
||||
3 12486564 0xbe87a4 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508338 0xbedcb2 0
|
||||
7 12456978 0xbe1412 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:10:41 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:10:41 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059737600.
|
||||
WARNING: Using actual aggregate bytes moved = 14886502400.
|
||||
write 235.82 39321600 100.00 0.001613 60.20 0.000283 60.20 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061068800.
|
||||
WARNING: Using actual aggregate bytes moved = 13940326400.
|
||||
write 218.90 39321600 100.00 0.026797 60.71 0.000167 60.73 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060147200.
|
||||
WARNING: Using actual aggregate bytes moved = 14323404800.
|
||||
write 220.98 39321600 100.00 0.001549 61.81 0.000175 61.81 2
|
||||
|
||||
Max Write: 235.82 MiB/sec (247.27 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 235.82 218.90 225.23 7.53 60.91658 0 4 4 3 0 0 1 0 0 1 40265318400 102400 14886502400 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:13:55 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:14:04 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:14:04 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3567923200.
|
||||
read 56.62 39321600 100.00 0.004228 60.09 0.000179 60.10 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3673702400.
|
||||
read 58.31 39321600 100.00 0.000730 60.09 0.000251 60.09 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3749273600.
|
||||
read 59.51 39321600 100.00 0.000752 60.08 0.000169 60.08 2
|
||||
|
||||
Max Read: 59.51 MiB/sec (62.40 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 59.51 56.62 58.15 1.19 60.08803 0 4 4 3 0 0 1 0 0 1 40265318400 102400 3567923200 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:17:04 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514721 0xbef5a1 0
|
||||
7 12463342 0xbe2cee 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:54:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:54:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141580828672.
|
||||
write 1366.54 34467840 1024.00 0.006336 98.80 0.000266 98.81 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179224064.
|
||||
WARNING: Using actual aggregate bytes moved = 141389987840.
|
||||
write 1314.35 34467840 1024.00 0.059727 102.53 0.000210 102.59 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 140744065024.
|
||||
write 1344.58 34467840 1024.00 0.024153 99.80 0.000231 99.83 2
|
||||
|
||||
Max Write: 1366.54 MiB/sec (1432.92 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1366.54 1314.35 1341.83 21.39 100.40729 0 4 4 3 0 0 1 0 0 1 35295068160 1048576 141580828672 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 21:59:43 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:59:52 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:59:52 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 49221206016.
|
||||
read 391.10 34467840 1024.00 0.001724 120.02 0.000263 120.02 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 62731059200.
|
||||
read 498.38 34467840 1024.00 0.000741 120.04 0.000189 120.04 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 63361253376.
|
||||
read 503.42 34467840 1024.00 0.000696 120.03 0.000217 120.03 2
|
||||
|
||||
Max Read: 503.42 MiB/sec (527.88 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 503.42 391.10 464.30 51.80 120.03115 0 4 4 3 0 0 1 0 0 1 35295068160 1048576 49221206016 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 22:05:53 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566598 0xbfc046 0
|
||||
4 12508315 0xbedc9b 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:40:09 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:40:09 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141169786880.
|
||||
write 1715.66 34467840 10240 0.008235 78.46 0.000289 78.47 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141138329600.
|
||||
write 1737.39 34467840 10240 0.059053 77.41 0.000201 77.47 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141882818560.
|
||||
write 1730.10 34467840 10240 0.094761 78.11 0.000240 78.21 2
|
||||
|
||||
Max Write: 1737.39 MiB/sec (1821.79 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1737.39 1715.66 1727.72 9.03 78.05092 0 4 4 3 0 0 1 0 0 1 35295068160 10485760 141169786880 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:44:15 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:44:26 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:44:26 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141882818560.
|
||||
read 1300.58 34467840 10240 0.085615 103.95 0.000470 104.04 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 142165934080.
|
||||
read 1391.81 34467840 10240 0.000767 97.41 0.000214 97.41 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141631160320.
|
||||
read 1353.29 34467840 10240 0.000717 99.81 0.000210 99.81 2
|
||||
|
||||
Max Read: 1391.81 MiB/sec (1459.41 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1391.81 1300.58 1348.56 37.39 100.41994 0 4 4 3 0 0 1 0 0 1 35295068160 10485760 141882818560 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:49:27 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 23:55:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:55:46 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141178732544.
|
||||
WARNING: Using actual aggregate bytes moved = 5211865088.
|
||||
write 38.02 34467840 16.00 0.001959 130.74 0.000262 130.74 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179404288.
|
||||
WARNING: Using actual aggregate bytes moved = 5158879232.
|
||||
write 38.72 34467840 16.00 0.001565 127.06 0.000208 127.06 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179355136.
|
||||
WARNING: Using actual aggregate bytes moved = 5104254976.
|
||||
write 38.64 34467840 16.00 0.000971 125.99 0.000187 125.99 2
|
||||
|
||||
Max Write: 38.72 MiB/sec (40.60 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 38.72 38.02 38.46 0.31 127.92968 0 4 4 3 0 0 1 0 0 1 35295068160 16384 5211865088 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:02:26 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 00:02:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 00:02:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2193473536.
|
||||
read 17.36 34467840 16.00 0.019826 120.46 0.000260 120.48 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2254274560.
|
||||
read 17.85 34467840 16.00 0.000787 120.47 0.000189 120.47 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 2290745344.
|
||||
read 18.13 34467840 16.00 0.000760 120.47 0.000180 120.47 2
|
||||
|
||||
Max Read: 18.13 MiB/sec (19.02 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 18.13 17.36 17.78 0.32 120.47336 0 4 4 3 0 0 1 0 0 1 35295068160 16384 2193473536 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 00:08:34 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378618 0xbce1fa 0
|
||||
6 12591881 0xc02309 0
|
||||
|
|
@ -1,132 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:04:12 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:04:12 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060454400.
|
||||
WARNING: Using actual aggregate bytes moved = 49498112000.
|
||||
write 741.94 39321600 100.00 0.000807 63.62 0.000151 63.62 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161057792000.
|
||||
WARNING: Using actual aggregate bytes moved = 48220979200.
|
||||
write 723.09 39321600 100.00 0.001075 63.60 0.000144 63.60 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060044800.
|
||||
WARNING: Using actual aggregate bytes moved = 48337817600.
|
||||
write 725.81 39321600 100.00 0.001092 63.51 0.000154 63.51 2
|
||||
|
||||
Max Write: 741.94 MiB/sec (777.98 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 741.94 723.09 730.28 8.32 63.57836 0 4 4 3 1 0 1 0 0 1 40265318400 102400 49498112000 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:07:27 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:07:40 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:07:40 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2536550400.
|
||||
read 40.31 39321600 100.00 0.000199 60.02 0.000147 60.02 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2612326400.
|
||||
read 41.51 39321600 100.00 0.000182 60.02 0.000137 60.02 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2664652800.
|
||||
read 42.34 39321600 100.00 0.000166 60.02 0.000136 60.02 2
|
||||
|
||||
Max Read: 42.34 MiB/sec (44.40 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 42.34 40.31 41.38 0.84 60.01977 0 4 4 3 1 0 1 0 0 1 40265318400 102400 2536550400 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:10:40 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514720 0xbef5a0 0
|
||||
7 12463341 0xbe2ced 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426644 0xbd9d94 0
|
||||
2 12572981 0xbfd935 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463340 0xbe2cec 0
|
||||
1 12644626 0xc0f112 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384983 0xbcfad7 0
|
||||
6 12598239 0xc03bdf 0
|
||||
|
|
@ -1,123 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:45:57 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:45:57 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2890.64 34467840 1024.00 0.000807 46.58 0.000208 46.58 0
|
||||
write 2810.40 34467840 1024.00 0.001055 47.91 0.000175 47.91 1
|
||||
write 2948.45 34467840 1024.00 0.001035 45.66 0.000167 45.66 2
|
||||
|
||||
Max Write: 2948.45 MiB/sec (3091.67 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2948.45 2810.40 2883.16 56.61 46.71684 0 4 4 3 1 0 1 0 0 1 35295068160 1048576 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:48:22 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:48:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:48:31 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 57900269568.
|
||||
read 460.09 34467840 1024.00 0.000194 120.02 0.000203 120.02 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 87379935232.
|
||||
read 694.36 34467840 1024.00 0.000161 120.01 0.000199 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 127142985728.
|
||||
read 1010.30 34467840 1024.00 0.000192 120.02 0.000170 120.02 2
|
||||
|
||||
Max Read: 1010.30 MiB/sec (1059.38 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1010.30 460.09 721.59 225.45 120.01485 0 4 4 3 1 0 1 0 0 1 35295068160 1048576 57900269568 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:54:31 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638227 0xc0d813 0
|
||||
3 12486539 0xbe878b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508313 0xbedc99 0
|
||||
7 12456953 0xbe13f9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566597 0xbfc045 0
|
||||
4 12508314 0xbedc9a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378594 0xbce1e2 0
|
||||
6 12591857 0xc022f1 0
|
||||
|
|
@ -1,123 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:41:51 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:41:51 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2661.11 34467840 10240 0.000798 50.59 0.000182 50.60 0
|
||||
write 3391.94 34467840 10240 0.001092 39.69 0.000205 39.69 1
|
||||
write 4102 34467840 10240 0.001069 32.82 0.000197 32.82 2
|
||||
|
||||
Max Write: 4102.20 MiB/sec (4301.47 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4102.20 2661.11 3385.08 588.34 41.03695 0 4 4 3 1 0 1 0 0 1 35295068160 10485760 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:43:58 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:10485760.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:44:08 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:44:08 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 80708894720.
|
||||
read 640.91 34467840 10240 0.000718 120.09 0.000175 120.10 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 113959239680.
|
||||
read 905.12 34467840 10240 0.000153 120.07 0.000165 120.07 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 1501.27 34467840 10240 0.000197 89.68 0.000169 89.68 2
|
||||
|
||||
Max Read: 1501.27 MiB/sec (1574.19 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1501.27 640.91 1015.77 359.85 109.95041 0 4 4 3 1 0 1 0 0 1 35295068160 10485760 80708894720 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:49:38 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378572 0xbce1cc 0
|
||||
6 12591835 0xc022db 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456930 0xbe13e2 0
|
||||
1 12638205 0xc0d7fd 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566573 0xbfc02d 0
|
||||
4 12508290 0xbedc82 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591834 0xc022da 0
|
||||
0 12420220 0xbd847c 0
|
||||
|
|
@ -1,132 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 23:42:48 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:42:48 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179879424.
|
||||
WARNING: Using actual aggregate bytes moved = 18400575488.
|
||||
write 128.96 34467840 16.00 0.000815 136.07 0.000182 136.07 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141178568704.
|
||||
WARNING: Using actual aggregate bytes moved = 17841750016.
|
||||
write 130.93 34467840 16.00 0.001049 129.95 0.000175 129.95 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180207104.
|
||||
WARNING: Using actual aggregate bytes moved = 18589237248.
|
||||
write 131.83 34467840 16.00 0.001016 134.48 0.000151 134.48 2
|
||||
|
||||
Max Write: 131.83 MiB/sec (138.23 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 131.83 128.96 130.57 1.20 133.50294 0 4 4 3 1 0 1 0 0 1 35295068160 16384 18400575488 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 23:49:32 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:4#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 23:49:44 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 35295068160 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:49:44 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 1782857728.
|
||||
read 14.16 34467840 16.00 0.000179 120.10 0.000144 120.10 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 1877540864.
|
||||
read 14.91 34467840 16.00 0.000184 120.10 0.000153 120.10 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 1892745216.
|
||||
read 15.03 34467840 16.00 0.000173 120.10 0.000144 120.10 2
|
||||
|
||||
Max Read: 15.03 MiB/sec (15.76 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 15.03 14.16 14.70 0.39 120.09736 0 4 4 3 1 0 1 0 0 1 35295068160 16384 1782857728 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 23:55:45 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591879 0xc02307 0
|
||||
0 12420265 0xbd84a9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566618 0xbfc05a 0
|
||||
4 12508335 0xbedcaf 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378617 0xbce1f9 0
|
||||
6 12591880 0xc02308 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456975 0xbe140f 0
|
||||
1 12638249 0xc0d829 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:36:09 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:36:09 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060147200.
|
||||
WARNING: Using actual aggregate bytes moved = 13878067200.
|
||||
write 217.53 26214400 100.00 0.006332 60.84 0.000235 60.84 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161056563200.
|
||||
WARNING: Using actual aggregate bytes moved = 14127308800.
|
||||
write 224.14 26214400 100.00 0.001595 60.11 0.000205 60.11 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060966400.
|
||||
WARNING: Using actual aggregate bytes moved = 14639411200.
|
||||
write 227.50 26214400 100.00 0.018975 61.35 0.000240 61.37 2
|
||||
|
||||
Max Write: 227.50 MiB/sec (238.56 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 227.50 217.53 223.06 4.15 60.77317 0 6 6 3 0 0 1 0 0 1 26843545600 102400 13878067200 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:39:20 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:39:28 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:39:28 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 5692006400.
|
||||
read 90.34 26214400 100.00 0.007037 60.08 0.000263 60.09 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 5929369600.
|
||||
read 94.12 26214400 100.00 0.000932 60.08 0.000185 60.08 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6173798400.
|
||||
read 98.00 26214400 100.00 0.000894 60.08 0.000180 60.08 2
|
||||
|
||||
Max Read: 98.00 MiB/sec (102.76 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 98.00 90.34 94.15 3.13 60.08164 0 6 6 3 0 0 1 0 0 1 26843545600 102400 5692006400 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:42:29 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644635 0xc0f11b 0
|
||||
3 12492930 0xbea082 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:34:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:34:43 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141151961088.
|
||||
write 1325.44 22978560 1024.00 0.005407 101.56 0.000274 101.56 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141527351296.
|
||||
write 1373.27 22978560 1024.00 0.005024 98.28 0.000279 98.28 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 140823756800.
|
||||
write 1348.71 22978560 1024.00 0.030859 99.55 0.000239 99.58 2
|
||||
|
||||
Max Write: 1373.27 MiB/sec (1439.98 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1373.27 1325.44 1349.14 19.53 99.80739 0 6 6 3 0 0 1 0 0 1 23530045440 1048576 141151961088 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 21:39:46 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:39:55 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:39:55 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 44938821632.
|
||||
read 356.87 22978560 1024.00 0.042674 120.05 0.000256 120.09 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 58208550912.
|
||||
read 462.40 22978560 1024.00 0.000904 120.05 0.000207 120.05 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 58485374976.
|
||||
read 464.67 22978560 1024.00 0.000940 120.03 0.000198 120.03 2
|
||||
|
||||
Max Read: 464.67 MiB/sec (487.24 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 464.67 356.87 427.98 50.29 120.05991 0 6 6 3 0 0 1 0 0 1 23530045440 1048576 44938821632 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 21:45:55 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486536 0xbe8788 0
|
||||
5 12378592 0xbce1e0 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:29:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:29:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 140844728320.
|
||||
write 1568.05 22978560 10240 0.001879 85.66 0.000354 85.66 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 140813271040.
|
||||
write 1559.09 22978560 10240 0.345781 85.79 0.000278 86.13 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 143424225280.
|
||||
write 1556.13 22978560 10240 0.469190 87.43 0.000301 87.90 2
|
||||
|
||||
Max Write: 1568.05 MiB/sec (1644.22 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1568.05 1556.13 1561.09 5.07 86.56379 0 6 6 3 0 0 1 0 0 1 23530045440 10485760 140844728320 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:34:04 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:34:14 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:34:14 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141903790080.
|
||||
read 1667.35 22978560 10240 0.076982 81.09 0.000287 81.16 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141914275840.
|
||||
read 1740.24 22978560 10240 0.000922 77.77 0.000222 77.77 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141075415040.
|
||||
read 1715.50 22978560 10240 0.000941 78.42 0.000247 78.43 2
|
||||
|
||||
Max Read: 1740.24 MiB/sec (1824.77 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1740.24 1667.35 1707.70 30.27 79.12064 0 6 6 3 0 0 1 0 0 1 23530045440 10485760 141903790080 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:38:11 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 23:30:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:30:03 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141178667008.
|
||||
WARNING: Using actual aggregate bytes moved = 5166858240.
|
||||
write 40.55 22978560 16.00 0.005347 121.50 0.000256 121.50 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179846656.
|
||||
WARNING: Using actual aggregate bytes moved = 4936187904.
|
||||
write 37.87 22978560 16.00 0.001034 124.30 0.000186 124.30 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179650048.
|
||||
WARNING: Using actual aggregate bytes moved = 5161730048.
|
||||
write 40.86 22978560 16.00 0.013837 120.47 0.000193 120.48 2
|
||||
|
||||
Max Write: 40.86 MiB/sec (42.84 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 40.86 37.87 39.76 1.34 122.09637 0 6 6 3 0 0 1 0 0 1 23530045440 16384 5166858240 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 23:36:39 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 23:36:45 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:36:45 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3196665856.
|
||||
read 25.31 22978560 16.00 0.002243 120.43 0.000221 120.43 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3265265664.
|
||||
read 25.86 22978560 16.00 0.000921 120.43 0.000202 120.43 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3335749632.
|
||||
read 26.42 22978560 16.00 0.000911 120.43 0.000197 120.43 2
|
||||
|
||||
Max Read: 26.42 MiB/sec (27.70 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 26.42 25.31 25.86 0.45 120.42791 0 6 6 3 0 0 1 0 0 1 23530045440 16384 3196665856 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 23:42:47 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508332 0xbedcac 0
|
||||
7 12456973 0xbe140d 0
|
||||
|
|
@ -1,152 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:29:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:29:43 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060864000.
|
||||
WARNING: Using actual aggregate bytes moved = 60960972800.
|
||||
write 916.90 26214400 100.00 0.001193 63.40 0.000175 63.41 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059430400.
|
||||
WARNING: Using actual aggregate bytes moved = 50419200000.
|
||||
write 754.87 26214400 100.00 0.001385 63.70 0.000164 63.70 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161061273600.
|
||||
WARNING: Using actual aggregate bytes moved = 58768588800.
|
||||
write 879.53 26214400 100.00 0.001391 63.72 0.000157 63.72 2
|
||||
|
||||
Max Write: 916.90 MiB/sec (961.44 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 916.90 754.87 850.43 69.27 63.60897 0 6 6 3 1 0 1 0 0 1 26843545600 102400 60960972800 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:32:58 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 01:33:07 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:33:07 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 966367641600.
|
||||
WARNING: Using actual aggregate bytes moved = 4031488000.
|
||||
read 64.04 26214400 100.00 0.000204 60.03 0.000173 60.03 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 966367641600.
|
||||
WARNING: Using actual aggregate bytes moved = 4278784000.
|
||||
read 67.99 26214400 100.00 0.000208 60.02 0.000152 60.02 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 966367641600.
|
||||
WARNING: Using actual aggregate bytes moved = 4422758400.
|
||||
read 70.27 26214400 100.00 0.000217 60.02 0.000169 60.02 2
|
||||
|
||||
Max Read: 70.27 MiB/sec (73.68 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 70.27 64.04 67.43 2.57 60.02534 0 6 6 3 1 0 1 0 0 1 26843545600 102400 4031488000 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 01:36:07 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384991 0xbcfadf 0
|
||||
6 12598246 0xc03be6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644634 0xc0f11a 0
|
||||
3 12492928 0xbea080 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572987 0xbfd93b 0
|
||||
4 12514725 0xbef5a5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492929 0xbea081 0
|
||||
5 12384992 0xbcfae0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426650 0xbd9d9a 0
|
||||
2 12572988 0xbfd93c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514726 0xbef5a6 0
|
||||
7 12463348 0xbe2cf4 0
|
||||
|
|
@ -1,143 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:27:45 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:27:45 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 4418 22978560 1024.00 0.001158 30.47 0.000194 30.48 0
|
||||
write 4372 22978560 1024.00 0.001450 30.79 0.000180 30.79 1
|
||||
write 4458 22978560 1024.00 0.001382 30.20 0.000175 30.20 2
|
||||
|
||||
Max Write: 4458.46 MiB/sec (4675.03 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4458.46 4372.45 4416.29 35.13 30.48908 0 6 6 3 1 0 1 0 0 1 23530045440 1048576 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:29:20 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:29:30 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:29:30 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 82219892736.
|
||||
read 653.31 22978560 1024.00 0.000224 120.02 0.000190 120.02 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 137311027200.
|
||||
read 1091.16 22978560 1024.00 0.000197 120.01 0.000197 120.01 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 1902.92 22978560 1024.00 0.000191 70.75 0.000186 70.75 2
|
||||
|
||||
Max Read: 1902.92 MiB/sec (1995.36 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1902.92 653.31 1215.80 517.71 103.59530 0 6 6 3 1 0 1 0 0 1 23530045440 1048576 82219892736 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:34:41 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566591 0xbfc03f 0
|
||||
4 12508308 0xbedc94 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378590 0xbce1de 0
|
||||
6 12591853 0xc022ed 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638224 0xc0d810 0
|
||||
3 12486534 0xbe8786 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486535 0xbe8787 0
|
||||
5 12378591 0xbce1df 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420240 0xbd8490 0
|
||||
2 12566592 0xbfc040 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508309 0xbedc95 0
|
||||
7 12456949 0xbe13f5 0
|
||||
|
|
@ -1,143 +0,0 @@
|
|||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:10485760.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 18:15:52 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:15:52 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 4739 22978560 10240 0.001139 28.41 0.000202 28.41 0
|
||||
write 5012 22978560 10240 0.003508 26.86 0.000235 26.87 1
|
||||
write 5144 22978560 10240 0.002094 26.17 0.000239 26.17 2
|
||||
|
||||
Max Write: 5144.25 MiB/sec (5394.13 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 5144.25 4738.59 4964.82 168.88 27.15067 0 6 6 3 1 0 1 0 0 1 23530045440 10485760 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 18:17:18 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:10485760.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 18:17:27 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:17:27 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 132980408320.
|
||||
read 1055.51 22978560 10240 0.000196 120.15 0.000208 120.15 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 1513.33 22978560 10240 0.000221 88.97 0.000175 88.97 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 2388.40 22978560 10240 0.000229 56.37 0.000185 56.37 2
|
||||
|
||||
Max Read: 2388.40 MiB/sec (2504.42 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 2388.40 1055.51 1652.41 552.97 88.49760 0 6 6 3 1 0 1 0 0 1 23530045440 10485760 132980408320 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 18:21:53 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420127 0xbd841f 0
|
||||
2 12566482 0xbfbfd2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486425 0xbe8719 0
|
||||
5 12378479 0xbce16f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638113 0xc0d7a1 0
|
||||
3 12486426 0xbe871a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456840 0xbe1388 0
|
||||
1 12638112 0xc0d7a0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508199 0xbedc27 0
|
||||
7 12456841 0xbe1389 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378480 0xbce170 0
|
||||
6 12591742 0xc0227e 0
|
||||
|
|
@ -1,152 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 23:17:05 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:17:05 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180076032.
|
||||
WARNING: Using actual aggregate bytes moved = 25803784192.
|
||||
write 180.20 22978560 16.00 0.001147 136.56 0.000180 136.56 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179617280.
|
||||
WARNING: Using actual aggregate bytes moved = 25233440768.
|
||||
write 184.25 22978560 16.00 0.001454 130.61 0.000185 130.61 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141178535936.
|
||||
WARNING: Using actual aggregate bytes moved = 25464586240.
|
||||
write 180.65 22978560 16.00 0.004355 134.43 0.000167 134.43 2
|
||||
|
||||
Max Write: 184.25 MiB/sec (193.20 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 184.25 180.20 181.70 1.81 133.86699 0 6 6 3 1 0 1 0 0 1 23530045440 16384 25803784192 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 23:23:50 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 6 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:6#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 23:24:00 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 23530045440 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:24:00 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 6 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 2841722880.
|
||||
read 22.57 22978560 16.00 0.000229 120.07 0.001204 120.07 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 3014508544.
|
||||
read 23.94 22978560 16.00 0.000234 120.07 0.000178 120.07 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 847081635840.
|
||||
WARNING: Using actual aggregate bytes moved = 3021340672.
|
||||
read 24.00 22978560 16.00 0.000192 120.07 0.000172 120.07 2
|
||||
|
||||
Max Read: 24.00 MiB/sec (25.16 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 24.00 22.57 23.50 0.66 120.07070 0 6 6 3 1 0 1 0 0 1 23530045440 16384 2841722880 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 23:30:01 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566615 0xbfc057 0
|
||||
4 12508330 0xbedcaa 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456971 0xbe140b 0
|
||||
1 12638245 0xc0d825 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508331 0xbedcab 0
|
||||
7 12456972 0xbe140c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378611 0xbce1f3 0
|
||||
6 12591874 0xc02302 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591875 0xc02303 0
|
||||
0 12420261 0xbd84a5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486558 0xbe879e 0
|
||||
5 12378612 0xbce1f4 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 00:57:49 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:57:49 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060147200.
|
||||
WARNING: Using actual aggregate bytes moved = 14386278400.
|
||||
write 223.36 19660800 100.00 0.008652 61.42 0.000296 61.42 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060147200.
|
||||
WARNING: Using actual aggregate bytes moved = 14757171200.
|
||||
write 231.38 19660800 100.00 0.020601 60.80 0.000238 60.82 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161060966400.
|
||||
WARNING: Using actual aggregate bytes moved = 14609510400.
|
||||
write 227.67 19660800 100.00 0.010475 61.19 0.000243 61.20 2
|
||||
|
||||
Max Write: 231.38 MiB/sec (242.62 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 231.38 223.36 227.47 3.28 61.14912 0 8 8 3 0 0 1 0 0 1 20132659200 102400 14386278400 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:00:59 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 01:01:10 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 01:01:10 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6008320000.
|
||||
read 95.36 19660800 100.00 0.006084 60.08 0.000243 60.09 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6281113600.
|
||||
read 99.70 19660800 100.00 0.001106 60.08 0.000289 60.08 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6569676800.
|
||||
read 104.29 19660800 100.00 0.001119 60.07 0.000213 60.08 2
|
||||
|
||||
Max Read: 104.29 MiB/sec (109.36 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 104.29 95.36 99.79 3.65 60.08071 0 8 8 3 0 0 1 0 0 1 20132659200 102400 6008320000 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 01:04:11 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384980 0xbcfad4 0
|
||||
6 12598236 0xc03bdc 0
|
||||
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:16:22 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:16:22 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179224064.
|
||||
WARNING: Using actual aggregate bytes moved = 141393133568.
|
||||
write 1341.52 17233920 1024.00 0.006187 100.51 0.000394 100.52 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141208584192.
|
||||
write 1300.42 17233920 1024.00 0.022214 103.53 0.000317 103.56 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 140952731648.
|
||||
write 1376.55 17233920 1024.00 0.016399 97.64 0.000286 97.65 2
|
||||
|
||||
Max Write: 1376.55 MiB/sec (1443.42 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1376.55 1300.42 1339.50 31.11 100.57450 0 8 8 3 0 0 1 0 0 1 17647534080 1048576 141393133568 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 21:21:31 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 21:21:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:21:43 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 50769952768.
|
||||
read 403.38 17233920 1024.00 0.002663 120.03 0.000268 120.03 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 60143173632.
|
||||
read 477.74 17233920 1024.00 0.001079 120.06 0.000247 120.06 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 61476962304.
|
||||
read 488.37 17233920 1024.00 0.001143 120.05 0.000220 120.05 2
|
||||
|
||||
Max Read: 488.37 MiB/sec (512.09 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 488.37 403.38 456.49 37.81 120.04743 0 8 8 3 0 0 1 0 0 1 17647534080 1048576 50769952768 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 21:27:43 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456945 0xbe13f1 0
|
||||
1 12638220 0xc0d80c 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:19:28 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:19:28 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141599703040.
|
||||
write 1540.40 17233920 10240 0.002347 87.66 0.000382 87.67 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141316587520.
|
||||
write 1509.42 17233920 10240 0.117178 89.17 0.000275 89.29 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 141798932480.
|
||||
write 1490.90 17233920 10240 0.214682 90.49 0.000251 90.70 2
|
||||
|
||||
Max Write: 1540.40 MiB/sec (1615.22 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1540.40 1490.90 1513.57 20.42 89.21839 0 8 8 3 0 0 1 0 0 1 17647534080 10485760 141599703040 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:24:06 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:24:18 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:24:18 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141694074880.
|
||||
read 1706.21 17233920 10240 0.058433 79.14 0.000337 79.20 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 140288983040.
|
||||
read 1890.77 17233920 10240 0.001087 70.76 0.000277 70.76 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 140666470400.
|
||||
read 1992.99 17233920 10240 0.001099 67.31 0.000207 67.31 2
|
||||
|
||||
Max Read: 1992.99 MiB/sec (2089.80 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1992.99 1706.21 1863.32 118.68 72.42319 0 8 8 3 0 0 1 0 0 1 17647534080 10485760 141694074880 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:27:56 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,104 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 23:04:08 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:04:08 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180125184.
|
||||
WARNING: Using actual aggregate bytes moved = 5007572992.
|
||||
write 39.58 17233920 16.00 0.006125 120.65 0.001161 120.65 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179551744.
|
||||
WARNING: Using actual aggregate bytes moved = 5154930688.
|
||||
write 38.04 17233920 16.00 0.001755 129.23 0.000201 129.24 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180108800.
|
||||
WARNING: Using actual aggregate bytes moved = 5222072320.
|
||||
write 39.44 17233920 16.00 0.001761 126.27 0.000198 126.28 2
|
||||
|
||||
Max Write: 39.58 MiB/sec (41.50 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 39.58 38.04 39.02 0.70 125.38790 0 8 8 3 0 0 1 0 0 1 17647534080 16384 5007572992 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 23:10:53 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 23:11:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 23:11:02 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4092526592.
|
||||
read 32.41 17233920 16.00 0.002418 120.41 0.000254 120.41 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4224303104.
|
||||
read 33.46 17233920 16.00 0.000925 120.40 0.000182 120.40 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4356243456.
|
||||
read 34.50 17233920 16.00 0.000914 120.40 0.000175 120.41 2
|
||||
|
||||
Max Read: 34.50 MiB/sec (36.18 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 34.50 32.41 33.46 0.85 120.40629 0 8 8 3 0 0 1 0 0 1 17647534080 16384 4092526592 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 23:17:03 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420257 0xbd84a1 0
|
||||
2 12566611 0xbfc053 0
|
||||
|
|
@ -1,172 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:51:19 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:51:19 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059020800.
|
||||
WARNING: Using actual aggregate bytes moved = 72529510400.
|
||||
write 1090.36 19660800 100.00 0.001503 63.44 0.000231 63.44 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059635200.
|
||||
WARNING: Using actual aggregate bytes moved = 59135385600.
|
||||
write 890.22 19660800 100.00 0.003580 63.34 0.000244 63.35 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 161059430400.
|
||||
WARNING: Using actual aggregate bytes moved = 60045619200.
|
||||
write 903.90 19660800 100.00 0.004637 63.35 0.000216 63.35 2
|
||||
|
||||
Max Write: 1090.36 MiB/sec (1143.32 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1090.36 890.22 961.49 91.29 63.38006 0 8 8 3 1 0 1 0 0 1 20132659200 102400 72529510400 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:54:34 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:54:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:54:46 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 150 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 1288490188800.
|
||||
WARNING: Using actual aggregate bytes moved = 5145702400.
|
||||
read 81.77 19660800 100.00 0.001214 60.01 0.000247 60.02 0
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 1288490188800.
|
||||
WARNING: Using actual aggregate bytes moved = 5171200000.
|
||||
read 82.17 19660800 100.00 0.000245 60.02 0.000207 60.02 1
|
||||
WARNING: Expected aggregate file size = 161061273600.
|
||||
WARNING: Stat() of aggregate file size = 1288490188800.
|
||||
WARNING: Using actual aggregate bytes moved = 5682585600.
|
||||
read 90.29 19660800 100.00 0.000298 60.02 0.000214 60.02 2
|
||||
|
||||
Max Read: 90.29 MiB/sec (94.68 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 90.29 81.77 84.74 3.93 60.01693 0 8 8 3 1 0 1 0 0 1 20132659200 102400 5145702400 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:57:46 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644623 0xc0f10f 0
|
||||
3 12492918 0xbea076 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384979 0xbcfad3 0
|
||||
6 12598235 0xc03bdb 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572977 0xbfd931 0
|
||||
4 12514714 0xbef59a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514715 0xbef59b 0
|
||||
7 12463337 0xbe2ce9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598234 0xc03bda 0
|
||||
0 12426639 0xbd9d8f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463336 0xbe2ce8 0
|
||||
1 12644622 0xc0f10e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492917 0xbea075 0
|
||||
5 12384978 0xbcfad2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384977 0xbcfad1 0
|
||||
6 12598233 0xc03bd9 0
|
||||
|
|
@ -1,163 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:10:10 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:10:10 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 3995 17233920 1024.00 0.001577 33.70 0.000219 33.70 0
|
||||
write 3867 17233920 1024.00 0.002179 34.81 0.000257 34.81 1
|
||||
write 3899 17233920 1024.00 0.001851 34.52 0.000215 34.53 2
|
||||
|
||||
Max Write: 3995.24 MiB/sec (4189.31 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3995.24 3867.42 3920.66 54.32 34.34767 0 8 8 3 1 0 1 0 0 1 17647534080 1048576 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:11:58 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 21:12:11 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 21:12:11 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 114182586368.
|
||||
read 907.34 17233920 1024.00 0.000688 120.01 0.000304 120.01 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 1366.67 17233920 1024.00 0.000268 98.52 0.000259 98.52 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 4447 17233920 1024.00 0.000357 30.27 0.000273 30.27 2
|
||||
|
||||
Max Read: 4447.43 MiB/sec (4663.47 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 4447.43 907.34 2240.48 1571.77 82.93445 0 8 8 3 1 0 1 0 0 1 17647534080 1048576 114182586368 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 21:16:19 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456942 0xbe13ee 0
|
||||
1 12638217 0xc0d809 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420234 0xbd848a 0
|
||||
2 12566586 0xbfc03a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378585 0xbce1d9 0
|
||||
6 12591846 0xc022e6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566587 0xbfc03b 0
|
||||
4 12508304 0xbedc90 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591847 0xc022e7 0
|
||||
0 12420235 0xbd848b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456944 0xbe13f0 0
|
||||
1 12638219 0xc0d80b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638218 0xc0d80a 0
|
||||
3 12486528 0xbe8780 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508303 0xbedc8f 0
|
||||
7 12456943 0xbe13ef 0
|
||||
|
|
@ -1,163 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 18:11:04 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:11:04 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 5134 17233920 10240 0.002389 26.22 0.000231 26.23 0
|
||||
write 5461 17233920 10240 0.001829 24.65 0.000202 24.66 1
|
||||
write 5548 17233920 10240 0.001759 24.27 0.000242 24.27 2
|
||||
|
||||
Max Write: 5547.69 MiB/sec (5817.18 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 5547.69 5133.69 5380.68 178.23 25.05087 0 8 8 3 1 0 1 0 0 1 17647534080 10485760 141180272640 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 18:12:24 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 18:12:37 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:12:37 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 122714849280.
|
||||
read 974.47 17233920 10240 0.000374 120.09 0.000285 120.10 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 3081.20 17233920 10240 0.000268 43.70 0.000238 43.70 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 141180272640.
|
||||
read 4532 17233920 10240 0.000245 29.71 0.000257 29.71 2
|
||||
|
||||
Max Read: 4532.05 MiB/sec (4752.20 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 4532.05 974.47 2862.58 1460.58 64.50042 0 8 8 3 1 0 1 0 0 1 17647534080 10485760 122714849280 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 18:15:50 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591735 0xc02277 0
|
||||
0 12420120 0xbd8418 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378474 0xbce16a 0
|
||||
6 12591736 0xc02278 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638108 0xc0d79c 0
|
||||
3 12486420 0xbe8714 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566475 0xbfbfcb 0
|
||||
4 12508192 0xbedc20 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420121 0xbd8419 0
|
||||
2 12566476 0xbfbfcc 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486421 0xbe8715 0
|
||||
5 12378475 0xbce16b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591737 0xc02279 0
|
||||
0 12420122 0xbd841a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508193 0xbedc21 0
|
||||
7 12456835 0xbe1383 0
|
||||
|
|
@ -1,172 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:51:16 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:51:16 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141178634240.
|
||||
WARNING: Using actual aggregate bytes moved = 32019611648.
|
||||
write 234.47 17233920 16.00 0.001957 130.23 0.000285 130.23 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141179027456.
|
||||
WARNING: Using actual aggregate bytes moved = 31119147008.
|
||||
write 229.00 17233920 16.00 0.018787 129.58 0.000220 129.60 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 141180272640.
|
||||
WARNING: Using actual aggregate bytes moved = 31432753152.
|
||||
write 226.90 17233920 16.00 0.001744 132.11 0.000247 132.11 2
|
||||
|
||||
Max Write: 234.47 MiB/sec (245.86 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 234.47 226.90 230.12 3.19 130.64780 0 8 8 3 1 0 1 0 0 1 17647534080 16384 32019611648 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 22:57:53 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 8 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:1#PPN:8#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 22:58:06 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 17647534080 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread1/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 22:58:06 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread1/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 8 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 131.48 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 3643408384.
|
||||
read 28.94 17233920 16.00 0.000359 120.07 0.000223 120.07 0
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 3886481408.
|
||||
read 30.87 17233920 16.00 0.000286 120.05 0.000238 120.06 1
|
||||
WARNING: Expected aggregate file size = 141180272640.
|
||||
WARNING: Stat() of aggregate file size = 1129442181120.
|
||||
WARNING: Using actual aggregate bytes moved = 4003840000.
|
||||
read 31.81 17233920 16.00 0.000252 120.05 0.000242 120.05 2
|
||||
|
||||
Max Read: 31.81 MiB/sec (33.35 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 31.81 28.94 30.54 1.19 120.06106 0 8 8 3 1 0 1 0 0 1 17647534080 16384 3643408384 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 23:04:06 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 2 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456966 0xbe1406 0
|
||||
1 12638238 0xc0d81e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420254 0xbd849e 0
|
||||
2 12566608 0xbfc050 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420256 0xbd84a0 0
|
||||
2 12566610 0xbfc052 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486552 0xbe8798 0
|
||||
5 12378606 0xbce1ee 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566609 0xbfc051 0
|
||||
4 12508324 0xbedca4 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638239 0xc0d81f 0
|
||||
3 12486553 0xbe8799 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591869 0xc022fd 0
|
||||
0 12420255 0xbd849f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 2
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378607 0xbce1ef 0
|
||||
6 12591870 0xc022fe 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:35:53 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:35:53 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576968499200.
|
||||
WARNING: Using actual aggregate bytes moved = 18205388800.
|
||||
write 282.84 157286400 100.00 0.012199 61.37 0.000510 61.38 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576970342400.
|
||||
WARNING: Using actual aggregate bytes moved = 18470400000.
|
||||
write 286.69 157286400 100.00 0.001943 61.44 0.000509 61.44 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576947712000.
|
||||
WARNING: Using actual aggregate bytes moved = 18311065600.
|
||||
write 284.49 157286400 100.00 0.002002 61.38 0.000617 61.38 2
|
||||
|
||||
Max Write: 286.69 MiB/sec (300.62 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 286.69 282.84 284.67 1.58 61.40290 0 16 1 3 0 0 1 0 0 1 161061273600 102400 18205388800 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:38:58 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:39:00 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:39:00 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 9434828800.
|
||||
read 146.58 157286400 100.00 0.013505 61.37 0.000718 61.38 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 9369497600.
|
||||
read 145.59 157286400 100.00 0.001391 61.37 0.000729 61.38 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 9533849600.
|
||||
read 148.16 157286400 100.00 0.001105 61.37 0.000804 61.37 2
|
||||
|
||||
Max Read: 148.16 MiB/sec (155.35 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 148.16 145.59 146.77 1.06 61.37606 0 16 1 3 0 0 1 0 0 1 161061273600 102400 9434828800 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:42:04 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571040 0xbfd1a0 0
|
||||
4 12512776 0xbeee08 0
|
||||
7 12461410 0xbe2562 0
|
||||
1 12642687 0xc0e97f 0
|
||||
3 12490986 0xbe98ea 0
|
||||
5 12383049 0xbcf349 0
|
||||
6 12596308 0xc03454 0
|
||||
0 12424700 0xbd95fc 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 10:26:26 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:26:26 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 322012446720.
|
||||
write 2555.15 137871360 1024.00 0.014606 120.17 0.000808 120.19 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258878070784.
|
||||
WARNING: Using actual aggregate bytes moved = 318062460928.
|
||||
write 2523.54 137871360 1024.00 0.012289 120.19 0.000852 120.20 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258873876480.
|
||||
WARNING: Using actual aggregate bytes moved = 318693703680.
|
||||
write 2529.36 137871360 1024.00 0.008500 120.15 0.001109 120.16 2
|
||||
|
||||
Max Write: 2555.15 MiB/sec (2679.27 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2555.15 2523.54 2536.02 13.74 120.18223 0 16 1 3 0 0 1 0 0 1 141180272640 1048576 322012446720 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 10:32:30 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 10:32:40 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:32:40 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 97859403776.
|
||||
read 776.45 137871360 1024.00 0.047178 120.15 0.000699 120.20 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 99297001472.
|
||||
read 788.17 137871360 1024.00 0.001091 120.15 0.000940 120.15 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 99388227584.
|
||||
read 788.91 137871360 1024.00 0.001376 120.14 0.001174 120.15 2
|
||||
|
||||
Max Read: 788.91 MiB/sec (827.23 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 788.91 776.45 784.51 5.71 120.16321 0 16 1 3 0 0 1 0 0 1 141180272640 1048576 97859403776 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 10:38:41 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488837 0xbe9085 0
|
||||
5 12380898 0xbceae2 0
|
||||
6 12594159 0xc02bef 0
|
||||
0 12422549 0xbd8d95 0
|
||||
2 12568891 0xbfc93b 0
|
||||
4 12510627 0xbee5a3 0
|
||||
7 12459260 0xbe1cfc 0
|
||||
1 12640534 0xc0e116 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 08:17:28 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:17:28 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258727075840.
|
||||
WARNING: Using actual aggregate bytes moved = 235510169600.
|
||||
write 1869.22 137871360 10240 0.014852 120.14 0.000794 120.16 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258789990400.
|
||||
WARNING: Using actual aggregate bytes moved = 244339179520.
|
||||
write 1936.52 137871360 10240 0.002699 120.33 0.000907 120.33 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 241560453120.
|
||||
write 1912.19 137871360 10240 0.039775 120.43 0.001066 120.47 2
|
||||
|
||||
Max Write: 1936.52 MiB/sec (2030.59 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1936.52 1869.22 1905.98 27.82 120.32012 0 16 1 3 0 0 1 0 0 1 141180272640 10485760 235510169600 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 08:23:33 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:10485760.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 08:23:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:23:43 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 267911168000.
|
||||
read 2126.81 137871360 10240 0.056208 120.08 0.007795 120.13 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 271193210880.
|
||||
read 2153.64 137871360 10240 0.008455 120.09 0.007829 120.09 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 271402926080.
|
||||
read 2155.45 137871360 10240 0.008286 120.08 0.007919 120.08 2
|
||||
|
||||
Max Read: 2155.45 MiB/sec (2260.15 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 2155.45 2126.81 2145.30 13.09 120.10137 0 16 1 3 0 0 1 0 0 1 141180272640 10485760 267911168000 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 08:29:43 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458248 0xbe1908 0
|
||||
1 12639520 0xc0dd20 0
|
||||
3 12487830 0xbe8c96 0
|
||||
5 12379889 0xbce6f1 0
|
||||
6 12593149 0xc027fd 0
|
||||
0 12421542 0xbd89a6 0
|
||||
2 12567888 0xbfc550 0
|
||||
4 12509619 0xbee1b3 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:59:32 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:59:32 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980017152.
|
||||
WARNING: Using actual aggregate bytes moved = 3194421248.
|
||||
write 44.22 157286400 16.00 0.014469 68.88 0.000886 68.89 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576977313792.
|
||||
WARNING: Using actual aggregate bytes moved = 3202416640.
|
||||
write 44.29 157286400 16.00 0.002253 68.96 0.000873 68.96 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576941858816.
|
||||
WARNING: Using actual aggregate bytes moved = 3198746624.
|
||||
write 44.28 157286400 16.00 0.002199 68.88 0.000872 68.89 2
|
||||
|
||||
Max Write: 44.29 MiB/sec (46.44 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 44.29 44.22 44.26 0.03 68.91342 0 16 1 3 0 0 1 0 0 1 161061273600 16384 3194421248 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:02:59 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:MPIIO#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 22:03:01 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:03:01 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1819131904.
|
||||
read 25.22 157286400 16.00 0.011761 68.76 0.001092 68.78 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1824178176.
|
||||
read 25.30 157286400 16.00 0.002407 68.75 0.001058 68.75 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1819475968.
|
||||
read 25.24 157286400 16.00 0.001513 68.75 0.001096 68.75 2
|
||||
|
||||
Max Read: 25.30 MiB/sec (26.53 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 25.30 25.22 25.26 0.03 68.76020 0 16 1 3 0 0 1 0 0 1 161061273600 16384 1819131904 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:06:28 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12491994 0xbe9cda 0
|
||||
5 12384054 0xbcf736 0
|
||||
6 12597312 0xc03840 0
|
||||
0 12425719 0xbd99f7 0
|
||||
2 12572046 0xbfd58e 0
|
||||
4 12513785 0xbef1f9 0
|
||||
7 12462419 0xbe2953 0
|
||||
1 12643696 0xc0ed70 0
|
||||
|
|
@ -1,347 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:07:38 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:07:38 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576906240000.
|
||||
WARNING: Using actual aggregate bytes moved = 113326899200.
|
||||
write 921.17 157286400 100.00 0.000784 117.32 0.000425 117.33 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576955801600.
|
||||
WARNING: Using actual aggregate bytes moved = 98036326400.
|
||||
write 776.57 157286400 100.00 0.014977 120.38 0.000757 120.39 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576922009600.
|
||||
WARNING: Using actual aggregate bytes moved = 104338432000.
|
||||
write 779.62 157286400 100.00 0.001920 127.63 0.000862 127.63 2
|
||||
|
||||
Max Write: 921.17 MiB/sec (965.92 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 921.17 776.57 825.79 67.46 121.78398 0 16 1 3 1 0 1 0 0 1 161061273600 102400 113326899200 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:13:46 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:13:51 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:13:51 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 10354176000.
|
||||
read 164.23 157286400 100.00 0.000855 60.12 0.000512 60.12 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 10616524800.
|
||||
read 168.57 157286400 100.00 0.000525 60.06 0.000531 60.06 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 10593689600.
|
||||
read 168.21 157286400 100.00 0.000705 60.06 0.000526 60.06 2
|
||||
|
||||
Max Read: 168.57 MiB/sec (176.76 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 168.57 164.23 167.00 1.96 60.08273 0 16 1 3 1 0 1 0 0 1 161061273600 102400 10354176000 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:16:51 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572838 0xbfd8a6 0
|
||||
3 12492781 0xbe9fed 0
|
||||
6 12598098 0xc03b52 0
|
||||
4 12514577 0xbef511 0
|
||||
5 12384841 0xbcfa49 0
|
||||
0 12426504 0xbd9d08 0
|
||||
7 12463203 0xbe2c63 0
|
||||
1 12644489 0xc0f089 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492776 0xbe9fe8 0
|
||||
1 12644480 0xc0f080 0
|
||||
5 12384836 0xbcfa44 0
|
||||
2 12572834 0xbfd8a2 0
|
||||
6 12598094 0xc03b4e 0
|
||||
0 12426498 0xbd9d02 0
|
||||
4 12514574 0xbef50e 0
|
||||
7 12463200 0xbe2c60 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492783 0xbe9fef 0
|
||||
2 12572842 0xbfd8aa 0
|
||||
1 12644492 0xc0f08c 0
|
||||
6 12598104 0xc03b58 0
|
||||
5 12384847 0xbcfa4f 0
|
||||
4 12514586 0xbef51a 0
|
||||
7 12463208 0xbe2c68 0
|
||||
0 12426509 0xbd9d0d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644487 0xc0f087 0
|
||||
4 12514580 0xbef514 0
|
||||
5 12384849 0xbcfa51 0
|
||||
2 12572846 0xbfd8ae 0
|
||||
6 12598106 0xc03b5a 0
|
||||
0 12426510 0xbd9d0e 0
|
||||
3 12492790 0xbe9ff6 0
|
||||
7 12463210 0xbe2c6a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463197 0xbe2c5d 0
|
||||
3 12492777 0xbe9fe9 0
|
||||
4 12514575 0xbef50f 0
|
||||
1 12644482 0xc0f082 0
|
||||
0 12426500 0xbd9d04 0
|
||||
2 12572836 0xbfd8a4 0
|
||||
5 12384839 0xbcfa47 0
|
||||
6 12598096 0xc03b50 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426502 0xbd9d06 0
|
||||
4 12514578 0xbef512 0
|
||||
3 12492782 0xbe9fee 0
|
||||
5 12384842 0xbcfa4a 0
|
||||
6 12598101 0xc03b55 0
|
||||
7 12463205 0xbe2c65 0
|
||||
1 12644491 0xc0f08b 0
|
||||
2 12572844 0xbfd8ac 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572837 0xbfd8a5 0
|
||||
4 12514576 0xbef510 0
|
||||
3 12492780 0xbe9fec 0
|
||||
5 12384840 0xbcfa48 0
|
||||
1 12644484 0xc0f084 0
|
||||
7 12463201 0xbe2c61 0
|
||||
0 12426501 0xbd9d05 0
|
||||
6 12598097 0xc03b51 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644485 0xc0f085 0
|
||||
0 12426503 0xbd9d07 0
|
||||
4 12514579 0xbef513 0
|
||||
7 12463202 0xbe2c62 0
|
||||
2 12572840 0xbfd8a8 0
|
||||
6 12598102 0xc03b56 0
|
||||
3 12492785 0xbe9ff1 0
|
||||
5 12384844 0xbcfa4c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644479 0xc0f07f 0
|
||||
3 12492775 0xbe9fe7 0
|
||||
5 12384835 0xbcfa43 0
|
||||
6 12598092 0xc03b4c 0
|
||||
0 12426496 0xbd9d00 0
|
||||
2 12572832 0xbfd8a0 0
|
||||
4 12514571 0xbef50b 0
|
||||
7 12463196 0xbe2c5c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598099 0xc03b53 0
|
||||
2 12572839 0xbfd8a7 0
|
||||
5 12384843 0xbcfa4b 0
|
||||
7 12463204 0xbe2c64 0
|
||||
1 12644490 0xc0f08a 0
|
||||
4 12514581 0xbef515 0
|
||||
3 12492788 0xbe9ff4 0
|
||||
0 12426507 0xbd9d0b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572833 0xbfd8a1 0
|
||||
4 12514572 0xbef50c 0
|
||||
0 12426499 0xbd9d03 0
|
||||
7 12463199 0xbe2c5f 0
|
||||
1 12644483 0xc0f083 0
|
||||
5 12384838 0xbcfa46 0
|
||||
6 12598095 0xc03b4f 0
|
||||
3 12492779 0xbe9feb 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644486 0xc0f086 0
|
||||
7 12463206 0xbe2c66 0
|
||||
3 12492786 0xbe9ff2 0
|
||||
6 12598105 0xc03b59 0
|
||||
4 12514585 0xbef519 0
|
||||
5 12384848 0xbcfa50 0
|
||||
0 12426508 0xbd9d0c 0
|
||||
2 12572847 0xbfd8af 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598100 0xc03b54 0
|
||||
2 12572841 0xbfd8a9 0
|
||||
7 12463207 0xbe2c67 0
|
||||
3 12492787 0xbe9ff3 0
|
||||
1 12644493 0xc0f08d 0
|
||||
5 12384846 0xbcfa4e 0
|
||||
4 12514582 0xbef516 0
|
||||
0 12426506 0xbd9d0a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598093 0xc03b4d 0
|
||||
0 12426497 0xbd9d01 0
|
||||
7 12463198 0xbe2c5e 0
|
||||
2 12572835 0xbfd8a3 0
|
||||
4 12514573 0xbef50d 0
|
||||
1 12644481 0xc0f081 0
|
||||
3 12492778 0xbe9fea 0
|
||||
5 12384837 0xbcfa45 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572845 0xbfd8ad 0
|
||||
4 12514584 0xbef518 0
|
||||
7 12463209 0xbe2c69 0
|
||||
1 12644494 0xc0f08e 0
|
||||
3 12492789 0xbe9ff5 0
|
||||
5 12384850 0xbcfa52 0
|
||||
6 12598107 0xc03b5b 0
|
||||
0 12426511 0xbd9d0f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644488 0xc0f088 0
|
||||
3 12492784 0xbe9ff0 0
|
||||
6 12598103 0xc03b57 0
|
||||
5 12384845 0xbcfa4d 0
|
||||
2 12572843 0xbfd8ab 0
|
||||
0 12426505 0xbd9d09 0
|
||||
4 12514583 0xbef517 0
|
||||
|
|
@ -1,346 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 10:13:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:13:02 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258846613504.
|
||||
WARNING: Using actual aggregate bytes moved = 673961738240.
|
||||
write 4819 137871360 1024.00 0.000930 133.37 0.000665 133.37 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258867585024.
|
||||
WARNING: Using actual aggregate bytes moved = 617881796608.
|
||||
write 4363 137871360 1024.00 0.006670 135.07 0.000829 135.07 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 678933037056.
|
||||
write 4745 137871360 1024.00 0.001755 136.44 0.001155 136.45 2
|
||||
|
||||
Max Write: 4819.17 MiB/sec (5053.27 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4819.17 4362.52 4642.34 200.15 134.96339 0 16 1 3 1 0 1 0 0 1 141180272640 1048576 673961738240 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 10:20:00 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 10:20:25 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:20:25 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 153187516416.
|
||||
read 1217.24 137871360 1024.00 0.000789 120.02 0.000565 120.02 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 164603363328.
|
||||
read 1307.91 137871360 1024.00 0.000597 120.02 0.000861 120.02 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 178045059072.
|
||||
read 1414.67 137871360 1024.00 0.000901 120.02 0.001137 120.03 2
|
||||
|
||||
Max Read: 1414.67 MiB/sec (1483.39 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1414.67 1217.24 1313.28 80.69 120.02189 0 16 1 3 1 0 1 0 0 1 141180272640 1048576 153187516416 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 10:26:25 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488825 0xbe9079 0
|
||||
7 12459248 0xbe1cf0 0
|
||||
0 12422541 0xbd8d8d 0
|
||||
6 12594150 0xc02be6 0
|
||||
4 12510618 0xbee59a 0
|
||||
1 12640530 0xc0e112 0
|
||||
2 12568887 0xbfc937 0
|
||||
5 12380894 0xbceade 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568873 0xbfc929 0
|
||||
1 12640516 0xc0e104 0
|
||||
4 12510610 0xbee592 0
|
||||
5 12380880 0xbcead0 0
|
||||
7 12459243 0xbe1ceb 0
|
||||
6 12594142 0xc02bde 0
|
||||
0 12422532 0xbd8d84 0
|
||||
3 12488821 0xbe9075 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568884 0xbfc934 0
|
||||
4 12510620 0xbee59c 0
|
||||
7 12459255 0xbe1cf7 0
|
||||
1 12640531 0xc0e113 0
|
||||
3 12488834 0xbe9082 0
|
||||
5 12380895 0xbceadf 0
|
||||
6 12594155 0xc02beb 0
|
||||
0 12422546 0xbd8d92 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568875 0xbfc92b 0
|
||||
3 12488822 0xbe9076 0
|
||||
6 12594145 0xc02be1 0
|
||||
4 12510613 0xbee595 0
|
||||
1 12640523 0xc0e10b 0
|
||||
5 12380890 0xbceada 0
|
||||
0 12422542 0xbd8d8e 0
|
||||
7 12459253 0xbe1cf5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594146 0xc02be2 0
|
||||
5 12380887 0xbcead7 0
|
||||
2 12568880 0xbfc930 0
|
||||
4 12510616 0xbee598 0
|
||||
3 12488830 0xbe907e 0
|
||||
1 12640529 0xc0e111 0
|
||||
0 12422545 0xbd8d91 0
|
||||
7 12459256 0xbe1cf8 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422535 0xbd8d87 0
|
||||
1 12640524 0xc0e10c 0
|
||||
7 12459249 0xbe1cf1 0
|
||||
6 12594149 0xc02be5 0
|
||||
3 12488829 0xbe907d 0
|
||||
2 12568883 0xbfc933 0
|
||||
5 12380892 0xbceadc 0
|
||||
4 12510622 0xbee59e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380885 0xbcead5 0
|
||||
0 12422537 0xbd8d89 0
|
||||
1 12640526 0xc0e10e 0
|
||||
7 12459250 0xbe1cf2 0
|
||||
3 12488827 0xbe907b 0
|
||||
6 12594152 0xc02be8 0
|
||||
2 12568882 0xbfc932 0
|
||||
4 12510619 0xbee59b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488824 0xbe9078 0
|
||||
2 12568879 0xbfc92f 0
|
||||
5 12380889 0xbcead9 0
|
||||
1 12640527 0xc0e10f 0
|
||||
0 12422543 0xbd8d8f 0
|
||||
6 12594154 0xc02bea 0
|
||||
4 12510623 0xbee59f 0
|
||||
7 12459257 0xbe1cf9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640517 0xc0e105 0
|
||||
4 12510612 0xbee594 0
|
||||
5 12380883 0xbcead3 0
|
||||
7 12459247 0xbe1cef 0
|
||||
6 12594143 0xc02bdf 0
|
||||
2 12568877 0xbfc92d 0
|
||||
0 12422540 0xbd8d8c 0
|
||||
3 12488826 0xbe907a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380884 0xbcead4 0
|
||||
0 12422534 0xbd8d86 0
|
||||
6 12594147 0xc02be3 0
|
||||
1 12640525 0xc0e10d 0
|
||||
3 12488828 0xbe907c 0
|
||||
7 12459254 0xbe1cf6 0
|
||||
4 12510621 0xbee59d 0
|
||||
2 12568886 0xbfc936 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594141 0xc02bdd 0
|
||||
4 12510609 0xbee591 0
|
||||
3 12488819 0xbe9073 0
|
||||
0 12422531 0xbd8d83 0
|
||||
5 12380881 0xbcead1 0
|
||||
7 12459244 0xbe1cec 0
|
||||
2 12568874 0xbfc92a 0
|
||||
1 12640518 0xc0e106 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640521 0xc0e109 0
|
||||
5 12380886 0xbcead6 0
|
||||
2 12568881 0xbfc931 0
|
||||
6 12594151 0xc02be7 0
|
||||
3 12488832 0xbe9080 0
|
||||
0 12422544 0xbd8d90 0
|
||||
4 12510624 0xbee5a0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422536 0xbd8d88 0
|
||||
2 12568878 0xbfc92e 0
|
||||
4 12510615 0xbee597 0
|
||||
7 12459251 0xbe1cf3 0
|
||||
1 12640528 0xc0e110 0
|
||||
3 12488833 0xbe9081 0
|
||||
5 12380893 0xbceadd 0
|
||||
6 12594156 0xc02bec 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488820 0xbe9074 0
|
||||
4 12510611 0xbee593 0
|
||||
5 12380882 0xbcead2 0
|
||||
7 12459246 0xbe1cee 0
|
||||
6 12594144 0xc02be0 0
|
||||
1 12640519 0xc0e107 0
|
||||
0 12422539 0xbd8d8b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422533 0xbd8d85 0
|
||||
3 12488823 0xbe9077 0
|
||||
1 12640522 0xc0e10a 0
|
||||
5 12380888 0xbcead8 0
|
||||
7 12459252 0xbe1cf4 0
|
||||
4 12510617 0xbee599 0
|
||||
6 12594153 0xc02be9 0
|
||||
2 12568885 0xbfc935 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12459245 0xbe1ced 0
|
||||
2 12568876 0xbfc92c 0
|
||||
1 12640520 0xc0e108 0
|
||||
4 12510614 0xbee596 0
|
||||
0 12422538 0xbd8d8a 0
|
||||
6 12594148 0xc02be4 0
|
||||
5 12380891 0xbceadb 0
|
||||
3 12488831 0xbe907f 0
|
||||
|
|
@ -1,345 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 08:04:11 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:04:11 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258213273600.
|
||||
WARNING: Using actual aggregate bytes moved = 741028659200.
|
||||
write 5379 137871360 10240 0.001035 131.39 0.000464 131.39 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258737561600.
|
||||
WARNING: Using actual aggregate bytes moved = 734506516480.
|
||||
write 5201 137871360 10240 0.001279 134.68 0.001972 134.69 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258716590080.
|
||||
WARNING: Using actual aggregate bytes moved = 734821089280.
|
||||
write 5332 137871360 10240 0.001447 131.42 0.000908 131.42 2
|
||||
|
||||
Max Write: 5378.54 MiB/sec (5639.80 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 5378.54 5200.85 5303.89 75.27 132.50012 0 16 1 3 1 0 1 0 0 1 141180272640 10485760 741028659200 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 08:11:02 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 08:11:27 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:11:27 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 179358924800.
|
||||
read 1423.81 137871360 10240 0.000705 120.13 0.000564 120.14 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 193619558400.
|
||||
read 1537.12 137871360 10240 0.000548 120.13 0.000686 120.13 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 214549135360.
|
||||
read 1703.21 137871360 10240 0.000848 120.13 0.000894 120.13 2
|
||||
|
||||
Max Read: 1703.21 MiB/sec (1785.94 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1703.21 1423.81 1554.71 114.74 120.13175 0 16 1 3 1 0 1 0 0 1 141180272640 10485760 179358924800 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 08:17:28 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593133 0xc027ed 0
|
||||
1 12639508 0xc0dd14 0
|
||||
4 12509606 0xbee1a6 0
|
||||
3 12487817 0xbe8c89 0
|
||||
0 12421532 0xbd899c 0
|
||||
2 12567877 0xbfc545 0
|
||||
7 12458240 0xbe1900 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593132 0xc027ec 0
|
||||
2 12567873 0xbfc541 0
|
||||
7 12458234 0xbe18fa 0
|
||||
4 12509605 0xbee1a5 0
|
||||
5 12379883 0xbce6eb 0
|
||||
1 12639515 0xc0dd1b 0
|
||||
3 12487825 0xbe8c91 0
|
||||
0 12421538 0xbd89a2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379872 0xbce6e0 0
|
||||
4 12509601 0xbee1a1 0
|
||||
1 12639504 0xc0dd10 0
|
||||
6 12593130 0xc027ea 0
|
||||
7 12458230 0xbe18f6 0
|
||||
0 12421524 0xbd8994 0
|
||||
3 12487812 0xbe8c84 0
|
||||
2 12567870 0xbfc53e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509603 0xbee1a3 0
|
||||
5 12379875 0xbce6e3 0
|
||||
1 12639507 0xc0dd13 0
|
||||
7 12458236 0xbe18fc 0
|
||||
0 12421530 0xbd899a 0
|
||||
3 12487819 0xbe8c8b 0
|
||||
2 12567879 0xbfc547 0
|
||||
6 12593142 0xc027f6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379878 0xbce6e6 0
|
||||
2 12567882 0xbfc54a 0
|
||||
7 12458243 0xbe1903 0
|
||||
6 12593143 0xc027f7 0
|
||||
4 12509614 0xbee1ae 0
|
||||
0 12421537 0xbd89a1 0
|
||||
1 12639516 0xc0dd1c 0
|
||||
3 12487826 0xbe8c92 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458239 0xbe18ff 0
|
||||
1 12639512 0xc0dd18 0
|
||||
3 12487821 0xbe8c8d 0
|
||||
5 12379885 0xbce6ed 0
|
||||
6 12593145 0xc027f9 0
|
||||
0 12421539 0xbd89a3 0
|
||||
2 12567885 0xbfc54d 0
|
||||
4 12509616 0xbee1b0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12639513 0xc0dd19 0
|
||||
6 12593139 0xc027f3 0
|
||||
0 12421535 0xbd899f 0
|
||||
4 12509613 0xbee1ad 0
|
||||
3 12487823 0xbe8c8f 0
|
||||
2 12567883 0xbfc54b 0
|
||||
5 12379884 0xbce6ec 0
|
||||
7 12458244 0xbe1904 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593134 0xc027ee 0
|
||||
2 12567876 0xbfc544 0
|
||||
7 12458238 0xbe18fe 0
|
||||
0 12421533 0xbd899d 0
|
||||
4 12509609 0xbee1a9 0
|
||||
3 12487818 0xbe8c8a 0
|
||||
1 12639514 0xc0dd1a 0
|
||||
5 12379882 0xbce6ea 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12639505 0xc0dd11 0
|
||||
2 12567871 0xbfc53f 0
|
||||
7 12458231 0xbe18f7 0
|
||||
3 12487815 0xbe8c87 0
|
||||
0 12421527 0xbd8997 0
|
||||
6 12593135 0xc027ef 0
|
||||
4 12509607 0xbee1a7 0
|
||||
5 12379877 0xbce6e5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12421525 0xbd8995 0
|
||||
5 12379873 0xbce6e1 0
|
||||
1 12639506 0xc0dd12 0
|
||||
2 12567872 0xbfc540 0
|
||||
7 12458235 0xbe18fb 0
|
||||
4 12509608 0xbee1a8 0
|
||||
6 12593136 0xc027f0 0
|
||||
3 12487822 0xbe8c8e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458233 0xbe18f9 0
|
||||
0 12421528 0xbd8998 0
|
||||
5 12379880 0xbce6e8 0
|
||||
4 12509610 0xbee1aa 0
|
||||
2 12567880 0xbfc548 0
|
||||
3 12487824 0xbe8c90 0
|
||||
6 12593144 0xc027f8 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593140 0xc027f4 0
|
||||
0 12421536 0xbd89a0 0
|
||||
2 12567881 0xbfc549 0
|
||||
4 12509615 0xbee1af 0
|
||||
7 12458245 0xbe1905 0
|
||||
1 12639517 0xc0dd1d 0
|
||||
3 12487827 0xbe8c93 0
|
||||
5 12379886 0xbce6ee 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487813 0xbe8c85 0
|
||||
4 12509602 0xbee1a2 0
|
||||
6 12593131 0xc027eb 0
|
||||
7 12458232 0xbe18f8 0
|
||||
5 12379874 0xbce6e2 0
|
||||
0 12421526 0xbd8996 0
|
||||
1 12639509 0xc0dd15 0
|
||||
2 12567875 0xbfc543 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487814 0xbe8c86 0
|
||||
4 12509604 0xbee1a4 0
|
||||
2 12567874 0xbfc542 0
|
||||
1 12639511 0xc0dd17 0
|
||||
6 12593138 0xc027f2 0
|
||||
0 12421534 0xbd899e 0
|
||||
5 12379879 0xbce6e7 0
|
||||
7 12458242 0xbe1902 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379876 0xbce6e4 0
|
||||
0 12421529 0xbd8999 0
|
||||
1 12639510 0xc0dd16 0
|
||||
6 12593137 0xc027f1 0
|
||||
7 12458241 0xbe1901 0
|
||||
3 12487820 0xbe8c8c 0
|
||||
4 12509612 0xbee1ac 0
|
||||
2 12567884 0xbfc54c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487816 0xbe8c88 0
|
||||
7 12458237 0xbe18fd 0
|
||||
0 12421531 0xbd899b 0
|
||||
2 12567878 0xbfc546 0
|
||||
5 12379881 0xbce6e9 0
|
||||
6 12593141 0xc027f5 0
|
||||
4 12509611 0xbee1ab 0
|
||||
|
|
@ -1,345 +0,0 @@
|
|||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:17:18 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:17:18 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576969367552.
|
||||
WARNING: Using actual aggregate bytes moved = 47575384064.
|
||||
write 258.83 157286400 16.00 0.001137 175.29 0.000825 175.29 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576971988992.
|
||||
WARNING: Using actual aggregate bytes moved = 38961807360.
|
||||
write 210.68 157286400 16.00 0.001874 176.36 0.002410 176.36 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576929259520.
|
||||
WARNING: Using actual aggregate bytes moved = 39732887552.
|
||||
write 218.95 157286400 16.00 0.002807 173.06 0.001380 173.06 2
|
||||
|
||||
Max Write: 258.83 MiB/sec (271.41 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 258.83 210.68 229.49 21.02 174.90541 0 16 1 3 1 0 1 0 0 1 161061273600 16384 47575384064 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:26:04 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 16 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:1#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 00:26:09 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 00:26:09 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 16 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 1479524352.
|
||||
read 23.27 157286400 16.00 0.000595 60.62 0.000419 60.62 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 2041004032.
|
||||
read 32.10 157286400 16.00 0.000445 60.63 0.000397 60.63 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980377600.
|
||||
WARNING: Using actual aggregate bytes moved = 2062680064.
|
||||
read 32.45 157286400 16.00 0.000727 60.62 0.000490 60.62 2
|
||||
|
||||
Max Read: 32.45 MiB/sec (34.03 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 32.45 23.27 29.28 4.25 60.62536 0 16 1 3 1 0 1 0 0 1 161061273600 16384 1479524352 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 00:29:11 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384887 0xbcfa77 0
|
||||
6 12598144 0xc03b80 0
|
||||
0 12426547 0xbd9d33 0
|
||||
2 12572885 0xbfd8d5 0
|
||||
1 12644530 0xc0f0b2 0
|
||||
4 12514622 0xbef53e 0
|
||||
3 12492825 0xbea019 0
|
||||
7 12463244 0xbe2c8c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598147 0xc03b83 0
|
||||
1 12644536 0xc0f0b8 0
|
||||
4 12514628 0xbef544 0
|
||||
7 12463251 0xbe2c93 0
|
||||
0 12426556 0xbd9d3c 0
|
||||
3 12492834 0xbea022 0
|
||||
2 12572895 0xbfd8df 0
|
||||
5 12384897 0xbcfa81 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492830 0xbea01e 0
|
||||
6 12598148 0xc03b84 0
|
||||
7 12463250 0xbe2c92 0
|
||||
1 12644537 0xc0f0b9 0
|
||||
5 12384895 0xbcfa7f 0
|
||||
2 12572894 0xbfd8de 0
|
||||
0 12426557 0xbd9d3d 0
|
||||
4 12514632 0xbef548 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572891 0xbfd8db 0
|
||||
5 12384891 0xbcfa7b 0
|
||||
0 12426553 0xbd9d39 0
|
||||
4 12514626 0xbef542 0
|
||||
1 12644538 0xc0f0ba 0
|
||||
3 12492835 0xbea023 0
|
||||
7 12463252 0xbe2c94 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492824 0xbea018 0
|
||||
5 12384886 0xbcfa76 0
|
||||
6 12598143 0xc03b7f 0
|
||||
0 12426546 0xbd9d32 0
|
||||
2 12572884 0xbfd8d4 0
|
||||
4 12514621 0xbef53d 0
|
||||
7 12463243 0xbe2c8b 0
|
||||
1 12644529 0xc0f0b1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426550 0xbd9d36 0
|
||||
2 12572890 0xbfd8da 0
|
||||
6 12598149 0xc03b85 0
|
||||
4 12514627 0xbef543 0
|
||||
3 12492832 0xbea020 0
|
||||
5 12384894 0xbcfa7e 0
|
||||
1 12644540 0xc0f0bc 0
|
||||
7 12463254 0xbe2c96 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463246 0xbe2c8e 0
|
||||
3 12492827 0xbea01b 0
|
||||
6 12598146 0xc03b82 0
|
||||
2 12572887 0xbfd8d7 0
|
||||
1 12644533 0xc0f0b5 0
|
||||
0 12426551 0xbd9d37 0
|
||||
4 12514624 0xbef540 0
|
||||
5 12384892 0xbcfa7c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644539 0xc0f0bb 0
|
||||
3 12492833 0xbea021 0
|
||||
5 12384896 0xbcfa80 0
|
||||
6 12598153 0xc03b89 0
|
||||
0 12426558 0xbd9d3e 0
|
||||
2 12572896 0xbfd8e0 0
|
||||
4 12514633 0xbef549 0
|
||||
7 12463255 0xbe2c97 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463241 0xbe2c89 0
|
||||
1 12644527 0xc0f0af 0
|
||||
3 12492822 0xbea016 0
|
||||
5 12384884 0xbcfa74 0
|
||||
6 12598141 0xc03b7d 0
|
||||
0 12426544 0xbd9d30 0
|
||||
2 12572882 0xbfd8d2 0
|
||||
4 12514619 0xbef53b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384890 0xbcfa7a 0
|
||||
1 12644534 0xc0f0b6 0
|
||||
7 12463248 0xbe2c90 0
|
||||
6 12598150 0xc03b86 0
|
||||
0 12426555 0xbd9d3b 0
|
||||
4 12514631 0xbef547 0
|
||||
2 12572893 0xbfd8dd 0
|
||||
3 12492836 0xbea024 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514618 0xbef53a 0
|
||||
7 12463240 0xbe2c88 0
|
||||
1 12644526 0xc0f0ae 0
|
||||
3 12492821 0xbea015 0
|
||||
5 12384883 0xbcfa73 0
|
||||
6 12598140 0xc03b7c 0
|
||||
0 12426543 0xbd9d2f 0
|
||||
2 12572881 0xbfd8d1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598145 0xc03b81 0
|
||||
4 12514623 0xbef53f 0
|
||||
1 12644531 0xc0f0b3 0
|
||||
0 12426548 0xbd9d34 0
|
||||
7 12463245 0xbe2c8d 0
|
||||
2 12572886 0xbfd8d6 0
|
||||
3 12492826 0xbea01a 0
|
||||
5 12384888 0xbcfa78 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492828 0xbea01c 0
|
||||
2 12572889 0xbfd8d9 0
|
||||
1 12644535 0xc0f0b7 0
|
||||
0 12426552 0xbd9d38 0
|
||||
7 12463249 0xbe2c91 0
|
||||
6 12598151 0xc03b87 0
|
||||
4 12514629 0xbef545 0
|
||||
5 12384893 0xbcfa7d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572892 0xbfd8dc 0
|
||||
3 12492831 0xbea01f 0
|
||||
0 12426554 0xbd9d3a 0
|
||||
4 12514630 0xbef546 0
|
||||
6 12598152 0xc03b88 0
|
||||
1 12644541 0xc0f0bd 0
|
||||
7 12463253 0xbe2c95 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644528 0xc0f0b0 0
|
||||
3 12492823 0xbea017 0
|
||||
5 12384885 0xbcfa75 0
|
||||
6 12598142 0xc03b7e 0
|
||||
0 12426545 0xbd9d31 0
|
||||
2 12572883 0xbfd8d3 0
|
||||
4 12514620 0xbef53c 0
|
||||
7 12463242 0xbe2c8a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463247 0xbe2c8f 0
|
||||
1 12644532 0xc0f0b4 0
|
||||
0 12426549 0xbd9d35 0
|
||||
5 12384889 0xbcfa79 0
|
||||
2 12572888 0xbfd8d8 0
|
||||
3 12492829 0xbea01d 0
|
||||
4 12514625 0xbef541 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:07:08 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:07:08 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576966758400.
|
||||
WARNING: Using actual aggregate bytes moved = 20476416000.
|
||||
write 317.96 78643200 100.00 0.025281 61.39 0.000683 61.42 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980070400.
|
||||
WARNING: Using actual aggregate bytes moved = 20587827200.
|
||||
write 319.40 78643200 100.00 0.003839 61.47 0.000607 61.47 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576957132800.
|
||||
WARNING: Using actual aggregate bytes moved = 20513894400.
|
||||
write 318.44 78643200 100.00 0.004246 61.43 0.000782 61.43 2
|
||||
|
||||
Max Write: 319.40 MiB/sec (334.92 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 319.40 317.96 318.60 0.60 61.44096 0 32 2 3 0 0 1 0 0 1 80530636800 102400 20476416000 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:10:13 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:10:19 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:10:19 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 15758233600.
|
||||
read 244.91 78643200 100.00 0.014319 61.35 0.001103 61.36 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 15850905600.
|
||||
read 246.35 78643200 100.00 0.001698 61.36 0.000836 61.36 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 15859200000.
|
||||
read 246.51 78643200 100.00 0.001924 61.35 0.000782 61.35 2
|
||||
|
||||
Max Read: 246.51 MiB/sec (258.49 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 246.51 244.91 245.92 0.72 61.35943 0 32 2 3 0 0 1 0 0 1 80530636800 102400 15758233600 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:13:23 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425090 0xbd9782 0
|
||||
2 12571426 0xbfd322 0
|
||||
4 12513163 0xbeef8b 0
|
||||
7 12461796 0xbe26e4 0
|
||||
1 12643073 0xc0eb01 0
|
||||
3 12491371 0xbe9a6b 0
|
||||
5 12383428 0xbcf4c4 0
|
||||
6 12596689 0xc035d1 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 10:00:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:00:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258878070784.
|
||||
WARNING: Using actual aggregate bytes moved = 394322247680.
|
||||
write 3128.37 68935680 1024.00 0.018345 120.19 0.001042 120.21 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258882265088.
|
||||
WARNING: Using actual aggregate bytes moved = 389842731008.
|
||||
write 3090.10 68935680 1024.00 0.121912 120.19 0.001159 120.31 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258881216512.
|
||||
WARNING: Using actual aggregate bytes moved = 387821076480.
|
||||
write 3074.77 68935680 1024.00 0.094908 120.19 0.001437 120.29 2
|
||||
|
||||
Max Write: 3128.37 MiB/sec (3280.34 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3128.37 3074.77 3097.75 22.54 120.26981 0 32 2 3 0 0 1 0 0 1 70590136320 1048576 394322247680 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 10:06:39 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 10:07:01 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 10:07:01 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 139143938048.
|
||||
read 1103.78 68935680 1024.00 0.057155 120.16 0.014544 120.22 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141212778496.
|
||||
read 1120.65 68935680 1024.00 0.009195 120.17 0.008226 120.17 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141608091648.
|
||||
read 1123.94 68935680 1024.00 0.009282 120.15 0.008219 120.16 2
|
||||
|
||||
Max Read: 1123.94 MiB/sec (1178.53 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1123.94 1103.78 1116.12 8.83 120.18323 0 32 2 3 0 0 1 0 0 1 70590136320 1048576 139143938048 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 10:13:01 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12459209 0xbe1cc9 0
|
||||
1 12640484 0xc0e0e4 0
|
||||
3 12488787 0xbe9053 0
|
||||
5 12380851 0xbceab3 0
|
||||
6 12594110 0xc02bbe 0
|
||||
0 12422502 0xbd8d66 0
|
||||
2 12568843 0xbfc90b 0
|
||||
4 12510577 0xbee571 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:51:42 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:51:42 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258852904960.
|
||||
WARNING: Using actual aggregate bytes moved = 297806069760.
|
||||
write 2357.33 68935680 10240 0.010628 120.47 0.001143 120.48 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258873876480.
|
||||
WARNING: Using actual aggregate bytes moved = 299567677440.
|
||||
write 2361.22 68935680 10240 0.120874 120.87 0.001215 120.99 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258873876480.
|
||||
WARNING: Using actual aggregate bytes moved = 298686873600.
|
||||
write 2364.97 68935680 10240 0.101102 120.34 0.001640 120.45 2
|
||||
|
||||
Max Write: 2364.97 MiB/sec (2479.85 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2364.97 2357.33 2361.17 3.12 120.63914 0 32 2 3 0 0 1 0 0 1 70590136320 10485760 297806069760 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 07:57:48 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:10485760.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:58:09 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:58:09 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 339256279040.
|
||||
read 2692.31 68935680 10240 0.072617 120.09 0.008699 120.17 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 340451655680.
|
||||
read 2702.94 68935680 10240 0.002030 120.12 0.001370 120.12 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 343523983360.
|
||||
read 2727.72 68935680 10240 0.002360 120.10 0.001708 120.10 2
|
||||
|
||||
Max Read: 2727.72 MiB/sec (2860.22 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 2727.72 2692.31 2707.66 14.84 120.13227 0 32 2 3 0 0 1 0 0 1 70590136320 10485760 339256279040 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 08:04:10 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379839 0xbce6bf 0
|
||||
6 12593099 0xc027cb 0
|
||||
0 12421491 0xbd8973 0
|
||||
2 12567840 0xbfc520 0
|
||||
4 12509568 0xbee180 0
|
||||
7 12458199 0xbe18d7 0
|
||||
1 12639471 0xc0dcef 0
|
||||
3 12487781 0xbe8c65 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 22:36:20 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:36:20 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576973004800.
|
||||
WARNING: Using actual aggregate bytes moved = 3703734272.
|
||||
write 51.56 78643200 16.00 0.016513 68.48 0.006620 68.51 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576976494592.
|
||||
WARNING: Using actual aggregate bytes moved = 3673653248.
|
||||
write 51.12 78643200 16.00 0.001890 68.53 0.000832 68.53 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576975577088.
|
||||
WARNING: Using actual aggregate bytes moved = 3665985536.
|
||||
write 51.04 78643200 16.00 0.002547 68.50 0.000973 68.50 2
|
||||
|
||||
Max Write: 51.56 MiB/sec (54.06 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 51.56 51.04 51.24 0.23 68.51450 0 32 2 3 0 0 1 0 0 1 80530636800 16384 3703734272 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:39:47 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:MPIIO#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 22:39:50 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:39:50 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3156115456.
|
||||
read 43.97 78643200 16.00 0.020186 68.43 0.011702 68.45 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3175940096.
|
||||
read 44.26 78643200 16.00 0.009680 68.43 0.008969 68.44 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3169992704.
|
||||
read 44.18 78643200 16.00 0.009972 68.43 0.009044 68.43 2
|
||||
|
||||
Max Read: 44.26 MiB/sec (46.41 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 44.26 43.97 44.14 0.12 68.43898 0 32 2 3 0 0 1 0 0 1 80530636800 16384 3156115456 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:43:15 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597699 0xc039c3 0
|
||||
0 12426101 0xbd9b75 0
|
||||
2 12572431 0xbfd70f 0
|
||||
4 12514173 0xbef37d 0
|
||||
7 12462804 0xbe2ad4 0
|
||||
1 12644083 0xc0eef3 0
|
||||
3 12492380 0xbe9e5c 0
|
||||
5 12384440 0xbcf8b8 0
|
||||
|
|
@ -1,598 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 20:57:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:57:46 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576789299200.
|
||||
WARNING: Using actual aggregate bytes moved = 107571609600.
|
||||
write 800.40 78643200 100.00 0.001116 128.17 0.000509 128.17 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576885043200.
|
||||
WARNING: Using actual aggregate bytes moved = 101109248000.
|
||||
write 779.54 78643200 100.00 0.002048 123.69 0.000753 123.69 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576949964800.
|
||||
WARNING: Using actual aggregate bytes moved = 102498611200.
|
||||
write 815.19 78643200 100.00 0.003191 119.91 0.001021 119.91 2
|
||||
|
||||
Max Write: 815.19 MiB/sec (854.79 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 815.19 779.54 798.38 14.62 123.92568 0 32 2 3 1 0 1 0 0 1 80530636800 102400 107571609600 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 21:04:00 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 21:04:07 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:04:07 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 21941452800.
|
||||
read 348.47 78643200 100.00 0.006952 60.05 0.006602 60.05 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 22563430400.
|
||||
read 358.28 78643200 100.00 0.006607 60.06 0.006591 60.06 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 22746726400.
|
||||
read 361.29 78643200 100.00 0.006654 60.04 0.006733 60.04 2
|
||||
|
||||
Max Read: 361.29 MiB/sec (378.84 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 361.29 348.47 356.01 5.48 60.05015 0 32 2 3 1 0 1 0 0 1 80530636800 102400 21941452800 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 21:07:07 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12513137 0xbeef71 0
|
||||
7 12461769 0xbe26c9 0
|
||||
6 12596665 0xc035b9 0
|
||||
3 12491348 0xbe9a54 0
|
||||
0 12425069 0xbd976d 0
|
||||
5 12383406 0xbcf4ae 0
|
||||
2 12571405 0xbfd30d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000023
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12383408 0xbcf4b0 0
|
||||
2 12571407 0xbfd30f 0
|
||||
4 12513144 0xbeef78 0
|
||||
1 12643054 0xc0eaee 0
|
||||
6 12596671 0xc035bf 0
|
||||
7 12461777 0xbe26d1 0
|
||||
0 12425073 0xbd9771 0
|
||||
3 12491351 0xbe9a57 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12491338 0xbe9a4a 0
|
||||
0 12425058 0xbd9762 0
|
||||
2 12571393 0xbfd301 0
|
||||
7 12461762 0xbe26c2 0
|
||||
6 12596658 0xc035b2 0
|
||||
4 12513132 0xbeef6c 0
|
||||
5 12383397 0xbcf4a5 0
|
||||
1 12643042 0xc0eae2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000026
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12513147 0xbeef7b 0
|
||||
7 12461780 0xbe26d4 0
|
||||
1 12643057 0xc0eaf1 0
|
||||
3 12491354 0xbe9a5a 0
|
||||
5 12383412 0xbcf4b4 0
|
||||
6 12596673 0xc035c1 0
|
||||
0 12425075 0xbd9773 0
|
||||
2 12571410 0xbfd312 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12383420 0xbcf4bc 0
|
||||
6 12596681 0xc035c9 0
|
||||
0 12425082 0xbd977a 0
|
||||
2 12571418 0xbfd31a 0
|
||||
4 12513155 0xbeef83 0
|
||||
7 12461787 0xbe26db 0
|
||||
1 12643065 0xc0eaf9 0
|
||||
3 12491362 0xbe9a62 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000020
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425065 0xbd9769 0
|
||||
4 12513141 0xbeef75 0
|
||||
1 12643051 0xc0eaeb 0
|
||||
5 12383405 0xbcf4ad 0
|
||||
7 12461773 0xbe26cd 0
|
||||
2 12571404 0xbfd30c 0
|
||||
6 12596669 0xc035bd 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000030
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12643060 0xc0eaf4 0
|
||||
3 12491357 0xbe9a5d 0
|
||||
5 12383415 0xbcf4b7 0
|
||||
6 12596676 0xc035c4 0
|
||||
0 12425077 0xbd9775 0
|
||||
2 12571413 0xbfd315 0
|
||||
4 12513150 0xbeef7e 0
|
||||
7 12461782 0xbe26d6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571409 0xbfd311 0
|
||||
4 12513146 0xbeef7a 0
|
||||
7 12461779 0xbe26d3 0
|
||||
1 12643056 0xc0eaf0 0
|
||||
3 12491353 0xbe9a59 0
|
||||
5 12383411 0xbcf4b3 0
|
||||
6 12596672 0xc035c0 0
|
||||
0 12425074 0xbd9772 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12383417 0xbcf4b9 0
|
||||
6 12596678 0xc035c6 0
|
||||
0 12425079 0xbd9777 0
|
||||
7 12461784 0xbe26d8 0
|
||||
1 12643062 0xc0eaf6 0
|
||||
2 12571416 0xbfd318 0
|
||||
4 12513153 0xbeef81 0
|
||||
3 12491361 0xbe9a61 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000018
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425084 0xbd977c 0
|
||||
2 12571420 0xbfd31c 0
|
||||
4 12513157 0xbeef85 0
|
||||
7 12461789 0xbe26dd 0
|
||||
1 12643067 0xc0eafb 0
|
||||
3 12491364 0xbe9a64 0
|
||||
5 12383422 0xbcf4be 0
|
||||
6 12596683 0xc035cb 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000031
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12491344 0xbe9a50 0
|
||||
4 12513136 0xbeef70 0
|
||||
2 12571402 0xbfd30a 0
|
||||
7 12461768 0xbe26c8 0
|
||||
0 12425067 0xbd976b 0
|
||||
1 12643049 0xc0eae9 0
|
||||
5 12383403 0xbcf4ab 0
|
||||
6 12596666 0xc035ba 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12491358 0xbe9a5e 0
|
||||
5 12383416 0xbcf4b8 0
|
||||
6 12596677 0xc035c5 0
|
||||
0 12425078 0xbd9776 0
|
||||
2 12571414 0xbfd316 0
|
||||
4 12513151 0xbeef7f 0
|
||||
7 12461783 0xbe26d7 0
|
||||
1 12643061 0xc0eaf5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425063 0xbd9767 0
|
||||
2 12571398 0xbfd306 0
|
||||
6 12596663 0xc035b7 0
|
||||
5 12383402 0xbcf4aa 0
|
||||
1 12643048 0xc0eae8 0
|
||||
4 12513140 0xbeef74 0
|
||||
3 12491345 0xbe9a51 0
|
||||
7 12461770 0xbe26ca 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000025
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12461792 0xbe26e0 0
|
||||
1 12643070 0xc0eafe 0
|
||||
3 12491367 0xbe9a67 0
|
||||
5 12383425 0xbcf4c1 0
|
||||
6 12596686 0xc035ce 0
|
||||
0 12425087 0xbd977f 0
|
||||
2 12571423 0xbfd31f 0
|
||||
4 12513160 0xbeef88 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000022
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12596682 0xc035ca 0
|
||||
0 12425083 0xbd977b 0
|
||||
2 12571419 0xbfd31b 0
|
||||
4 12513156 0xbeef84 0
|
||||
7 12461788 0xbe26dc 0
|
||||
1 12643066 0xc0eafa 0
|
||||
3 12491363 0xbe9a63 0
|
||||
5 12383421 0xbcf4bd 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12383401 0xbcf4a9 0
|
||||
7 12461767 0xbe26c7 0
|
||||
6 12596662 0xc035b6 0
|
||||
3 12491343 0xbe9a4f 0
|
||||
0 12425064 0xbd9768 0
|
||||
1 12643046 0xc0eae6 0
|
||||
2 12571399 0xbfd307 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571421 0xbfd31d 0
|
||||
4 12513158 0xbeef86 0
|
||||
7 12461790 0xbe26de 0
|
||||
1 12643068 0xc0eafc 0
|
||||
3 12491365 0xbe9a65 0
|
||||
5 12383423 0xbcf4bf 0
|
||||
6 12596684 0xc035cc 0
|
||||
0 12425085 0xbd977d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000028
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12461781 0xbe26d5 0
|
||||
1 12643058 0xc0eaf2 0
|
||||
3 12491355 0xbe9a5b 0
|
||||
5 12383413 0xbcf4b5 0
|
||||
6 12596674 0xc035c2 0
|
||||
0 12425076 0xbd9774 0
|
||||
2 12571412 0xbfd314 0
|
||||
4 12513149 0xbeef7d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12491359 0xbe9a5f 0
|
||||
5 12383419 0xbcf4bb 0
|
||||
2 12571415 0xbfd317 0
|
||||
6 12596680 0xc035c8 0
|
||||
4 12513154 0xbeef82 0
|
||||
7 12461786 0xbe26da 0
|
||||
0 12425081 0xbd9779 0
|
||||
1 12643064 0xc0eaf8 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000017
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12596657 0xc035b1 0
|
||||
4 12513131 0xbeef6b 0
|
||||
1 12643041 0xc0eae1 0
|
||||
5 12383396 0xbcf4a4 0
|
||||
0 12425059 0xbd9763 0
|
||||
7 12461763 0xbe26c3 0
|
||||
3 12491339 0xbe9a4b 0
|
||||
2 12571394 0xbfd302 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000029
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12643044 0xc0eae4 0
|
||||
5 12383399 0xbcf4a7 0
|
||||
2 12571397 0xbfd305 0
|
||||
3 12491341 0xbe9a4d 0
|
||||
4 12513134 0xbeef6e 0
|
||||
6 12596661 0xc035b5 0
|
||||
7 12461766 0xbe26c6 0
|
||||
0 12425062 0xbd9766 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000016
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571395 0xbfd303 0
|
||||
5 12383400 0xbcf4a8 0
|
||||
1 12643045 0xc0eae5 0
|
||||
6 12596660 0xc035b4 0
|
||||
7 12461765 0xbe26c5 0
|
||||
0 12425061 0xbd9765 0
|
||||
3 12491342 0xbe9a4e 0
|
||||
4 12513135 0xbeef6f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12643040 0xc0eae0 0
|
||||
3 12491337 0xbe9a49 0
|
||||
5 12383395 0xbcf4a3 0
|
||||
6 12596656 0xc035b0 0
|
||||
0 12425057 0xbd9761 0
|
||||
2 12571392 0xbfd300 0
|
||||
4 12513130 0xbeef6a 0
|
||||
7 12461761 0xbe26c1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12513152 0xbeef80 0
|
||||
3 12491360 0xbe9a60 0
|
||||
5 12383418 0xbcf4ba 0
|
||||
7 12461785 0xbe26d9 0
|
||||
6 12596679 0xc035c7 0
|
||||
1 12643063 0xc0eaf7 0
|
||||
0 12425080 0xbd9778 0
|
||||
2 12571417 0xbfd319 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000021
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12513159 0xbeef87 0
|
||||
7 12461791 0xbe26df 0
|
||||
1 12643069 0xc0eafd 0
|
||||
3 12491366 0xbe9a66 0
|
||||
5 12383424 0xbcf4c0 0
|
||||
6 12596685 0xc035cd 0
|
||||
0 12425086 0xbd977e 0
|
||||
2 12571422 0xbfd31e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000019
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571403 0xbfd30b 0
|
||||
0 12425066 0xbd976a 0
|
||||
5 12383409 0xbcf4b1 0
|
||||
6 12596670 0xc035be 0
|
||||
1 12643055 0xc0eaef 0
|
||||
7 12461778 0xbe26d2 0
|
||||
4 12513145 0xbeef79 0
|
||||
3 12491352 0xbe9a58 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425070 0xbd976e 0
|
||||
7 12461776 0xbe26d0 0
|
||||
3 12491356 0xbe9a5c 0
|
||||
2 12571411 0xbfd313 0
|
||||
1 12643059 0xc0eaf3 0
|
||||
4 12513148 0xbeef7c 0
|
||||
5 12383414 0xbcf4b6 0
|
||||
6 12596675 0xc035c3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571401 0xbfd309 0
|
||||
6 12596664 0xc035b8 0
|
||||
3 12491347 0xbe9a53 0
|
||||
4 12513142 0xbeef76 0
|
||||
1 12643053 0xc0eaed 0
|
||||
7 12461775 0xbe26cf 0
|
||||
0 12425072 0xbd9770 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000027
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12461764 0xbe26c4 0
|
||||
1 12643043 0xc0eae3 0
|
||||
6 12596659 0xc035b3 0
|
||||
4 12513133 0xbeef6d 0
|
||||
3 12491340 0xbe9a4c 0
|
||||
5 12383398 0xbcf4a6 0
|
||||
0 12425060 0xbd9764 0
|
||||
2 12571396 0xbfd304 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000024
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12571400 0xbfd308 0
|
||||
4 12513138 0xbeef72 0
|
||||
3 12491346 0xbe9a52 0
|
||||
1 12643050 0xc0eaea 0
|
||||
5 12383404 0xbcf4ac 0
|
||||
7 12461772 0xbe26cc 0
|
||||
6 12596668 0xc035bc 0
|
||||
0 12425071 0xbd976f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12643047 0xc0eae7 0
|
||||
0 12425068 0xbd976c 0
|
||||
7 12461771 0xbe26cb 0
|
||||
4 12513143 0xbeef77 0
|
||||
5 12383407 0xbcf4af 0
|
||||
3 12491349 0xbe9a55 0
|
||||
2 12571406 0xbfd30e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12513139 0xbeef73 0
|
||||
1 12643052 0xc0eaec 0
|
||||
6 12596667 0xc035bb 0
|
||||
7 12461774 0xbe26ce 0
|
||||
2 12571408 0xbfd310 0
|
||||
5 12383410 0xbcf4b2 0
|
||||
3 12491350 0xbe9a56 0
|
||||
|
|
@ -1,598 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 09:47:19 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:47:19 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258788941824.
|
||||
WARNING: Using actual aggregate bytes moved = 658624217088.
|
||||
write 4669 68935680 1024.00 0.001081 134.51 0.000669 134.52 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258653675520.
|
||||
WARNING: Using actual aggregate bytes moved = 668196667392.
|
||||
write 4746 68935680 1024.00 0.004385 134.26 0.001022 134.26 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258737561600.
|
||||
WARNING: Using actual aggregate bytes moved = 653849001984.
|
||||
write 4637 68935680 1024.00 0.002475 134.48 0.001501 134.48 2
|
||||
|
||||
Max Write: 4746.30 MiB/sec (4976.86 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4746.30 4636.84 4684.20 45.89 134.41843 0 32 2 3 1 0 1 0 0 1 70590136320 1048576 658624217088 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 09:54:11 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 09:54:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:54:31 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 289747763200.
|
||||
read 2301.58 68935680 1024.00 0.004985 120.06 0.004599 120.06 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 329581068288.
|
||||
read 2618.67 68935680 1024.00 0.004627 120.03 0.004544 120.03 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 353401569280.
|
||||
read 2808.00 68935680 1024.00 0.004710 120.02 0.004864 120.03 2
|
||||
|
||||
Max Read: 2808.00 MiB/sec (2944.40 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 2808.00 2301.58 2576.08 208.93 120.03717 0 32 2 3 1 0 1 0 0 1 70590136320 1048576 289747763200 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 10:00:31 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12459177 0xbe1ca9 0
|
||||
1 12640453 0xc0e0c5 0
|
||||
5 12380824 0xbcea98 0
|
||||
6 12594081 0xc02ba1 0
|
||||
3 12488763 0xbe903b 0
|
||||
4 12510552 0xbee558 0
|
||||
0 12422478 0xbd8d4e 0
|
||||
2 12568820 0xbfc8f4 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000023
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568812 0xbfc8ec 0
|
||||
3 12488759 0xbe9037 0
|
||||
7 12459183 0xbe1caf 0
|
||||
0 12422476 0xbd8d4c 0
|
||||
5 12380829 0xbcea9d 0
|
||||
1 12640462 0xc0e0ce 0
|
||||
6 12594087 0xc02ba7 0
|
||||
4 12510556 0xbee55c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594094 0xc02bae 0
|
||||
2 12568831 0xbfc8ff 0
|
||||
7 12459198 0xbe1cbe 0
|
||||
3 12488778 0xbe904a 0
|
||||
0 12422492 0xbd8d5c 0
|
||||
1 12640477 0xc0e0dd 0
|
||||
4 12510567 0xbee567 0
|
||||
5 12380846 0xbceaae 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000026
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422468 0xbd8d44 0
|
||||
3 12488755 0xbe9033 0
|
||||
6 12594076 0xc02b9c 0
|
||||
5 12380819 0xbcea93 0
|
||||
1 12640451 0xc0e0c3 0
|
||||
2 12568811 0xbfc8eb 0
|
||||
7 12459178 0xbe1caa 0
|
||||
4 12510551 0xbee557 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594105 0xc02bb9 0
|
||||
0 12422498 0xbd8d62 0
|
||||
2 12568840 0xbfc908 0
|
||||
4 12510574 0xbee56e 0
|
||||
7 12459205 0xbe1cc5 0
|
||||
1 12640481 0xc0e0e1 0
|
||||
3 12488784 0xbe9050 0
|
||||
5 12380848 0xbceab0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000020
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568829 0xbfc8fd 0
|
||||
7 12459197 0xbe1cbd 0
|
||||
3 12488774 0xbe9046 0
|
||||
0 12422493 0xbd8d5d 0
|
||||
1 12640478 0xc0e0de 0
|
||||
6 12594103 0xc02bb7 0
|
||||
4 12510571 0xbee56b 0
|
||||
5 12380847 0xbceaaf 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000030
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488779 0xbe904b 0
|
||||
5 12380843 0xbceaab 0
|
||||
6 12594100 0xc02bb4 0
|
||||
0 12422494 0xbd8d5e 0
|
||||
2 12568836 0xbfc904 0
|
||||
4 12510569 0xbee569 0
|
||||
7 12459202 0xbe1cc2 0
|
||||
1 12640479 0xc0e0df 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488770 0xbe9042 0
|
||||
0 12422485 0xbd8d55 0
|
||||
4 12510561 0xbee561 0
|
||||
2 12568826 0xbfc8fa 0
|
||||
7 12459194 0xbe1cba 0
|
||||
6 12594092 0xc02bac 0
|
||||
1 12640468 0xc0e0d4 0
|
||||
5 12380837 0xbceaa5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380836 0xbceaa4 0
|
||||
7 12459193 0xbe1cb9 0
|
||||
1 12640467 0xc0e0d3 0
|
||||
2 12568827 0xbfc8fb 0
|
||||
0 12422486 0xbd8d56 0
|
||||
4 12510564 0xbee564 0
|
||||
3 12488772 0xbe9044 0
|
||||
6 12594097 0xc02bb1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000018
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594077 0xc02b9d 0
|
||||
5 12380821 0xbcea95 0
|
||||
4 12510547 0xbee553 0
|
||||
0 12422471 0xbd8d47 0
|
||||
2 12568814 0xbfc8ee 0
|
||||
7 12459182 0xbe1cae 0
|
||||
1 12640454 0xc0e0c6 0
|
||||
3 12488762 0xbe903a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000031
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594078 0xc02b9e 0
|
||||
7 12459180 0xbe1cac 0
|
||||
5 12380826 0xbcea9a 0
|
||||
1 12640461 0xc0e0cd 0
|
||||
4 12510554 0xbee55a 0
|
||||
3 12488766 0xbe903e 0
|
||||
2 12568821 0xbfc8f5 0
|
||||
0 12422480 0xbd8d50 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640470 0xc0e0d6 0
|
||||
2 12568830 0xbfc8fe 0
|
||||
4 12510565 0xbee565 0
|
||||
3 12488777 0xbe9049 0
|
||||
7 12459206 0xbe1cc6 0
|
||||
6 12594106 0xc02bba 0
|
||||
0 12422499 0xbd8d63 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12568813 0xbfc8ed 0
|
||||
7 12459181 0xbe1cad 0
|
||||
6 12594083 0xc02ba3 0
|
||||
1 12640459 0xc0e0cb 0
|
||||
0 12422477 0xbd8d4d 0
|
||||
4 12510553 0xbee559 0
|
||||
5 12380830 0xbcea9e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000025
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422488 0xbd8d58 0
|
||||
1 12640471 0xc0e0d7 0
|
||||
2 12568832 0xbfc900 0
|
||||
5 12380845 0xbceaad 0
|
||||
4 12510570 0xbee56a 0
|
||||
7 12459201 0xbe1cc1 0
|
||||
6 12594104 0xc02bb8 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000022
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640472 0xc0e0d8 0
|
||||
3 12488775 0xbe9047 0
|
||||
5 12380842 0xbceaaa 0
|
||||
6 12594102 0xc02bb6 0
|
||||
0 12422495 0xbd8d5f 0
|
||||
2 12568837 0xbfc905 0
|
||||
4 12510572 0xbee56c 0
|
||||
7 12459203 0xbe1cc3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594075 0xc02b9b 0
|
||||
4 12510544 0xbee550 0
|
||||
1 12640450 0xc0e0c2 0
|
||||
0 12422469 0xbd8d45 0
|
||||
7 12459176 0xbe1ca8 0
|
||||
2 12568809 0xbfc8e9 0
|
||||
3 12488756 0xbe9034 0
|
||||
5 12380822 0xbcea96 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12594093 0xc02bad 0
|
||||
1 12640469 0xc0e0d5 0
|
||||
4 12510563 0xbee563 0
|
||||
3 12488776 0xbe9048 0
|
||||
7 12459200 0xbe1cc0 0
|
||||
2 12568833 0xbfc901 0
|
||||
0 12422496 0xbd8d60 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000028
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12459195 0xbe1cbb 0
|
||||
4 12510562 0xbee562 0
|
||||
2 12568828 0xbfc8fc 0
|
||||
5 12380840 0xbceaa8 0
|
||||
0 12422489 0xbd8d59 0
|
||||
3 12488773 0xbe9045 0
|
||||
1 12640474 0xc0e0da 0
|
||||
6 12594096 0xc02bb0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380838 0xbceaa6 0
|
||||
6 12594095 0xc02baf 0
|
||||
1 12640473 0xc0e0d9 0
|
||||
0 12422491 0xbd8d5b 0
|
||||
4 12510566 0xbee566 0
|
||||
7 12459199 0xbe1cbf 0
|
||||
3 12488780 0xbe904c 0
|
||||
2 12568835 0xbfc903 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000017
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488758 0xbe9036 0
|
||||
4 12510550 0xbee556 0
|
||||
5 12380825 0xbcea99 0
|
||||
0 12422475 0xbd8d4b 0
|
||||
1 12640456 0xc0e0c8 0
|
||||
2 12568818 0xbfc8f2 0
|
||||
6 12594085 0xc02ba5 0
|
||||
7 12459185 0xbe1cb1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000029
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380823 0xbcea97 0
|
||||
3 12488760 0xbe9038 0
|
||||
6 12594080 0xc02ba0 0
|
||||
2 12568816 0xbfc8f0 0
|
||||
7 12459184 0xbe1cb0 0
|
||||
0 12422479 0xbd8d4f 0
|
||||
4 12510555 0xbee55b 0
|
||||
1 12640463 0xc0e0cf 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000016
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380839 0xbceaa7 0
|
||||
0 12422490 0xbd8d5a 0
|
||||
1 12640476 0xc0e0dc 0
|
||||
6 12594099 0xc02bb3 0
|
||||
4 12510568 0xbee568 0
|
||||
2 12568838 0xbfc906 0
|
||||
3 12488782 0xbe904e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12510548 0xbee554 0
|
||||
0 12422472 0xbd8d48 0
|
||||
1 12640457 0xc0e0c9 0
|
||||
2 12568819 0xbfc8f3 0
|
||||
6 12594086 0xc02ba6 0
|
||||
7 12459188 0xbe1cb4 0
|
||||
3 12488767 0xbe903f 0
|
||||
5 12380832 0xbceaa0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380834 0xbceaa2 0
|
||||
6 12594090 0xc02baa 0
|
||||
0 12422483 0xbd8d53 0
|
||||
2 12568824 0xbfc8f8 0
|
||||
4 12510559 0xbee55f 0
|
||||
7 12459191 0xbe1cb7 0
|
||||
1 12640465 0xc0e0d1 0
|
||||
3 12488769 0xbe9041 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000021
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488757 0xbe9035 0
|
||||
4 12510549 0xbee555 0
|
||||
0 12422473 0xbd8d49 0
|
||||
1 12640455 0xc0e0c7 0
|
||||
6 12594082 0xc02ba2 0
|
||||
5 12380828 0xbcea9c 0
|
||||
2 12568817 0xbfc8f1 0
|
||||
7 12459187 0xbe1cb3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000019
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380844 0xbceaac 0
|
||||
6 12594101 0xc02bb5 0
|
||||
0 12422497 0xbd8d61 0
|
||||
2 12568839 0xbfc907 0
|
||||
4 12510573 0xbee56d 0
|
||||
7 12459204 0xbe1cc4 0
|
||||
1 12640480 0xc0e0e0 0
|
||||
3 12488783 0xbe904f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12488768 0xbe9040 0
|
||||
5 12380833 0xbceaa1 0
|
||||
6 12594089 0xc02ba9 0
|
||||
0 12422482 0xbd8d52 0
|
||||
2 12568823 0xbfc8f7 0
|
||||
4 12510558 0xbee55e 0
|
||||
7 12459190 0xbe1cb6 0
|
||||
1 12640464 0xc0e0d0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640460 0xc0e0cc 0
|
||||
3 12488765 0xbe903d 0
|
||||
5 12380831 0xbcea9f 0
|
||||
6 12594088 0xc02ba8 0
|
||||
0 12422481 0xbd8d51 0
|
||||
2 12568822 0xbfc8f6 0
|
||||
4 12510557 0xbee55d 0
|
||||
7 12459189 0xbe1cb5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000027
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12459196 0xbe1cbc 0
|
||||
0 12422487 0xbd8d57 0
|
||||
5 12380841 0xbceaa9 0
|
||||
1 12640475 0xc0e0db 0
|
||||
6 12594098 0xc02bb2 0
|
||||
3 12488781 0xbe904d 0
|
||||
2 12568834 0xbfc902 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000024
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380820 0xbcea94 0
|
||||
4 12510546 0xbee552 0
|
||||
1 12640452 0xc0e0c4 0
|
||||
7 12459179 0xbe1cab 0
|
||||
2 12568815 0xbfc8ef 0
|
||||
0 12422474 0xbd8d4a 0
|
||||
3 12488764 0xbe903c 0
|
||||
6 12594084 0xc02ba4 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12380835 0xbceaa3 0
|
||||
2 12568825 0xbfc8f9 0
|
||||
6 12594091 0xc02bab 0
|
||||
3 12488771 0xbe9043 0
|
||||
0 12422484 0xbd8d54 0
|
||||
4 12510560 0xbee560 0
|
||||
7 12459192 0xbe1cb8 0
|
||||
1 12640466 0xc0e0d2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12510545 0xbee551 0
|
||||
2 12568810 0xbfc8ea 0
|
||||
0 12422470 0xbd8d46 0
|
||||
6 12594079 0xc02b9f 0
|
||||
3 12488761 0xbe9039 0
|
||||
5 12380827 0xbcea9b 0
|
||||
1 12640458 0xc0e0ca 0
|
||||
7 12459186 0xbe1cb2 0
|
||||
|
|
@ -1,591 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 07:38:30 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:38:30 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258758533120.
|
||||
WARNING: Using actual aggregate bytes moved = 748106547200.
|
||||
write 5333 68935680 10240 0.001060 133.78 0.000872 133.78 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258548817920.
|
||||
WARNING: Using actual aggregate bytes moved = 742832209920.
|
||||
write 5316 68935680 10240 0.002029 133.27 0.001122 133.27 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258234245120.
|
||||
WARNING: Using actual aggregate bytes moved = 744604303360.
|
||||
write 5336 68935680 10240 0.008552 133.07 0.001609 133.08 2
|
||||
|
||||
Max Write: 5336.10 MiB/sec (5595.31 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 5336.10 5315.52 5328.16 9.03 133.37805 0 32 2 3 1 0 1 0 0 1 70590136320 10485760 748106547200 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 07:45:20 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 07:45:40 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:45:40 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 334443315200.
|
||||
read 2654.84 68935680 10240 0.004774 120.14 0.004286 120.14 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 381555834880.
|
||||
read 3028.61 68935680 10240 0.004292 120.15 0.004603 120.15 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 413537402880.
|
||||
read 3282.33 68935680 10240 0.004279 120.15 0.004211 120.15 2
|
||||
|
||||
Max Read: 3282.33 MiB/sec (3441.78 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3282.33 2654.84 2988.59 257.73 120.14637 0 32 2 3 1 0 1 0 0 1 70590136320 10485760 334443315200 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 07:51:41 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12421486 0xbd896e 0
|
||||
2 12567835 0xbfc51b 0
|
||||
4 12509562 0xbee17a 0
|
||||
7 12458194 0xbe18d2 0
|
||||
1 12639466 0xc0dcea 0
|
||||
3 12487776 0xbe8c60 0
|
||||
5 12379834 0xbce6ba 0
|
||||
6 12593094 0xc027c6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000023
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593070 0xc027ae 0
|
||||
0 12421464 0xbd8958 0
|
||||
2 12567813 0xbfc505 0
|
||||
4 12509542 0xbee166 0
|
||||
7 12458172 0xbe18bc 0
|
||||
3 12487754 0xbe8c4a 0
|
||||
1 12639446 0xc0dcd6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509551 0xbee16f 0
|
||||
5 12379823 0xbce6af 0
|
||||
3 12487766 0xbe8c56 0
|
||||
2 12567825 0xbfc511 0
|
||||
7 12458186 0xbe18ca 0
|
||||
0 12421483 0xbd896b 0
|
||||
6 12593090 0xc027c2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000026
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593067 0xc027ab 0
|
||||
0 12421460 0xbd8954 0
|
||||
2 12567810 0xbfc502 0
|
||||
4 12509535 0xbee15f 0
|
||||
7 12458168 0xbe18b8 0
|
||||
5 12379808 0xbce6a0 0
|
||||
1 12639440 0xc0dcd0 0
|
||||
3 12487748 0xbe8c44 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509552 0xbee170 0
|
||||
7 12458183 0xbe18c7 0
|
||||
3 12487765 0xbe8c55 0
|
||||
6 12593085 0xc027bd 0
|
||||
2 12567826 0xbfc512 0
|
||||
5 12379825 0xbce6b1 0
|
||||
1 12639457 0xc0dce1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000020
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458177 0xbe18c1 0
|
||||
3 12487759 0xbe8c4f 0
|
||||
1 12639450 0xc0dcda 0
|
||||
2 12567819 0xbfc50b 0
|
||||
5 12379818 0xbce6aa 0
|
||||
0 12421471 0xbd895f 0
|
||||
4 12509546 0xbee16a 0
|
||||
6 12593079 0xc027b7 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000030
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12639451 0xc0dcdb 0
|
||||
6 12593081 0xc027b9 0
|
||||
0 12421475 0xbd8963 0
|
||||
5 12379821 0xbce6ad 0
|
||||
7 12458185 0xbe18c9 0
|
||||
3 12487767 0xbe8c57 0
|
||||
2 12567828 0xbfc514 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487761 0xbe8c51 0
|
||||
5 12379820 0xbce6ac 0
|
||||
2 12567823 0xbfc50f 0
|
||||
4 12509555 0xbee173 0
|
||||
0 12421479 0xbd8967 0
|
||||
6 12593089 0xc027c1 0
|
||||
1 12639460 0xc0dce4 0
|
||||
7 12458190 0xbe18ce 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509549 0xbee16d 0
|
||||
7 12458182 0xbe18c6 0
|
||||
5 12379822 0xbce6ae 0
|
||||
0 12421478 0xbd8966 0
|
||||
1 12639458 0xc0dce2 0
|
||||
2 12567832 0xbfc518 0
|
||||
3 12487772 0xbe8c5c 0
|
||||
6 12593091 0xc027c3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000018
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509564 0xbee17c 0
|
||||
7 12458196 0xbe18d4 0
|
||||
1 12639468 0xc0dcec 0
|
||||
3 12487778 0xbe8c62 0
|
||||
5 12379836 0xbce6bc 0
|
||||
6 12593096 0xc027c8 0
|
||||
0 12421488 0xbd8970 0
|
||||
2 12567837 0xbfc51d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000031
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593093 0xc027c5 0
|
||||
0 12421485 0xbd896d 0
|
||||
2 12567834 0xbfc51a 0
|
||||
4 12509561 0xbee179 0
|
||||
7 12458193 0xbe18d1 0
|
||||
1 12639465 0xc0dce9 0
|
||||
3 12487775 0xbe8c5f 0
|
||||
5 12379833 0xbce6b9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379817 0xbce6a9 0
|
||||
2 12567820 0xbfc50c 0
|
||||
6 12593078 0xc027b6 0
|
||||
0 12421472 0xbd8960 0
|
||||
4 12509548 0xbee16c 0
|
||||
3 12487762 0xbe8c52 0
|
||||
7 12458181 0xbe18c5 0
|
||||
1 12639454 0xc0dcde 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379832 0xbce6b8 0
|
||||
6 12593092 0xc027c4 0
|
||||
0 12421484 0xbd896c 0
|
||||
2 12567833 0xbfc519 0
|
||||
4 12509560 0xbee178 0
|
||||
7 12458192 0xbe18d0 0
|
||||
1 12639464 0xc0dce8 0
|
||||
3 12487774 0xbe8c5e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000025
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487751 0xbe8c47 0
|
||||
4 12509538 0xbee162 0
|
||||
1 12639443 0xc0dcd3 0
|
||||
2 12567812 0xbfc504 0
|
||||
6 12593073 0xc027b1 0
|
||||
7 12458173 0xbe18bd 0
|
||||
0 12421467 0xbd895b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000022
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458179 0xbe18c3 0
|
||||
0 12421474 0xbd8962 0
|
||||
6 12593082 0xc027ba 0
|
||||
1 12639455 0xc0dcdf 0
|
||||
4 12509553 0xbee171 0
|
||||
5 12379824 0xbce6b0 0
|
||||
3 12487770 0xbe8c5a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12567836 0xbfc51c 0
|
||||
4 12509563 0xbee17b 0
|
||||
7 12458195 0xbe18d3 0
|
||||
1 12639467 0xc0dceb 0
|
||||
3 12487777 0xbe8c61 0
|
||||
5 12379835 0xbce6bb 0
|
||||
6 12593095 0xc027c7 0
|
||||
0 12421487 0xbd896f 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458175 0xbe18bf 0
|
||||
1 12639448 0xc0dcd8 0
|
||||
3 12487757 0xbe8c4d 0
|
||||
5 12379815 0xbce6a7 0
|
||||
6 12593076 0xc027b4 0
|
||||
0 12421469 0xbd895d 0
|
||||
2 12567817 0xbfc509 0
|
||||
4 12509544 0xbee168 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000028
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487769 0xbe8c59 0
|
||||
5 12379828 0xbce6b4 0
|
||||
6 12593088 0xc027c0 0
|
||||
0 12421481 0xbd8969 0
|
||||
2 12567831 0xbfc517 0
|
||||
4 12509559 0xbee177 0
|
||||
7 12458191 0xbe18cf 0
|
||||
1 12639463 0xc0dce7 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509550 0xbee16e 0
|
||||
0 12421476 0xbd8964 0
|
||||
6 12593086 0xc027be 0
|
||||
3 12487768 0xbe8c58 0
|
||||
7 12458187 0xbe18cb 0
|
||||
2 12567827 0xbfc513 0
|
||||
5 12379829 0xbce6b5 0
|
||||
1 12639461 0xc0dce5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000017
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458180 0xbe18c4 0
|
||||
6 12593083 0xc027bb 0
|
||||
2 12567824 0xbfc510 0
|
||||
4 12509554 0xbee172 0
|
||||
1 12639456 0xc0dce0 0
|
||||
5 12379830 0xbce6b6 0
|
||||
3 12487771 0xbe8c5b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000029
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487749 0xbe8c45 0
|
||||
5 12379809 0xbce6a1 0
|
||||
2 12567811 0xbfc503 0
|
||||
7 12458169 0xbe18b9 0
|
||||
4 12509536 0xbee160 0
|
||||
1 12639441 0xc0dcd1 0
|
||||
0 12421462 0xbd8956 0
|
||||
6 12593068 0xc027ac 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000016
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379807 0xbce69f 0
|
||||
6 12593066 0xc027aa 0
|
||||
0 12421459 0xbd8953 0
|
||||
2 12567809 0xbfc501 0
|
||||
4 12509534 0xbee15e 0
|
||||
7 12458167 0xbe18b7 0
|
||||
1 12639439 0xc0dccf 0
|
||||
3 12487747 0xbe8c43 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379810 0xbce6a2 0
|
||||
3 12487752 0xbe8c48 0
|
||||
1 12639445 0xc0dcd5 0
|
||||
6 12593072 0xc027b0 0
|
||||
7 12458171 0xbe18bb 0
|
||||
0 12421466 0xbd895a 0
|
||||
2 12567814 0xbfc506 0
|
||||
4 12509543 0xbee167 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12458178 0xbe18c2 0
|
||||
3 12487760 0xbe8c50 0
|
||||
2 12567821 0xbfc50d 0
|
||||
5 12379819 0xbce6ab 0
|
||||
4 12509547 0xbee16b 0
|
||||
6 12593080 0xc027b8 0
|
||||
0 12421473 0xbd8961 0
|
||||
1 12639452 0xc0dcdc 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000021
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12639444 0xc0dcd4 0
|
||||
7 12458170 0xbe18ba 0
|
||||
4 12509541 0xbee165 0
|
||||
5 12379812 0xbce6a4 0
|
||||
3 12487753 0xbe8c49 0
|
||||
6 12593074 0xc027b2 0
|
||||
0 12421468 0xbd895c 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000019
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379826 0xbce6b2 0
|
||||
6 12593087 0xc027bf 0
|
||||
0 12421480 0xbd8968 0
|
||||
2 12567830 0xbfc516 0
|
||||
4 12509558 0xbee176 0
|
||||
7 12458189 0xbe18cd 0
|
||||
1 12639462 0xc0dce6 0
|
||||
3 12487773 0xbe8c5d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487764 0xbe8c54 0
|
||||
2 12567822 0xbfc50e 0
|
||||
5 12379831 0xbce6b7 0
|
||||
4 12509557 0xbee175 0
|
||||
7 12458188 0xbe18cc 0
|
||||
0 12421482 0xbd896a 0
|
||||
1 12639459 0xc0dce3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 6
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12421463 0xbd8957 0
|
||||
4 12509540 0xbee164 0
|
||||
5 12379813 0xbce6a5 0
|
||||
3 12487755 0xbe8c4b 0
|
||||
2 12567815 0xbfc507 0
|
||||
6 12593075 0xc027b3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000027
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12567818 0xbfc50a 0
|
||||
7 12458176 0xbe18c0 0
|
||||
0 12421470 0xbd895e 0
|
||||
1 12639449 0xc0dcd9 0
|
||||
6 12593077 0xc027b5 0
|
||||
3 12487758 0xbe8c4e 0
|
||||
5 12379816 0xbce6a8 0
|
||||
4 12509545 0xbee169 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000024
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12487763 0xbe8c53 0
|
||||
1 12639453 0xc0dcdd 0
|
||||
6 12593084 0xc027bc 0
|
||||
7 12458184 0xbe18c8 0
|
||||
0 12421477 0xbd8965 0
|
||||
5 12379827 0xbce6b3 0
|
||||
4 12509556 0xbee174 0
|
||||
2 12567829 0xbfc515 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 6
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12421461 0xbd8955 0
|
||||
3 12487750 0xbe8c46 0
|
||||
6 12593069 0xc027ad 0
|
||||
4 12509537 0xbee161 0
|
||||
1 12639442 0xc0dcd2 0
|
||||
5 12379811 0xbce6a3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12509539 0xbee163 0
|
||||
6 12593071 0xc027af 0
|
||||
0 12421465 0xbd8959 0
|
||||
5 12379814 0xbce6a6 0
|
||||
7 12458174 0xbe18be 0
|
||||
1 12639447 0xc0dcd7 0
|
||||
3 12487756 0xbe8c4c 0
|
||||
2 12567816 0xbfc508 0
|
||||
|
|
@ -1,600 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 22:24:57 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:24:57 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576953704448.
|
||||
WARNING: Using actual aggregate bytes moved = 43030691840.
|
||||
write 248.62 78643200 16.00 0.000930 165.06 0.000633 165.06 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576886644736.
|
||||
WARNING: Using actual aggregate bytes moved = 37815009280.
|
||||
write 221.74 78643200 16.00 0.002044 162.63 0.000707 162.64 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576513892352.
|
||||
WARNING: Using actual aggregate bytes moved = 39176388608.
|
||||
write 222.27 78643200 16.00 0.019878 168.07 0.001107 168.09 2
|
||||
|
||||
Max Write: 248.62 MiB/sec (260.69 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 248.62 221.74 230.88 12.55 165.26129 0 32 2 3 1 0 1 0 0 1 80530636800 16384 43030691840 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 22:33:14 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 32 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Tue Oct 23 22:33:18 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread16/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:33:18 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread16/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 32 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3848159232.
|
||||
read 60.88 78643200 16.00 0.001235 60.28 0.000831 60.28 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4552736768.
|
||||
read 72.03 78643200 16.00 0.000874 60.28 0.000890 60.28 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4550787072.
|
||||
read 71.99 78643200 16.00 0.000906 60.28 0.000944 60.28 2
|
||||
|
||||
Max Read: 72.03 MiB/sec (75.52 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 72.03 60.88 68.30 5.25 60.28195 0 32 2 3 1 0 1 0 0 1 80530636800 16384 3848159232 POSIX 0
|
||||
|
||||
Finished: Tue Oct 23 22:36:19 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000006
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572415 0xbfd6ff 0
|
||||
4 12514157 0xbef36d 0
|
||||
7 12462786 0xbe2ac2 0
|
||||
1 12644066 0xc0eee2 0
|
||||
3 12492363 0xbe9e4b 0
|
||||
5 12384423 0xbcf8a7 0
|
||||
6 12597682 0xc039b2 0
|
||||
0 12426085 0xbd9b65 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000023
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514146 0xbef362 0
|
||||
7 12462776 0xbe2ab8 0
|
||||
1 12644056 0xc0eed8 0
|
||||
3 12492357 0xbe9e45 0
|
||||
2 12572411 0xbfd6fb 0
|
||||
6 12597679 0xc039af 0
|
||||
5 12384420 0xbcf8a4 0
|
||||
0 12426082 0xbd9b62 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514142 0xbef35e 0
|
||||
7 12462771 0xbe2ab3 0
|
||||
1 12644051 0xc0eed3 0
|
||||
3 12492348 0xbe9e3c 0
|
||||
5 12384409 0xbcf899 0
|
||||
6 12597667 0xc039a3 0
|
||||
0 12426070 0xbd9b56 0
|
||||
2 12572400 0xbfd6f0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000026
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644067 0xc0eee3 0
|
||||
5 12384424 0xbcf8a8 0
|
||||
0 12426086 0xbd9b66 0
|
||||
2 12572416 0xbfd700 0
|
||||
3 12492365 0xbe9e4d 0
|
||||
6 12597684 0xc039b4 0
|
||||
7 12462788 0xbe2ac4 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384421 0xbcf8a5 0
|
||||
6 12597680 0xc039b0 0
|
||||
4 12514155 0xbef36b 0
|
||||
7 12462784 0xbe2ac0 0
|
||||
3 12492361 0xbe9e49 0
|
||||
0 12426083 0xbd9b63 0
|
||||
2 12572414 0xbfd6fe 0
|
||||
1 12644065 0xc0eee1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000020
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597670 0xc039a6 0
|
||||
2 12572405 0xbfd6f5 0
|
||||
7 12462777 0xbe2ab9 0
|
||||
4 12514148 0xbef364 0
|
||||
0 12426077 0xbd9b5d 0
|
||||
1 12644061 0xc0eedd 0
|
||||
3 12492358 0xbe9e46 0
|
||||
5 12384419 0xbcf8a3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000030
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384412 0xbcf89c 0
|
||||
1 12644057 0xc0eed9 0
|
||||
0 12426079 0xbd9b5f 0
|
||||
4 12514150 0xbef366 0
|
||||
3 12492356 0xbe9e44 0
|
||||
7 12462781 0xbe2abd 0
|
||||
6 12597675 0xc039ab 0
|
||||
2 12572410 0xbfd6fa 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000004
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572422 0xbfd706 0
|
||||
5 12384431 0xbcf8af 0
|
||||
0 12426092 0xbd9b6c 0
|
||||
4 12514165 0xbef375 0
|
||||
7 12462795 0xbe2acb 0
|
||||
6 12597691 0xc039bb 0
|
||||
1 12644075 0xc0eeeb 0
|
||||
3 12492372 0xbe9e54 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000007
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492349 0xbe9e3d 0
|
||||
7 12462772 0xbe2ab4 0
|
||||
0 12426071 0xbd9b57 0
|
||||
5 12384410 0xbcf89a 0
|
||||
2 12572402 0xbfd6f2 0
|
||||
1 12644052 0xc0eed4 0
|
||||
6 12597669 0xc039a5 0
|
||||
4 12514144 0xbef360 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000018
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492350 0xbe9e3e 0
|
||||
2 12572401 0xbfd6f1 0
|
||||
0 12426072 0xbd9b58 0
|
||||
7 12462774 0xbe2ab6 0
|
||||
5 12384411 0xbcf89b 0
|
||||
4 12514145 0xbef361 0
|
||||
1 12644055 0xc0eed7 0
|
||||
6 12597672 0xc039a8 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000031
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572417 0xbfd701 0
|
||||
0 12426087 0xbd9b67 0
|
||||
4 12514159 0xbef36f 0
|
||||
1 12644069 0xc0eee5 0
|
||||
3 12492367 0xbe9e4f 0
|
||||
5 12384427 0xbcf8ab 0
|
||||
6 12597686 0xc039b6 0
|
||||
7 12462789 0xbe2ac5 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000012
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12462800 0xbe2ad0 0
|
||||
1 12644080 0xc0eef0 0
|
||||
3 12492377 0xbe9e59 0
|
||||
5 12384437 0xbcf8b5 0
|
||||
6 12597696 0xc039c0 0
|
||||
0 12426098 0xbd9b72 0
|
||||
2 12572428 0xbfd70c 0
|
||||
4 12514170 0xbef37a 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000013
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514169 0xbef379 0
|
||||
7 12462799 0xbe2acf 0
|
||||
1 12644079 0xc0eeef 0
|
||||
3 12492376 0xbe9e58 0
|
||||
5 12384436 0xbcf8b4 0
|
||||
6 12597695 0xc039bf 0
|
||||
0 12426097 0xbd9b71 0
|
||||
2 12572427 0xbfd70b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000025
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12462773 0xbe2ab5 0
|
||||
0 12426073 0xbd9b59 0
|
||||
2 12572403 0xbfd6f3 0
|
||||
1 12644054 0xc0eed6 0
|
||||
6 12597671 0xc039a7 0
|
||||
4 12514147 0xbef363 0
|
||||
5 12384415 0xbcf89f 0
|
||||
3 12492354 0xbe9e42 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000022
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597689 0xc039b9 0
|
||||
4 12514164 0xbef374 0
|
||||
7 12462793 0xbe2ac9 0
|
||||
1 12644073 0xc0eee9 0
|
||||
3 12492370 0xbe9e52 0
|
||||
2 12572423 0xbfd707 0
|
||||
0 12426093 0xbd9b6d 0
|
||||
5 12384432 0xbcf8b0 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572398 0xbfd6ee 0
|
||||
4 12514140 0xbef35c 0
|
||||
7 12462769 0xbe2ab1 0
|
||||
1 12644049 0xc0eed1 0
|
||||
3 12492346 0xbe9e3a 0
|
||||
5 12384407 0xbcf897 0
|
||||
6 12597665 0xc039a1 0
|
||||
0 12426068 0xbd9b54 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000008
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572413 0xbfd6fd 0
|
||||
1 12644064 0xc0eee0 0
|
||||
5 12384422 0xbcf8a6 0
|
||||
4 12514156 0xbef36c 0
|
||||
0 12426084 0xbd9b64 0
|
||||
7 12462785 0xbe2ac1 0
|
||||
3 12492362 0xbe9e4a 0
|
||||
6 12597681 0xc039b1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000028
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426089 0xbd9b69 0
|
||||
2 12572420 0xbfd704 0
|
||||
5 12384429 0xbcf8ad 0
|
||||
4 12514162 0xbef372 0
|
||||
6 12597690 0xc039ba 0
|
||||
7 12462794 0xbe2aca 0
|
||||
1 12644074 0xc0eeea 0
|
||||
3 12492371 0xbe9e53 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000010
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492366 0xbe9e4e 0
|
||||
5 12384426 0xbcf8aa 0
|
||||
6 12597685 0xc039b5 0
|
||||
0 12426088 0xbd9b68 0
|
||||
2 12572419 0xbfd703 0
|
||||
4 12514160 0xbef370 0
|
||||
7 12462790 0xbe2ac6 0
|
||||
1 12644070 0xc0eee6 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000017
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12492351 0xbe9e3f 0
|
||||
0 12426076 0xbd9b5c 0
|
||||
1 12644060 0xc0eedc 0
|
||||
2 12572409 0xbfd6f9 0
|
||||
6 12597676 0xc039ac 0
|
||||
5 12384418 0xbcf8a2 0
|
||||
4 12514154 0xbef36a 0
|
||||
7 12462783 0xbe2abf 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000029
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426074 0xbd9b5a 0
|
||||
6 12597674 0xc039aa 0
|
||||
5 12384416 0xbcf8a0 0
|
||||
3 12492355 0xbe9e43 0
|
||||
7 12462780 0xbe2abc 0
|
||||
2 12572408 0xbfd6f8 0
|
||||
1 12644062 0xc0eede 0
|
||||
4 12514152 0xbef368 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000016
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384428 0xbcf8ac 0
|
||||
7 12462791 0xbe2ac7 0
|
||||
1 12644071 0xc0eee7 0
|
||||
6 12597687 0xc039b7 0
|
||||
3 12492369 0xbe9e51 0
|
||||
0 12426090 0xbd9b6a 0
|
||||
2 12572421 0xbfd705 0
|
||||
4 12514163 0xbef373 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000005
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426075 0xbd9b5b 0
|
||||
7 12462782 0xbe2abe 0
|
||||
6 12597677 0xc039ad 0
|
||||
4 12514153 0xbef369 0
|
||||
3 12492360 0xbe9e48 0
|
||||
2 12572412 0xbfd6fc 0
|
||||
1 12644063 0xc0eedf 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000014
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514161 0xbef371 0
|
||||
3 12492368 0xbe9e50 0
|
||||
7 12462792 0xbe2ac8 0
|
||||
6 12597688 0xc039b8 0
|
||||
1 12644072 0xc0eee8 0
|
||||
5 12384430 0xbcf8ae 0
|
||||
0 12426091 0xbd9b6b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000021
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426095 0xbd9b6f 0
|
||||
2 12572425 0xbfd709 0
|
||||
4 12514167 0xbef377 0
|
||||
7 12462797 0xbe2acd 0
|
||||
1 12644077 0xc0eeed 0
|
||||
3 12492374 0xbe9e56 0
|
||||
5 12384434 0xbcf8b2 0
|
||||
6 12597693 0xc039bd 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000019
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12572426 0xbfd70a 0
|
||||
4 12514168 0xbef378 0
|
||||
7 12462798 0xbe2ace 0
|
||||
1 12644078 0xc0eeee 0
|
||||
3 12492375 0xbe9e57 0
|
||||
5 12384435 0xbcf8b3 0
|
||||
6 12597694 0xc039be 0
|
||||
0 12426096 0xbd9b70 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000009
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514141 0xbef35d 0
|
||||
7 12462770 0xbe2ab2 0
|
||||
1 12644050 0xc0eed2 0
|
||||
3 12492347 0xbe9e3b 0
|
||||
5 12384408 0xbcf898 0
|
||||
6 12597666 0xc039a2 0
|
||||
0 12426069 0xbd9b55 0
|
||||
2 12572399 0xbfd6ef 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000015
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644053 0xc0eed5 0
|
||||
5 12384413 0xbcf89d 0
|
||||
0 12426078 0xbd9b5e 0
|
||||
2 12572406 0xbfd6f6 0
|
||||
7 12462778 0xbe2aba 0
|
||||
4 12514151 0xbef367 0
|
||||
6 12597678 0xc039ae 0
|
||||
3 12492359 0xbe9e47 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000027
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597668 0xc039a4 0
|
||||
4 12514143 0xbef35f 0
|
||||
2 12572404 0xbfd6f4 0
|
||||
7 12462775 0xbe2ab7 0
|
||||
3 12492352 0xbe9e40 0
|
||||
5 12384414 0xbcf89e 0
|
||||
1 12644059 0xc0eedb 0
|
||||
0 12426080 0xbd9b60 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000024
|
||||
lmm_stripe_count: 7
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514158 0xbef36e 0
|
||||
3 12492364 0xbe9e4c 0
|
||||
6 12597683 0xc039b3 0
|
||||
7 12462787 0xbe2ac3 0
|
||||
5 12384425 0xbcf8a9 0
|
||||
1 12644068 0xc0eee4 0
|
||||
2 12572418 0xbfd702 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597692 0xc039bc 0
|
||||
0 12426094 0xbd9b6e 0
|
||||
2 12572424 0xbfd708 0
|
||||
4 12514166 0xbef376 0
|
||||
7 12462796 0xbe2acc 0
|
||||
1 12644076 0xc0eeec 0
|
||||
3 12492373 0xbe9e55 0
|
||||
5 12384433 0xbcf8b1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000011
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597673 0xc039a9 0
|
||||
3 12492353 0xbe9e41 0
|
||||
4 12514149 0xbef365 0
|
||||
1 12644058 0xc0eeda 0
|
||||
7 12462779 0xbe2abb 0
|
||||
5 12384417 0xbcf8a1 0
|
||||
2 12572407 0xbfd6f7 0
|
||||
0 12426081 0xbd9b61 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:23:34 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:23:34 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576944128000.
|
||||
WARNING: Using actual aggregate bytes moved = 25013657600.
|
||||
write 388.01 39321600 100.00 0.014584 61.47 0.000576 61.48 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576949248000.
|
||||
WARNING: Using actual aggregate bytes moved = 25303552000.
|
||||
write 392.87 39321600 100.00 0.002228 61.42 0.000658 61.42 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576967372800.
|
||||
WARNING: Using actual aggregate bytes moved = 25200332800.
|
||||
write 391.64 39321600 100.00 0.004342 61.36 0.000815 61.36 2
|
||||
|
||||
Max Write: 392.87 MiB/sec (411.95 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 392.87 388.01 390.84 2.06 61.42278 0 64 4 3 0 0 1 0 0 1 40265318400 102400 25013657600 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:26:39 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:26:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:26:46 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 23957913600.
|
||||
read 372.22 39321600 100.00 0.025120 61.36 0.008300 61.38 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 24092364800.
|
||||
read 374.41 39321600 100.00 0.004821 61.36 0.003211 61.37 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 24276992000.
|
||||
read 377.34 39321600 100.00 0.005271 61.35 0.003289 61.36 2
|
||||
|
||||
Max Read: 377.34 MiB/sec (395.67 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 377.34 372.22 374.66 2.10 61.36891 0 64 4 3 0 0 1 0 0 1 40265318400 102400 23957913600 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:29:50 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12570990 0xbfd16e 0
|
||||
4 12512727 0xbeedd7 0
|
||||
7 12461360 0xbe2530 0
|
||||
1 12642638 0xc0e94e 0
|
||||
3 12490936 0xbe98b8 0
|
||||
5 12383000 0xbcf318 0
|
||||
6 12596258 0xc03422 0
|
||||
0 12424650 0xbd95ca 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 09:34:50 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:34:50 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258881216512.
|
||||
WARNING: Using actual aggregate bytes moved = 468432453632.
|
||||
write 3715 34467840 1024.00 0.019695 120.24 0.001310 120.26 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258867585024.
|
||||
WARNING: Using actual aggregate bytes moved = 468409384960.
|
||||
write 3715 34467840 1024.00 0.085990 120.16 0.001138 120.24 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 446452203520.
|
||||
write 3538.39 34467840 1024.00 0.100266 120.23 0.001391 120.33 2
|
||||
|
||||
Max Write: 3715.04 MiB/sec (3895.50 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3715.04 3538.39 3656.04 83.19 120.27771 0 64 4 3 0 0 1 0 0 1 35295068160 1048576 468432453632 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 09:40:56 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 09:41:17 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:41:17 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 187145650176.
|
||||
read 1484.64 34467840 1024.00 0.038724 120.18 0.001130 120.22 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 189027844096.
|
||||
read 1500.18 34467840 1024.00 0.002513 120.16 0.001278 120.17 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 190888017920.
|
||||
read 1514.82 34467840 1024.00 0.003354 120.17 0.001564 120.18 2
|
||||
|
||||
Max Read: 1514.82 MiB/sec (1588.40 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1514.82 1484.64 1499.88 12.32 120.18591 0 64 4 3 0 0 1 0 0 1 35295068160 1048576 187145650176 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 09:47:17 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12422405 0xbd8d05 0
|
||||
2 12568747 0xbfc8ab 0
|
||||
4 12510482 0xbee512 0
|
||||
7 12459112 0xbe1c68 0
|
||||
1 12640385 0xc0e081 0
|
||||
3 12488691 0xbe8ff3 0
|
||||
5 12380754 0xbcea52 0
|
||||
6 12594011 0xc02b5b 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:26:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:26:02 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258884362240.
|
||||
WARNING: Using actual aggregate bytes moved = 383600558080.
|
||||
write 3037.66 34467840 10240 0.018714 120.41 0.001233 120.43 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258800476160.
|
||||
WARNING: Using actual aggregate bytes moved = 373943173120.
|
||||
write 2961.27 34467840 10240 0.069654 120.36 0.001210 120.43 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258643189760.
|
||||
WARNING: Using actual aggregate bytes moved = 371342704640.
|
||||
write 2935.74 34467840 10240 0.101686 120.53 0.001531 120.63 2
|
||||
|
||||
Max Write: 3037.66 MiB/sec (3185.22 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3037.66 2935.74 2978.22 43.30 120.49671 0 64 4 3 0 0 1 0 0 1 35295068160 10485760 383600558080 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 07:32:09 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:32:28 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 35295068160 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:32:28 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 32.87 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 395564810240.
|
||||
read 3136.47 34467840 10240 0.092180 120.19 0.004495 120.28 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 400650403840.
|
||||
read 3178.32 34467840 10240 0.005780 120.21 0.004368 120.22 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 400356802560.
|
||||
read 3174.71 34467840 10240 0.006326 120.26 0.004378 120.27 2
|
||||
|
||||
Max Read: 3178.32 MiB/sec (3332.71 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3178.32 3136.47 3163.17 18.93 120.25298 0 64 4 3 0 0 1 0 0 1 35295068160 10485760 395564810240 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 07:38:29 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12567743 0xbfc4bf 0
|
||||
4 12509471 0xbee11f 0
|
||||
7 12458104 0xbe1878 0
|
||||
1 12639378 0xc0dc92 0
|
||||
3 12487683 0xbe8c03 0
|
||||
5 12379744 0xbce660 0
|
||||
6 12593001 0xc02769 0
|
||||
0 12421396 0xbd8914 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:44:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:44:02 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576974430208.
|
||||
WARNING: Using actual aggregate bytes moved = 4304732160.
|
||||
write 59.84 39321600 16.00 0.025778 68.58 0.000717 68.61 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576943087616.
|
||||
WARNING: Using actual aggregate bytes moved = 4308074496.
|
||||
write 60.06 39321600 16.00 0.002767 68.41 0.000707 68.41 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576961110016.
|
||||
WARNING: Using actual aggregate bytes moved = 4297834496.
|
||||
write 59.83 39321600 16.00 0.002667 68.50 0.000813 68.50 2
|
||||
|
||||
Max Write: 60.06 MiB/sec (62.97 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 60.06 59.83 59.91 0.10 68.50740 0 64 4 3 0 0 1 0 0 1 40265318400 16384 4304732160 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:47:28 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:4#API:MPIIO#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 4 -np 64 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:47:32 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 40265318400 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:47:32 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 64 (4 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 37.50 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4970004480.
|
||||
read 69.39 39321600 16.00 0.017438 68.29 0.004506 68.31 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 4990713856.
|
||||
read 69.68 39321600 16.00 0.005675 68.30 0.004488 68.31 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 5004328960.
|
||||
read 69.87 39321600 16.00 0.006482 68.30 0.004589 68.31 2
|
||||
|
||||
Max Read: 69.87 MiB/sec (73.26 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 69.87 69.39 69.64 0.20 68.30819 0 64 4 3 0 0 1 0 0 1 40265318400 16384 4970004480 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:50:57 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12425668 0xbd99c4 0
|
||||
2 12571999 0xbfd55f 0
|
||||
4 12513736 0xbef1c8 0
|
||||
7 12462370 0xbe2922 0
|
||||
1 12643648 0xc0ed40 0
|
||||
3 12491944 0xbe9ca8 0
|
||||
5 12384005 0xbcf705 0
|
||||
6 12597263 0xc0380f 0
|
||||
|
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:51:27 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:51:27 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576976076800.
|
||||
WARNING: Using actual aggregate bytes moved = 27160780800.
|
||||
write 416.91 26214400 100.00 0.370195 61.77 0.012444 62.13 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576954265600.
|
||||
WARNING: Using actual aggregate bytes moved = 27222323200.
|
||||
write 421.16 26214400 100.00 0.014395 61.64 0.012260 61.64 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576959590400.
|
||||
WARNING: Using actual aggregate bytes moved = 27131596800.
|
||||
write 420.14 26214400 100.00 0.017603 61.58 0.012438 61.59 2
|
||||
|
||||
Max Write: 421.16 MiB/sec (441.62 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 421.16 416.91 419.40 1.81 61.78596 0 96 6 3 0 0 1 0 0 1 26843545600 102400 27160780800 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:54:33 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:54:40 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:54:40 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 29335961600.
|
||||
read 453.35 26214400 100.00 0.349667 61.37 0.007523 61.71 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 29731328000.
|
||||
read 462.07 26214400 100.00 0.010683 61.36 0.007504 61.36 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 30092800000.
|
||||
read 467.75 26214400 100.00 0.010186 61.35 0.007504 61.36 2
|
||||
|
||||
Max Read: 467.75 MiB/sec (490.47 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 467.75 453.35 461.05 5.92 61.47689 0 96 6 3 0 0 1 0 0 1 26843545600 102400 29335961600 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:57:45 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12461695 0xbe267f 0
|
||||
1 12642974 0xc0ea9e 0
|
||||
3 12491271 0xbe9a07 0
|
||||
5 12383330 0xbcf462 0
|
||||
6 12596589 0xc0356d 0
|
||||
0 12424990 0xbd971e 0
|
||||
2 12571325 0xbfd2bd 0
|
||||
4 12513063 0xbeef27 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 09:09:04 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:09:04 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258880167936.
|
||||
WARNING: Using actual aggregate bytes moved = 510574723072.
|
||||
write 4039 22978560 1024.00 0.357625 120.21 0.012212 120.55 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258882265088.
|
||||
WARNING: Using actual aggregate bytes moved = 505900171264.
|
||||
write 4012 22978560 1024.00 0.098760 120.17 0.011034 120.26 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258880167936.
|
||||
WARNING: Using actual aggregate bytes moved = 473096519680.
|
||||
write 3752 22978560 1024.00 0.058560 120.20 0.011193 120.25 2
|
||||
|
||||
Max Write: 4039.02 MiB/sec (4235.22 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4039.02 3752.17 3934.32 129.28 120.35379 0 96 6 3 0 0 1 0 0 1 23530045440 1048576 510574723072 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 09:15:12 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 09:15:33 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 09:15:33 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 215256924160.
|
||||
read 1702.23 22978560 1024.00 0.401618 120.20 0.023086 120.60 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 218279968768.
|
||||
read 1731.78 22978560 1024.00 0.018325 120.19 0.016253 120.20 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 219302330368.
|
||||
read 1739.75 22978560 1024.00 0.019019 120.21 0.016462 120.21 2
|
||||
|
||||
Max Read: 1739.75 MiB/sec (1824.26 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1739.75 1702.23 1724.58 16.14 120.33906 0 96 6 3 0 0 1 0 0 1 23530045440 1048576 215256924160 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 09:21:34 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12640190 0xc0dfbe 0
|
||||
3 12488498 0xbe8f32 0
|
||||
5 12380563 0xbce993 0
|
||||
6 12593819 0xc02a9b 0
|
||||
0 12422211 0xbd8c43 0
|
||||
2 12568557 0xbfc7ed 0
|
||||
4 12510290 0xbee452 0
|
||||
7 12458918 0xbe1ba6 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:00:20 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:00:20 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258863390720.
|
||||
WARNING: Using actual aggregate bytes moved = 428615925760.
|
||||
write 3376.36 22978560 10240 0.359075 120.71 0.013151 121.07 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258748047360.
|
||||
WARNING: Using actual aggregate bytes moved = 427514920960.
|
||||
write 3384.04 22978560 10240 0.031607 120.46 0.012897 120.48 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258842419200.
|
||||
WARNING: Using actual aggregate bytes moved = 426078371840.
|
||||
write 3365.74 22978560 10240 0.129134 120.61 0.013151 120.73 2
|
||||
|
||||
Max Write: 3384.04 MiB/sec (3548.43 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3384.04 3365.74 3375.38 7.51 120.75791 0 96 6 3 0 0 1 0 0 1 23530045440 10485760 428615925760 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 07:06:30 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 07:06:50 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 23530045440 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 07:06:50 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 21.91 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 414533550080.
|
||||
read 3273.29 22978560 10240 0.409388 120.38 0.014809 120.77 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 417626849280.
|
||||
read 3308.40 22978560 10240 0.017003 120.37 0.015016 120.38 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 422639042560.
|
||||
read 3346.21 22978560 10240 0.017556 120.44 0.015250 120.45 2
|
||||
|
||||
Max Read: 3346.21 MiB/sec (3508.75 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3346.21 3273.29 3309.30 29.77 120.53718 0 96 6 3 0 0 1 0 0 1 23530045440 10485760 414533550080 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 07:12:52 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12379549 0xbce59d 0
|
||||
6 12592809 0xc026a9 0
|
||||
0 12421203 0xbd8853 0
|
||||
2 12567552 0xbfc400 0
|
||||
4 12509278 0xbee05e 0
|
||||
7 12457915 0xbe17bb 0
|
||||
1 12639187 0xc0dbd3 0
|
||||
3 12487491 0xbe8b43 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 22:18:00 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:18:00 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576969908224.
|
||||
WARNING: Using actual aggregate bytes moved = 4593238016.
|
||||
write 63.61 26214400 16.00 0.351773 68.52 0.001044 68.87 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576939417600.
|
||||
WARNING: Using actual aggregate bytes moved = 4604821504.
|
||||
write 64.13 26214400 16.00 0.003141 68.47 0.001192 68.48 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576956604416.
|
||||
WARNING: Using actual aggregate bytes moved = 4598972416.
|
||||
write 64.02 26214400 16.00 0.003272 68.51 0.001262 68.51 2
|
||||
|
||||
Max Write: 64.13 MiB/sec (67.25 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 64.13 63.61 63.92 0.23 68.61903 0 96 6 3 0 0 1 0 0 1 26843545600 16384 4593238016 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:21:26 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:6#API:MPIIO#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 6 -np 96 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 22:21:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 26843545600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 22:21:31 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 96 (6 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 25 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6348816384.
|
||||
read 88.22 26214400 16.00 0.358973 68.28 0.014673 68.63 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6376144896.
|
||||
read 89.06 26214400 16.00 0.017285 68.27 0.014640 68.28 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 6384926720.
|
||||
read 89.18 26214400 16.00 0.017508 68.27 0.014639 68.28 2
|
||||
|
||||
Max Read: 89.18 MiB/sec (93.51 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 89.18 88.22 88.82 0.42 68.39482 0 96 6 3 0 0 1 0 0 1 26843545600 16384 6348816384 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 22:24:56 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12384341 0xbcf855 0
|
||||
6 12597602 0xc03962 0
|
||||
0 12426004 0xbd9b14 0
|
||||
2 12572333 0xbfd6ad 0
|
||||
4 12514076 0xbef31c 0
|
||||
7 12462706 0xbe2a72 0
|
||||
1 12643984 0xc0ee90 0
|
||||
3 12492282 0xbe9dfa 0
|
||||
|
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:07:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:07:46 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576975052800.
|
||||
WARNING: Using actual aggregate bytes moved = 27621580800.
|
||||
write 422.91 19660800 100.00 0.500381 61.79 0.000697 62.29 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576963379200.
|
||||
WARNING: Using actual aggregate bytes moved = 28443443200.
|
||||
write 440.21 19660800 100.00 0.003456 61.62 0.000779 61.62 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576969932800.
|
||||
WARNING: Using actual aggregate bytes moved = 27850752000.
|
||||
write 432.11 19660800 100.00 0.004572 61.46 0.000876 61.47 2
|
||||
|
||||
Max Write: 440.21 MiB/sec (461.59 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 440.21 422.91 431.74 7.07 61.79198 0 128 8 3 0 0 1 0 0 1 20132659200 102400 27621580800 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:10:53 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:102400.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 20:11:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 20:11:03 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 33230336000.
|
||||
read 512.19 19660800 100.00 0.513790 61.36 0.002868 61.87 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 33932390400.
|
||||
read 527.39 19660800 100.00 0.005589 61.36 0.002923 61.36 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 34252902400.
|
||||
read 532.33 19660800 100.00 0.006677 61.36 0.004403 61.36 2
|
||||
|
||||
Max Read: 532.33 MiB/sec (558.19 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 532.33 512.19 523.97 8.57 61.53242 0 128 8 3 0 0 1 0 0 1 20132659200 102400 33230336000 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 20:14:07 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12596066 0xc03362 0
|
||||
0 12424459 0xbd950b 0
|
||||
2 12570798 0xbfd0ae 0
|
||||
4 12512537 0xbeed19 0
|
||||
7 12461168 0xbe2470 0
|
||||
1 12642446 0xc0e88e 0
|
||||
3 12490743 0xbe97f7 0
|
||||
5 12382810 0xbcf25a 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 08:43:13 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:43:13 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258880167936.
|
||||
WARNING: Using actual aggregate bytes moved = 533859401728.
|
||||
write 4218 17233920 1024.00 0.502268 120.20 0.002527 120.70 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258882265088.
|
||||
WARNING: Using actual aggregate bytes moved = 532963917824.
|
||||
write 4225 17233920 1024.00 0.091345 120.21 0.000960 120.30 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258877022208.
|
||||
WARNING: Using actual aggregate bytes moved = 529912561664.
|
||||
write 4204 17233920 1024.00 0.011866 120.21 0.001168 120.22 2
|
||||
|
||||
Max Write: 4225.05 MiB/sec (4430.29 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4225.05 4203.61 4215.56 8.92 120.40826 0 128 8 3 0 0 1 0 0 1 17647534080 1048576 533859401728 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 08:49:20 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:1048576.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 08:49:44 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 08:49:44 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 234833838080.
|
||||
read 1854.44 17233920 1024.00 0.572369 120.20 0.006264 120.77 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 237358809088.
|
||||
read 1882.75 17233920 1024.00 0.009623 120.22 0.006211 120.23 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 238922235904.
|
||||
read 1895.51 17233920 1024.00 0.009305 120.20 0.006212 120.21 2
|
||||
|
||||
Max Read: 1895.51 MiB/sec (1987.58 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1895.51 1854.44 1877.57 17.16 120.40146 0 128 8 3 0 0 1 0 0 1 17647534080 1048576 234833838080 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 08:55:45 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12593532 0xc0297c 0
|
||||
0 12421922 0xbd8b22 0
|
||||
2 12568270 0xbfc6ce 0
|
||||
4 12510003 0xbee333 0
|
||||
7 12458631 0xbe1a87 0
|
||||
1 12639904 0xc0dea0 0
|
||||
3 12488208 0xbe8e10 0
|
||||
5 12380274 0xbce872 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 06:34:35 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 06:34:35 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258873876480.
|
||||
WARNING: Using actual aggregate bytes moved = 477144023040.
|
||||
write 3760 17233920 10240 0.499358 120.52 0.000764 121.02 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258842419200.
|
||||
WARNING: Using actual aggregate bytes moved = 475445329920.
|
||||
write 3760 17233920 10240 0.030122 120.55 0.000970 120.59 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 2258831933440.
|
||||
WARNING: Using actual aggregate bytes moved = 470904995840.
|
||||
write 3718 17233920 10240 0.114969 120.66 0.001218 120.77 2
|
||||
|
||||
Max Write: 3760.16 MiB/sec (3942.81 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 3760.16 3718.40 3746.17 19.64 120.79439 0 128 8 3 0 0 1 0 0 1 17647534080 10485760 477144023040 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 06:40:44 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c01,isc17-c02,isc17-c03,isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 06:41:08 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 17647534080 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c01
|
||||
|
||||
Test 0 started: Tue Oct 23 06:41:08 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 16.44 GiB
|
||||
aggregate filesize = 2103.75 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 419566714880.
|
||||
read 3307.83 17233920 10240 0.562957 120.40 0.004821 120.96 0
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 423268188160.
|
||||
read 3349.56 17233920 10240 0.010286 120.50 0.004934 120.51 1
|
||||
WARNING: Expected aggregate file size = 2258884362240.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 424683765760.
|
||||
read 3361.33 17233920 10240 0.008095 120.49 0.004823 120.49 2
|
||||
|
||||
Max Read: 3361.33 MiB/sec (3524.62 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3361.33 3307.83 3339.57 22.95 120.65556 0 128 8 3 0 0 1 0 0 1 17647534080 10485760 419566714880 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 06:47:10 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420917 0xbd8735 0
|
||||
2 12567264 0xbfc2e0 0
|
||||
4 12508987 0xbedf3b 0
|
||||
7 12457629 0xbe169d 0
|
||||
1 12638900 0xc0dab4 0
|
||||
3 12487205 0xbe8a25 0
|
||||
5 12379265 0xbce481 0
|
||||
6 12592522 0xc0258a 0
|
||||
|
|
@ -1,110 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:25:04 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:25:04 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576979804160.
|
||||
WARNING: Using actual aggregate bytes moved = 4941348864.
|
||||
write 68.08 19660800 16.00 0.553325 68.66 0.000669 69.22 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576976101376.
|
||||
WARNING: Using actual aggregate bytes moved = 4916150272.
|
||||
write 68.46 19660800 16.00 0.002607 68.48 0.000758 68.49 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 2576980328448.
|
||||
WARNING: Using actual aggregate bytes moved = 4860739584.
|
||||
write 67.77 19660800 16.00 0.003006 68.40 0.000871 68.40 2
|
||||
|
||||
Max Write: 68.46 MiB/sec (71.78 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 68.46 67.77 68.10 0.28 68.70114 0 128 8 3 0 0 1 0 0 1 20132659200 16384 4941348864 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:28:31 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:16#PPN:8#API:MPIIO#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 8 -np 128 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05,isc17-c06,isc17-c07,isc17-c08,isc17-c09,isc17-c11,isc17-c12,isc17-c13,isc17-c14,isc17-c15,isc17-c18,isc17-c22,isc17-c01,isc17-c02,isc17-c03 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Tue Oct 23 21:28:38 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 20132659200 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Tue Oct 23 21:28:38 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 128 (8 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 18.75 GiB
|
||||
aggregate filesize = 2400 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 7226949632.
|
||||
read 100.26 19660800 16.00 0.499991 68.24 0.001031 68.75 0
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 7283228672.
|
||||
read 101.78 19660800 16.00 0.004498 68.24 0.001824 68.24 1
|
||||
WARNING: Expected aggregate file size = 2576980377600.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 7291551744.
|
||||
read 101.86 19660800 16.00 0.004573 68.26 0.001081 68.27 2
|
||||
|
||||
Max Read: 101.86 MiB/sec (106.81 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 101.86 100.26 101.30 0.74 68.41744 0 128 8 3 0 0 1 0 0 1 20132659200 16384 7226949632 MPIIO 0
|
||||
|
||||
Finished: Tue Oct 23 21:32:03 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 32 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 8
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12597072 0xc03750 0
|
||||
0 12425474 0xbd9902 0
|
||||
2 12571809 0xbfd4a1 0
|
||||
4 12513543 0xbef107 0
|
||||
7 12462179 0xbe2863 0
|
||||
1 12643456 0xc0ec80 0
|
||||
3 12491753 0xbe9be9 0
|
||||
5 12383813 0xbcf645 0
|
||||
|
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
File diff suppressed because it is too large
Load Diff
|
@ -1,106 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 02:27:32 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:27:32 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322120192000.
|
||||
WARNING: Using actual aggregate bytes moved = 9152307200.
|
||||
write 144.74 157286400 100.00 0.006224 60.30 0.000231 60.30 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322102067200.
|
||||
WARNING: Using actual aggregate bytes moved = 8739942400.
|
||||
write 138.30 157286400 100.00 0.007606 60.26 0.000292 60.27 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322116096000.
|
||||
WARNING: Using actual aggregate bytes moved = 8823091200.
|
||||
write 139.60 157286400 100.00 0.008529 60.27 0.000236 60.28 2
|
||||
|
||||
Max Write: 144.74 MiB/sec (151.77 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 144.74 138.30 140.88 2.78 60.28332 0 2 1 3 0 0 1 0 0 1 161061273600 102400 9152307200 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 02:30:34 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 02:30:37 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:30:37 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1769369600.
|
||||
read 28.01 157286400 100.00 0.008440 60.24 0.000252 60.25 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1797017600.
|
||||
read 28.45 157286400 100.00 0.000544 60.24 0.000175 60.24 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1825484800.
|
||||
read 28.90 157286400 100.00 0.000529 60.23 0.000203 60.23 2
|
||||
|
||||
Max Read: 28.90 MiB/sec (30.31 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 28.90 28.01 28.45 0.37 60.23937 0 2 1 3 0 0 1 0 0 1 161061273600 102400 1769369600 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 02:33:38 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12426702 0xbd9dce 0
|
||||
2 12573040 0xbfd970 0
|
||||
4 12514776 0xbef5d8 0
|
||||
7 12463398 0xbe2d26 0
|
||||
|
|
@ -1,106 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 18:22:46 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:22:46 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359496704.
|
||||
WARNING: Using actual aggregate bytes moved = 119425466368.
|
||||
write 948.78 137871360 1024.00 0.007311 120.03 0.000520 120.04 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282353205248.
|
||||
WARNING: Using actual aggregate bytes moved = 120648105984.
|
||||
write 958.42 137871360 1024.00 0.025000 120.03 0.000570 120.05 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 122607894528.
|
||||
write 971.42 137871360 1024.00 0.326400 120.04 0.000613 120.37 2
|
||||
|
||||
Max Write: 971.42 MiB/sec (1018.60 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 971.42 948.78 959.54 9.27 120.15358 0 2 1 3 0 0 1 0 0 1 141180272640 1048576 119425466368 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 18:28:56 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 18:29:09 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 18:29:09 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 23301455872.
|
||||
read 185.04 137871360 1024.00 0.070422 120.02 0.000262 120.09 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 25202524160.
|
||||
read 200.25 137871360 1024.00 0.000549 120.03 0.000204 120.03 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 26649559040.
|
||||
read 211.75 137871360 1024.00 0.000529 120.03 0.000243 120.03 2
|
||||
|
||||
Max Read: 211.75 MiB/sec (222.03 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 211.75 185.04 199.01 10.94 120.04947 0 2 1 3 0 0 1 0 0 1 141180272640 1048576 23301455872 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 18:35:10 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591746 0xc02282 0
|
||||
0 12420132 0xbd8424 0
|
||||
2 12566486 0xbfbfd6 0
|
||||
4 12508204 0xbedc2c 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:05:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:05:36 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 149820538880.
|
||||
write 1190.06 137871360 10240 0.007690 120.05 0.000252 120.06 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282350059520.
|
||||
WARNING: Using actual aggregate bytes moved = 152997724160.
|
||||
write 1212.42 137871360 10240 0.070823 120.27 0.000265 120.35 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282350059520.
|
||||
WARNING: Using actual aggregate bytes moved = 154434273280.
|
||||
write 1225.85 137871360 10240 0.129793 120.02 0.000303 120.15 2
|
||||
|
||||
Max Write: 1225.85 MiB/sec (1285.39 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1225.85 1190.06 1209.44 14.76 120.18436 0 2 1 3 0 0 1 0 0 1 141180272640 10485760 149820538880 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:11:43 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 15:11:53 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 15:11:53 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 77332480000.
|
||||
read 614.37 137871360 10240 0.025947 120.01 0.000270 120.04 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 85186314240.
|
||||
read 676.83 137871360 10240 0.000551 120.03 0.000237 120.03 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 84536197120.
|
||||
read 671.71 137871360 10240 0.000564 120.02 0.000271 120.02 2
|
||||
|
||||
Max Read: 676.83 MiB/sec (709.71 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 676.83 614.37 654.30 28.31 120.03113 0 2 1 3 0 0 1 0 0 1 141180272640 10485760 77332480000 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 15:17:53 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,106 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 20:29:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:29:36 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360414208.
|
||||
WARNING: Using actual aggregate bytes moved = 2798125056.
|
||||
write 21.95 137871360 16.00 0.009253 121.57 0.000321 121.58 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282355695616.
|
||||
WARNING: Using actual aggregate bytes moved = 2741010432.
|
||||
write 21.48 137871360 16.00 0.009212 121.67 0.000328 121.68 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359889920.
|
||||
WARNING: Using actual aggregate bytes moved = 2737668096.
|
||||
write 21.46 137871360 16.00 0.001321 121.66 0.000360 121.66 2
|
||||
|
||||
Max Write: 21.95 MiB/sec (23.01 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 21.95 21.46 21.63 0.22 121.64240 0 2 1 3 0 0 1 0 0 1 141180272640 16384 2798125056 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 20:35:42 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 20:35:45 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:35:45 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 704462848.
|
||||
read 5.53 137871360 16.00 0.007929 121.49 0.000261 121.50 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 704069632.
|
||||
read 5.53 137871360 16.00 0.000607 121.49 0.000283 121.49 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 708395008.
|
||||
read 5.56 137871360 16.00 0.000590 121.50 0.000329 121.50 2
|
||||
|
||||
Max Read: 5.56 MiB/sec (5.83 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 5.56 5.53 5.54 0.02 121.49728 0 2 1 3 0 0 1 0 0 1 141180272640 16384 704462848 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 20:41:50 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456923 0xbe13db 0
|
||||
1 12638199 0xc0d7f7 0
|
||||
3 12486510 0xbe876e 0
|
||||
5 12378565 0xbce1c5 0
|
||||
|
|
@ -1,116 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 02:21:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:21:03 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 55821209600.
|
||||
write 847.99 157286400 100.00 0.000261 62.78 0.000140 62.78 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322121932800.
|
||||
WARNING: Using actual aggregate bytes moved = 55736627200.
|
||||
write 838.00 157286400 100.00 0.000501 63.43 0.000133 63.43 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322120499200.
|
||||
WARNING: Using actual aggregate bytes moved = 55724441600.
|
||||
write 858.35 157286400 100.00 0.000525 61.91 0.000169 61.91 2
|
||||
|
||||
Max Write: 858.35 MiB/sec (900.05 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 858.35 838.00 848.11 8.31 62.70713 0 2 1 3 1 0 1 0 0 1 161061273600 102400 55821209600 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 02:24:18 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 02:24:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 161061273600 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:24:31 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 150 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 948531200.
|
||||
read 15.06 157286400 100.00 0.000357 60.06 0.000114 60.07 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 968192000.
|
||||
read 15.37 157286400 100.00 0.000138 60.07 0.000134 60.07 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 981913600.
|
||||
read 15.59 157286400 100.00 0.000160 60.05 0.000147 60.05 2
|
||||
|
||||
Max Read: 15.59 MiB/sec (16.35 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 15.59 15.06 15.34 0.22 60.06217 0 2 1 3 1 0 1 0 0 1 161061273600 102400 948531200 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 02:27:32 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12514774 0xbef5d6 0
|
||||
7 12463396 0xbe2d24 0
|
||||
1 12644682 0xc0f14a 0
|
||||
3 12492977 0xbea0b1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12385042 0xbcfb12 0
|
||||
6 12598295 0xc03c17 0
|
||||
0 12426700 0xbd9dcc 0
|
||||
2 12573038 0xbfd96e 0
|
||||
|
|
@ -1,107 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 17:47:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:47:03 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2262.78 137871360 1024.00 0.000279 119.00 0.000216 119.00 0
|
||||
write 2246.14 137871360 1024.00 0.000533 119.89 0.000266 119.89 1
|
||||
write 2499.40 137871360 1024.00 0.000584 107.74 0.000315 107.74 2
|
||||
|
||||
Max Write: 2499.40 MiB/sec (2620.81 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2499.40 2246.14 2336.11 115.67 115.54262 0 2 1 3 1 0 1 0 0 1 141180272640 1048576 282360545280 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 17:52:53 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 17:53:07 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:53:07 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 22900899840.
|
||||
read 181.98 137871360 1024.00 0.000339 120.02 0.000196 120.02 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 24943525888.
|
||||
read 198.22 137871360 1024.00 0.000202 120.01 0.000211 120.01 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 27156021248.
|
||||
read 215.79 137871360 1024.00 0.000230 120.01 0.000155 120.01 2
|
||||
|
||||
Max Read: 215.79 MiB/sec (226.28 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 215.79 181.98 198.66 13.81 120.01256 0 2 1 3 1 0 1 0 0 1 141180272640 1048576 22900899840 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 17:59:07 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638086 0xc0d786 0
|
||||
3 12486398 0xbe86fe 0
|
||||
6 12591714 0xc02262 0
|
||||
0 12420099 0xbd8403 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378451 0xbce153 0
|
||||
2 12566454 0xbfbfb6 0
|
||||
4 12508171 0xbedc0b 0
|
||||
7 12456813 0xbe136d 0
|
||||
|
|
@ -1,107 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 14:53:32 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:53:32 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 2266.90 137871360 10240 0.000271 118.79 0.000149 118.79 0
|
||||
write 2342.65 137871360 10240 0.000498 114.95 0.000209 114.95 1
|
||||
write 2359.74 137871360 10240 0.004486 114.11 0.000253 114.11 2
|
||||
|
||||
Max Write: 2359.74 MiB/sec (2474.37 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 2359.74 2266.90 2323.10 40.34 115.94953 0 2 1 3 1 0 1 0 0 1 141180272640 10485760 282360545280 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 14:59:22 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 14:59:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:59:36 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 77112279040.
|
||||
read 612.68 137871360 10240 0.000358 120.03 0.000158 120.03 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 93742694400.
|
||||
read 744.86 137871360 10240 0.000160 120.02 0.000147 120.02 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 100998840320.
|
||||
read 802.42 137871360 10240 0.000178 120.04 0.000249 120.04 2
|
||||
|
||||
Max Read: 802.42 MiB/sec (841.39 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 802.42 612.68 719.98 79.43 120.03040 0 2 1 3 1 0 1 0 0 1 141180272640 10485760 77112279040 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 15:05:36 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12637992 0xc0d728 0
|
||||
5 12378358 0xbce0f6 0
|
||||
6 12591621 0xc02205 0
|
||||
2 12566365 0xbfbf5d 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486304 0xbe86a0 0
|
||||
0 12420008 0xbd83a8 0
|
||||
4 12508078 0xbedbae 0
|
||||
7 12456720 0xbe1310 0
|
||||
|
|
@ -1,116 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:16:40 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:16:40 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359955456.
|
||||
WARNING: Using actual aggregate bytes moved = 17441718272.
|
||||
write 124.23 137871360 16.00 0.000268 133.89 0.000239 133.89 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359463936.
|
||||
WARNING: Using actual aggregate bytes moved = 16293085184.
|
||||
write 116.15 137871360 16.00 0.000562 133.78 0.000250 133.78 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359857152.
|
||||
WARNING: Using actual aggregate bytes moved = 16879484928.
|
||||
write 121.19 137871360 16.00 0.000577 132.83 0.000345 132.83 2
|
||||
|
||||
Max Write: 124.23 MiB/sec (130.27 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 124.23 116.15 120.52 3.33 133.50174 0 2 1 3 1 0 1 0 0 1 141180272640 16384 17441718272 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:23:26 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:1#API:POSIX#T:16384.txt
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 1 -np 2 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 20:23:34 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 141180272640 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:23:34 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 2 (1 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 131.48 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 390316032.
|
||||
read 3.09 137871360 16.00 0.000343 120.53 0.000186 120.53 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 395870208.
|
||||
read 3.13 137871360 16.00 0.000177 120.52 0.000243 120.52 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 402276352.
|
||||
read 3.18 137871360 16.00 0.000261 120.54 0.000321 120.54 2
|
||||
|
||||
Max Read: 3.18 MiB/sec (3.34 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 3.18 3.09 3.13 0.04 120.52884 0 2 1 3 1 0 1 0 0 1 141180272640 16384 390316032 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:29:35 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638197 0xc0d7f5 0
|
||||
3 12486508 0xbe876c 0
|
||||
5 12378563 0xbce1c3 0
|
||||
6 12591826 0xc022d2 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591825 0xc022d1 0
|
||||
0 12420211 0xbd8473 0
|
||||
2 12566565 0xbfc025 0
|
||||
4 12508282 0xbedc7a 0
|
||||
|
|
@ -1,106 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 02:53:13 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:53:13 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322105958400.
|
||||
WARNING: Using actual aggregate bytes moved = 10540441600.
|
||||
write 166.85 78643200 100.00 0.007447 60.24 0.000342 60.25 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322109440000.
|
||||
WARNING: Using actual aggregate bytes moved = 10210406400.
|
||||
write 161.52 78643200 100.00 0.001175 60.29 0.000247 60.29 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322110464000.
|
||||
WARNING: Using actual aggregate bytes moved = 10192896000.
|
||||
write 161.39 78643200 100.00 0.001328 60.23 0.000345 60.23 2
|
||||
|
||||
Max Write: 166.85 MiB/sec (174.95 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 166.85 161.39 163.25 2.54 60.25571 0 4 2 3 0 0 1 0 0 1 80530636800 102400 10540441600 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 02:56:15 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Wed Oct 24 02:56:22 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:56:22 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3588812800.
|
||||
read 56.84 78643200 100.00 0.009064 60.20 0.000314 60.21 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3636019200.
|
||||
read 57.56 78643200 100.00 0.000675 60.24 0.000270 60.25 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 3678412800.
|
||||
read 58.27 78643200 100.00 0.000650 60.20 0.000324 60.20 2
|
||||
|
||||
Max Read: 58.27 MiB/sec (61.11 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 58.27 56.84 57.56 0.58 60.21749 0 4 2 3 0 0 1 0 0 1 80530636800 102400 3588812800 MPIIO 0
|
||||
|
||||
Finished: Wed Oct 24 02:59:23 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12598325 0xc03c35 0
|
||||
0 12426729 0xbd9de9 0
|
||||
2 12573066 0xbfd98a 0
|
||||
4 12514803 0xbef5f3 0
|
||||
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 17:34:37 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:34:37 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282357399552.
|
||||
WARNING: Using actual aggregate bytes moved = 175187689472.
|
||||
write 1391.58 68935680 1024.00 0.005495 120.05 0.004209 120.06 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282358448128.
|
||||
WARNING: Using actual aggregate bytes moved = 169144745984.
|
||||
write 1301.49 68935680 1024.00 3.57 120.38 0.000428 123.94 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282358448128.
|
||||
WARNING: Using actual aggregate bytes moved = 172859850752.
|
||||
write 1368.17 68935680 1024.00 0.034479 120.46 0.000311 120.49 2
|
||||
|
||||
Max Write: 1391.58 MiB/sec (1459.18 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1391.58 1301.49 1353.75 38.17 121.49714 0 4 2 3 0 0 1 0 0 1 70590136320 1048576 175187689472 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 17:40:52 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 17:41:02 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:41:02 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 46654291968.
|
||||
read 370.61 68935680 1024.00 0.023597 120.03 0.003315 120.05 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 52016709632.
|
||||
read 413.26 68935680 1024.00 0.003650 120.04 0.003352 120.04 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 52050264064.
|
||||
read 413.54 68935680 1024.00 0.003719 120.03 0.003386 120.03 2
|
||||
|
||||
Max Read: 413.54 MiB/sec (433.63 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 413.54 370.61 399.14 20.17 120.04148 0 4 2 3 0 0 1 0 0 1 70590136320 1048576 46654291968 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 17:47:02 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,94 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 14:41:05 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:41:05 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 212420526080.
|
||||
write 1687.31 68935680 10240 0.005091 120.06 0.000416 120.06 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 210606489600.
|
||||
write 1672.78 68935680 10240 0.001893 120.07 0.000443 120.07 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360545280.
|
||||
WARNING: Using actual aggregate bytes moved = 226062499840.
|
||||
write 1704.50 68935680 10240 6.34 120.15 0.000427 126.48 2
|
||||
|
||||
Max Write: 1704.50 MiB/sec (1787.29 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 1704.50 1672.78 1688.20 12.96 122.20440 0 4 2 3 0 0 1 0 0 1 70590136320 10485760 212420526080 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 14:47:19 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 14:47:31 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:47:31 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 131690659840.
|
||||
read 1045.78 68935680 10240 0.040245 120.05 0.006561 120.09 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 141526302720.
|
||||
read 1124.38 68935680 10240 0.001111 120.04 0.000776 120.04 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 142281277440.
|
||||
read 1130.40 68935680 10240 0.001146 120.04 0.000837 120.04 2
|
||||
|
||||
Max Read: 1130.40 MiB/sec (1185.32 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1130.40 1045.78 1100.19 38.55 120.05642 0 4 2 3 0 0 1 0 0 1 70590136320 10485760 131690659840 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 14:53:31 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
|
@ -1,106 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 20:04:23 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:04:23 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360512512.
|
||||
WARNING: Using actual aggregate bytes moved = 3078602752.
|
||||
write 24.22 68935680 16.00 0.011510 121.22 0.000340 121.23 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360053760.
|
||||
WARNING: Using actual aggregate bytes moved = 3053191168.
|
||||
write 24.01 68935680 16.00 0.015544 121.27 0.000340 121.28 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282358824960.
|
||||
WARNING: Using actual aggregate bytes moved = 3070181376.
|
||||
write 24.16 68935680 16.00 0.001289 121.18 0.000369 121.18 2
|
||||
|
||||
Max Write: 24.22 MiB/sec (25.39 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 24.22 24.01 24.13 0.09 121.23130 0 4 2 3 0 0 1 0 0 1 70590136320 16384 3078602752 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 20:10:28 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:MPIIO#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
ior WARNING: fsync() only available in POSIX. Using value of 0.
|
||||
Began: Mon Oct 22 20:10:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a MPIIO -e -g -z -k -o /esfs/jtacquaviva/file_read -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 20:10:36 2018
|
||||
Summary:
|
||||
api = MPIIO (version=3, subversion=0)
|
||||
test filename = /esfs/jtacquaviva/file_read
|
||||
access = single-shared-file
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1398800384.
|
||||
read 11.01 68935680 16.00 0.008116 121.15 0.001167 121.16 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1406582784.
|
||||
read 11.07 68935680 16.00 0.001568 121.14 0.001220 121.15 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 4517768724480.
|
||||
WARNING: Using actual aggregate bytes moved = 1412562944.
|
||||
read 11.12 68935680 16.00 0.001541 121.14 0.001105 121.15 2
|
||||
|
||||
Max Read: 11.12 MiB/sec (11.66 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 11.12 11.01 11.07 0.04 121.14940 0 4 2 3 0 0 1 0 0 1 70590136320 16384 1398800384 MPIIO 0
|
||||
|
||||
Finished: Mon Oct 22 20:16:39 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591822 0xc022ce 0
|
||||
0 12420209 0xbd8471 0
|
||||
2 12566562 0xbfc022 0
|
||||
4 12508279 0xbedc77 0
|
||||
|
|
@ -1,140 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 02:46:35 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:46:35 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322112102400.
|
||||
WARNING: Using actual aggregate bytes moved = 54546124800.
|
||||
write 762.68 78643200 100.00 0.000504 68.20 0.000188 68.21 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322119065600.
|
||||
WARNING: Using actual aggregate bytes moved = 54886092800.
|
||||
write 772.96 78643200 100.00 0.003134 67.71 0.000180 67.72 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 322122547200.
|
||||
WARNING: Using actual aggregate bytes moved = 53985075200.
|
||||
write 765.28 78643200 100.00 0.012096 67.26 0.000198 67.28 2
|
||||
|
||||
Max Write: 772.96 MiB/sec (810.51 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 772.96 762.68 766.97 4.36 67.73304 0 4 2 3 1 0 1 0 0 1 80530636800 102400 54546124800 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 02:50:03 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:102400.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Wed Oct 24 02:50:11 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 102400 -b 80530636800 -D 60 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Wed Oct 24 02:50:11 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 102400 bytes
|
||||
blocksize = 75 GiB
|
||||
aggregate filesize = 300 GiB
|
||||
Using stonewalling = 60 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2212761600.
|
||||
read 35.15 78643200 100.00 0.002042 60.03 0.001796 60.03 0
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2382848000.
|
||||
read 37.85 78643200 100.00 0.001738 60.04 0.001798 60.04 1
|
||||
WARNING: Expected aggregate file size = 322122547200.
|
||||
WARNING: Stat() of aggregate file size = 644245094400.
|
||||
WARNING: Using actual aggregate bytes moved = 2385408000.
|
||||
read 37.89 78643200 100.00 0.001828 60.04 0.001813 60.04 2
|
||||
|
||||
Max Read: 37.89 MiB/sec (39.73 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 37.89 35.15 36.96 1.28 60.03886 0 4 2 3 1 0 1 0 0 1 80530636800 102400 2212761600 POSIX 0
|
||||
|
||||
Finished: Wed Oct 24 02:53:12 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12644708 0xc0f164 0
|
||||
3 12493005 0xbea0cd 0
|
||||
5 12385070 0xbcfb2e 0
|
||||
6 12598323 0xc03c33 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12493004 0xbea0cc 0
|
||||
0 12426727 0xbd9de7 0
|
||||
2 12573063 0xbfd987 0
|
||||
4 12514801 0xbef5f1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12463423 0xbe2d3f 0
|
||||
1 12644707 0xc0f163 0
|
||||
5 12385069 0xbcfb2d 0
|
||||
6 12598322 0xc03c32 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12573064 0xbfd988 0
|
||||
4 12514802 0xbef5f2 0
|
||||
7 12463424 0xbe2d40 0
|
||||
1 12644709 0xc0f165 0
|
||||
|
|
@ -1,131 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 17:25:27 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:25:27 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 4302 68935680 1024.00 0.000494 62.59 0.000432 62.59 0
|
||||
write 4741 68935680 1024.00 0.000774 56.80 0.000274 56.80 1
|
||||
write 4993 68935680 1024.00 0.004668 53.93 0.000318 53.93 2
|
||||
|
||||
Max Write: 4993.02 MiB/sec (5235.56 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4993.02 4302.03 4678.59 285.49 57.77553 0 4 2 3 1 0 1 0 0 1 70590136320 1048576 282360545280 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 17:28:27 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:1048576.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 17:28:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 1048576 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 17:28:36 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 1 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 49512710144.
|
||||
read 393.47 68935680 1024.00 0.000462 120.01 0.000294 120.01 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 59200503808.
|
||||
read 470.43 68935680 1024.00 0.000255 120.01 0.000351 120.01 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 67574431744.
|
||||
read 536.99 68935680 1024.00 0.000372 120.01 0.000400 120.01 2
|
||||
|
||||
Max Read: 536.99 MiB/sec (563.08 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 536.99 393.47 466.96 58.65 120.00982 0 4 2 3 1 0 1 0 0 1 70590136320 1048576 49512710144 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 17:34:36 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 3
|
||||
obdidx objid objid group
|
||||
3 12486392 0xbe86f8 0
|
||||
5 12378445 0xbce14d 0
|
||||
6 12591708 0xc0225c 0
|
||||
0 12420093 0xbd83fd 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508166 0xbedc06 0
|
||||
7 12456809 0xbe1369 0
|
||||
1 12638081 0xc0d781 0
|
||||
3 12486393 0xbe86f9 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566449 0xbfbfb1 0
|
||||
4 12508165 0xbedc05 0
|
||||
7 12456808 0xbe1368 0
|
||||
1 12638080 0xc0d780 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 5
|
||||
obdidx objid objid group
|
||||
5 12378446 0xbce14e 0
|
||||
6 12591709 0xc0225d 0
|
||||
0 12420094 0xbd83fe 0
|
||||
2 12566450 0xbfbfb2 0
|
||||
|
|
@ -1,131 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 14:31:36 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:31:36 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
write 3686 68935680 10240 0.000504 73.05 0.000227 73.05 0
|
||||
write 4218 68935680 10240 0.000693 63.84 0.000272 63.85 1
|
||||
write 4645 68935680 10240 0.000883 57.97 0.000315 57.97 2
|
||||
|
||||
Max Write: 4645.07 MiB/sec (4870.71 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 4645.07 3686.15 4182.97 392.25 64.95608 0 4 2 3 1 0 1 0 0 1 70590136320 10485760 282360545280 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 14:34:55 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:10485760.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 14:35:03 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 10485760 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 14:35:03 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 10 MiB
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 150753771520.
|
||||
read 1197.72 68935680 10240 0.000449 120.04 0.000160 120.04 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 181990850560.
|
||||
read 1445.83 68935680 10240 0.000156 120.04 0.000418 120.04 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 187149844480.
|
||||
read 1486.93 68935680 10240 0.000427 120.03 0.000426 120.03 2
|
||||
|
||||
Max Read: 1486.93 MiB/sec (1559.16 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 1486.93 1197.72 1376.83 127.75 120.03683 0 4 2 3 1 0 1 0 0 1 70590136320 10485760 150753771520 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 14:41:03 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508072 0xbedba8 0
|
||||
1 12637986 0xc0d722 0
|
||||
6 12591615 0xc021ff 0
|
||||
0 12420003 0xbd83a3 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 2
|
||||
obdidx objid objid group
|
||||
2 12566359 0xbfbf57 0
|
||||
7 12456714 0xbe130a 0
|
||||
3 12486298 0xbe869a 0
|
||||
5 12378353 0xbce0f1 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508073 0xbedba9 0
|
||||
7 12456715 0xbe130b 0
|
||||
1 12637987 0xc0d723 0
|
||||
3 12486299 0xbe869b 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 6
|
||||
obdidx objid objid group
|
||||
6 12591616 0xc02200 0
|
||||
0 12420004 0xbd83a4 0
|
||||
2 12566360 0xbfbf58 0
|
||||
4 12508074 0xbedbaa 0
|
||||
|
|
@ -1,140 +0,0 @@
|
|||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 19:51:43 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/ioperf/file_write -w
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 19:51:43 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/ioperf/file_write
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282360348672.
|
||||
WARNING: Using actual aggregate bytes moved = 28024242176.
|
||||
write 203.70 68935680 16.00 0.000505 131.20 0.000238 131.20 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282358808576.
|
||||
WARNING: Using actual aggregate bytes moved = 26859307008.
|
||||
write 200.85 68935680 16.00 0.007329 127.53 0.000260 127.53 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 282359578624.
|
||||
WARNING: Using actual aggregate bytes moved = 26201292800.
|
||||
write 196.89 68935680 16.00 0.000843 126.91 0.000417 126.91 2
|
||||
|
||||
Max Write: 203.70 MiB/sec (213.59 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
write 203.70 196.89 200.48 2.79 128.54957 0 4 2 3 1 0 1 0 0 1 70590136320 16384 28024242176 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 19:58:13 2018
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/git/ime-evaluation/drop_caches.sh
|
||||
+ /opt/ddn/mvapich/bin/mpiexec -ppn 2 -np 4 -genv MV2_NUM_HCAS 1 -genv MV2_CPU_BINDING_LEVEL core -genv MV2_CPU_BINDING_POLICY scatter --hosts isc17-c04,isc17-c05 /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
+ tee -a ./output/COUNT:1#NN:2#PPN:2#API:POSIX#T:16384.txt
|
||||
IOR-3.0.1: MPI Coordinated Test of Parallel I/O
|
||||
|
||||
Began: Mon Oct 22 19:58:21 2018
|
||||
Command line used: /esfs/jtacquaviva/software/install/ior/git-ddn/bin/ior -i 3 -s 1 -t 16384 -b 70590136320 -D 120 -a POSIX -F -e -g -z -k -o /esfs/jtacquaviva/indread2/file -r
|
||||
Machine: Linux isc17-c04
|
||||
|
||||
Test 0 started: Mon Oct 22 19:58:21 2018
|
||||
Summary:
|
||||
api = POSIX
|
||||
test filename = /esfs/jtacquaviva/indread2/file
|
||||
access = file-per-process
|
||||
ordering in a file = random offsets
|
||||
ordering inter file= no tasks offsets
|
||||
clients = 4 (2 per node)
|
||||
repetitions = 3
|
||||
xfersize = 16384 bytes
|
||||
blocksize = 65.74 GiB
|
||||
aggregate filesize = 262.97 GiB
|
||||
Using stonewalling = 120 second(s)
|
||||
|
||||
access bw(MiB/s) block(KiB) xfer(KiB) open(s) wr/rd(s) close(s) total(s) iter
|
||||
------ --------- ---------- --------- -------- -------- -------- -------- ----
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 812826624.
|
||||
read 6.45 68935680 16.00 0.002821 120.23 0.002596 120.23 0
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 839647232.
|
||||
read 6.66 68935680 16.00 0.002560 120.24 0.002601 120.24 1
|
||||
WARNING: Expected aggregate file size = 282360545280.
|
||||
WARNING: Stat() of aggregate file size = 564721090560.
|
||||
WARNING: Using actual aggregate bytes moved = 843300864.
|
||||
read 6.69 68935680 16.00 0.002626 120.23 0.002677 120.23 2
|
||||
|
||||
Max Read: 6.69 MiB/sec (7.01 MB/sec)
|
||||
|
||||
Summary of all tests:
|
||||
Operation Max(MiB) Min(MiB) Mean(MiB) StdDev Mean(s) Test# #Tasks tPN reps fPP reord reordoff reordrand seed segcnt blksiz xsize aggsize API RefNum
|
||||
read 6.69 6.45 6.60 0.11 120.23531 0 4 2 3 1 0 1 0 0 1 70590136320 16384 812826624 POSIX 0
|
||||
|
||||
Finished: Mon Oct 22 20:04:22 2018
|
||||
+ set +x
|
||||
/esfs/jtacquaviva/ioperf
|
||||
stripe_count: 4 stripe_size: 1048576 stripe_offset: -1
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000002
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 7
|
||||
obdidx objid objid group
|
||||
7 12456916 0xbe13d4 0
|
||||
1 12638191 0xc0d7ef 0
|
||||
3 12486503 0xbe8767 0
|
||||
5 12378558 0xbce1be 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000000
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 4
|
||||
obdidx objid objid group
|
||||
4 12508275 0xbedc73 0
|
||||
3 12486502 0xbe8766 0
|
||||
5 12378557 0xbce1bd 0
|
||||
0 12420206 0xbd846e 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000003
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 1
|
||||
obdidx objid objid group
|
||||
1 12638190 0xc0d7ee 0
|
||||
6 12591820 0xc022cc 0
|
||||
2 12566559 0xbfc01f 0
|
||||
4 12508276 0xbedc74 0
|
||||
|
||||
/esfs/jtacquaviva/ioperf/file_write.00000001
|
||||
lmm_stripe_count: 4
|
||||
lmm_stripe_size: 1048576
|
||||
lmm_pattern: 1
|
||||
lmm_layout_gen: 0
|
||||
lmm_stripe_offset: 0
|
||||
obdidx objid objid group
|
||||
0 12420207 0xbd846f 0
|
||||
2 12566560 0xbfc020 0
|
||||
4 12508277 0xbedc75 0
|
||||
7 12456917 0xbe13d5 0
|
||||
|
Some files were not shown because too many files have changed in this diff Show More
Loading…
Reference in New Issue