And say that it's UTC.

This commit is contained in:
Karsten Loesing 2010-01-20 16:13:58 +01:00
parent c89650ee88
commit dcf974dfea
4 changed files with 10 additions and 6 deletions

View File

@ -32,7 +32,8 @@ plot_bridges <- function(country, people, filename, color) {
plot(data, ylim=c(0, max(na.omit(data))), type="l", col=color, lwd=2,
axes=FALSE, frame=FALSE,
main=paste(people, "Tor users via bridges"),
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC")), ylab="")
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC"), "UTC"),
ylab="")
axis(1, at=monthticks - 0.5, labels=FALSE, lwd=0, lwd.ticks=1)
axis(1, at=c(1, length(data)), labels=FALSE, lwd=1, lwd.ticks=0)
axis(1, at=monthat, lwd=0, labels=monthlabels)

View File

@ -38,7 +38,8 @@ exitCol <- "darkgreen"
plot(runningNum, ylim=c(0, max(na.omit(runningNum))), type="l",
col=runningCol, lwd=2, axes=FALSE, frame=FALSE,
main=paste("Number of exit relays"),
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC")), ylab="")
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC"), "UTC"),
ylab="")
lines(exitNum, col=exitCol, lwd=2)
mtext("All relays", side=4, line=0, las=1,
at=tail(na.omit(runningNum), n=1), col=runningCol)
@ -59,7 +60,8 @@ brunningCol <- "blue"
plot(runningNum, ylim=c(0, max(na.omit(runningNum))), type="l",
col=runningCol, lwd=2, axes=FALSE, frame=FALSE,
main=paste("Number of relays and bridges"),
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC")), ylab="")
xlab=paste("Last updated:", as.POSIXlt(Sys.time(), "UTC"), "UTC"),
ylab="")
lines(brunningNum, col=brunningCol, lwd=2)
mtext("Relays", side=4, line=0, las=1,
at=tail(na.omit(runningNum), n=1), col=runningCol)

View File

@ -30,7 +30,7 @@ plot_moria1 <- function(country, people, filename, color) {
par(mar = c(4.1, 3.9, 2.1, 0))
plot(data, ylim=c(0, max(0, na.omit(data))), type="l", col=color, lwd=2,
axes=FALSE, frame=FALSE, xlab=paste("Last updated:",
as.POSIXlt(Sys.time(), "UTC")),
as.POSIXlt(Sys.time(), "UTC"), "UTC"),
ylab="", main=paste("New or returning, directly connecting", people,
"Tor users"))
axis(1, at=monthticks - 0.5, labels=FALSE, lwd=0, lwd.ticks=1)
@ -84,7 +84,7 @@ plot_trusted <- function(country, people, filename, color) {
par(mar = c(4.1, 3.9, 2.1, 0))
plot(data, ylim=c(0, max(0, na.omit(data))), type="l", col=color, lwd=2,
axes=FALSE, frame=FALSE, xlab=paste("Last updated:",
as.POSIXlt(Sys.time(), "UTC")),
as.POSIXlt(Sys.time(), "UTC"), "UTC"),
ylab="", main=paste("Recurring, directly connecting", people,
"Tor users"))
axis(1, at=monthticks - 0.5, labels=FALSE, lwd=0, lwd.ticks=1)

View File

@ -65,7 +65,8 @@ for (intervalInd in 1:length(intervals)) {
title <- paste("Time in seconds to complete", sizePr, "request")
xlab <- ""
if (sourceInd == length(sources))
xlab <- paste("Last updated:", as.POSIXlt(Sys.time(), "UTC"))
xlab <- paste("Last updated:", as.POSIXlt(Sys.time(), "UTC"),
"UTC")
data <- subset(t, source %in% sourceStr)