diff options
author | Jeffrey B. Arnold <jeffrey.arnold@gmail.com> | 2012-08-11 13:52:37 -0400 |
---|---|---|
committer | Jeffrey B. Arnold <jeffrey.arnold@gmail.com> | 2012-08-11 13:52:37 -0400 |
commit | 6d4d1c6f1d4e05ee01defc00d715633fcc074329 (patch) | |
tree | deefc4d3ada475275904f3a9483b5aaf8de41ec1 /tests/examplefiles/test.R | |
parent | 862b91d319d912d2029bd99cfaed9b4e3c18fe20 (diff) | |
download | pygments-6d4d1c6f1d4e05ee01defc00d715633fcc074329.tar.gz |
SLexer: allowed for escaped quotes, added better example file
Diffstat (limited to 'tests/examplefiles/test.R')
-rw-r--r-- | tests/examplefiles/test.R | 261 |
1 files changed, 146 insertions, 115 deletions
diff --git a/tests/examplefiles/test.R b/tests/examplefiles/test.R index c53edd13..13cc2a70 100644 --- a/tests/examplefiles/test.R +++ b/tests/examplefiles/test.R @@ -1,119 +1,150 @@ -################################### -####### emplikH1.test() ########## -################################### - -emplikH1.test <- function(x, d, theta, fun, - tola = .Machine$double.eps^.25) -{ -n <- length(x) -if( n <= 2 ) stop("Need more observations") -if( length(d) != n ) stop("length of x and d must agree") -if(any((d!=0)&(d!=1))) stop("d must be 0/1's for censor/not-censor") -if(!is.numeric(x)) stop("x must be numeric values --- observed times") - -#temp<-summary(survfit(Surv(x,d),se.fit=F,type="fleming",conf.type="none")) -# -newdata <- Wdataclean2(x,d) -temp <- DnR(newdata$value, newdata$dd, newdata$weight) - -time <- temp$time # only uncensored time? Yes. -risk <- temp$n.risk -jump <- (temp$n.event)/risk - -funtime <- fun(time) -funh <- (n/risk) * funtime # that is Zi -funtimeTjump <- funtime * jump - -if(jump[length(jump)] >= 1) funh[length(jump)] <- 0 #for inthaz and weights - -inthaz <- function(x, ftj, fh, thet){ sum(ftj/(1 + x * fh)) - thet } - -diff <- inthaz(0, funtimeTjump, funh, theta) - -if( diff == 0 ) { lam <- 0 } else { - step <- 0.2/sqrt(n) - if(abs(diff) > 6*log(n)*step ) - stop("given theta value is too far away from theta0") - - mini<-0 - maxi<-0 - if(diff > 0) { - maxi <- step - while(inthaz(maxi, funtimeTjump, funh, theta) > 0 && maxi < 50*log(n)*step) - maxi <- maxi+step - } - else { - mini <- -step - while(inthaz(mini, funtimeTjump, funh, theta) < 0 && mini > - 50*log(n)*step) - mini <- mini - step - } - - if(inthaz(mini, funtimeTjump, funh, theta)*inthaz(maxi, funtimeTjump, funh, theta) > 0 ) - stop("given theta is too far away from theta0") - - temp2 <- uniroot(inthaz,c(mini,maxi), tol = tola, - ftj=funtimeTjump, fh=funh, thet=theta) - lam <- temp2$root +#!/usr/bin/env Rscript +### Example R script for syntax highlighting + +# This is also a comment + +## Valid names +abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUV0123456789._a <- NULL +.foo_ <- NULL +._foo <- NULL + +## Invalid names +0abc <- NULL +.0abc <- NULL +abc+cde <- NULL + +## Reserved Words +NA +NA_integer_ +NA_real_ +NA_character_ +NA_complex_ +NULL +NaN +Inf +## Not reserved +NULLa <- NULL +NULL1 <- NULL +NULL. <- NULL +NA_foo_ <- NULL + +## Numbers +12345678901 +123456.78901 +123e3 +123E3 +1.23e-3 +1.23e3 +1.23e-3 +## integer constants +123L +1.23L +## imaginary numbers +123i +-123i +123e4i +123e-4i +## Hex numbers +0xabcdefABCDEF01234 +0xabcp123 +0xabcP123 +## Not hex +0xg + +## Special operators %xyz% +## %xyz% +1 %% 2 +diag(2) %*% diag(2) +1 %/% 2 +1 %in% 1:10 +diag(2) %o% diag(2) +diag(2) %x% diag(2) +`%foo bar%` <- function(x, y) x + y +1 %foo bar% 2 + +## Control Structures (3.2) and Function +## if, else +if (TRUE) print("foo") else print("bar") +## For, in +for(i in 1:5) { + print(i) } - -onepluslamh<- 1 + lam * funh ### this is 1 + lam Zi in Ref. - -weights <- jump/onepluslamh #need to change last jump to 1? NO. see above - -loglik <- 2*(sum(log(onepluslamh)) - sum((onepluslamh-1)/onepluslamh) ) -#?is that right? YES see (3.2) in Ref. above. This ALR, or Poisson LR. - -#last <- length(jump) ## to compute loglik2, we need to drop last jump -#if (jump[last] == 1) { -# risk1 <- risk[-last] -# jump1 <- jump[-last] -# weights1 <- weights[-last] -# } else { -# risk1 <- risk -# jump1 <- jump -# weights1 <- weights -# } -#loglik2 <- 2*( sum(log(onepluslamh)) + -# sum( (risk1 -1)*log((1-jump1)/(1- weights1) ) ) ) -##? this likelihood seems have negative values sometimes??? - -list( logemlik=loglik, ### logemlikv2=loglik2, - lambda=lam, times=time, wts=weights, - nits=temp2$nf, message=temp2$message ) +## While, break +i <- 1 +while (TRUE) { + i <- i + 1 + if (i > 3) break } - -library("graphics") - -par(mfrow = c(1, 2)) -# plot histogram -x <- rnorm(100) -if (max(x) > 100) - stop("Quite unexpected.") -else - hist(x, plot=TRUE, col="ivory") - -# from doc: lowess -plot(cars, main = "lowess(cars)") - lines(lowess(cars), col = 2) - lines(lowess(cars, f=.2), col = 3) - legend(5, 120, c(paste("f = ", c("2/3", ".2"))), lty = 1, col = 2:3) - -# from doc: is.na -is.na(c(1, NA)) - -# from doc: Extract -y <- list(1,2,a=4,5) -y[c(3,4)] # a list containing elements 3 and 4 of y -y$a # the element of y named a - -# from doc: for -for(n in c(2,5,10,20,50)) { - x <- stats::rnorm(n) - cat(n,":", sum(x2),"\n") +## Repeat +repeat {1+1} +## Switch +x <- 3 +switch(x, 2+2, mean(1:10), rnorm(5)) +## Function, dot-dot-dot, return +foo <- function(...) { + return(sum(...)) +} +# Not keywords +functiona <- 2 + 2 +function. <- 2 + 2 +function1 <- 2 + 2 + + +## Grouping Tokens 10.3.7 +## Parentheses +1 + (2 + 3) +## brackets +foo <- function(a) { + a + 1 } -class(fo <- y ~ x1*x2) # "formula" - - - - +## Indexing 10.3.8 +## [] +bar <- 1:10 +bar[3] +## [[]] +foo <- list(a=1, b=2, c=3) +foo[["a"]] +## $ +foo$a +foo$"a" + +## Operators +2 - 2 +2 + 2 +2 ~ 2 +! TRUE +?"help" +1:2 +2 * 2 +2 / 2 +2^2 +2 < 2 +2 > 2 +2 == 2 +2 >= 2 +2 <= 2 +2 != 2 +TRUE & FALSE +TRUE && FALSE +TRUE | FALSE +TRUE || FALSE +foo <- 2 + 2 +2 + 2 -> foo +foo <<- 2 + 2 +2 + 2 ->> foo + +## Strings +foo <- "hello, world!" +foo <- 'hello, world!' +foo <- "Hello, 'world!" +foo <- 'Hello, "world!' +foo <- 'Hello, \'world!\'' +foo <- "Hello, \"world!\"" +foo <- "Hello, +world!" +foo <- 'Hello, +world!' + +## Backtick strings +`foo123 +!"bar'baz` <- 2 + 2 |