search for: expl

Displaying 20 results from an estimated 50 matches for "expl".

Did you mean: excl
2002 Jun 07
2
Hope fo help - functions, fits and for cycles
...er and age response<-c(2.1,3.5,6.1,2.0,1.5) dataset<-data.frame(ID,gender,age,G1,G2,G3,response) GG<-c("G1","G2","G3") # here I construct a function that makes a basic fit, then updates with each variable from GG vector. trial_function(mydata,formule,expl,distr="binomial") { n_length(expl) fit.low_glm(formule, family = distr, data = mydata, na.action = na.exclude) for (j in 1:n) { fit_update(fit.low,~.+ mydata[,expl[j]]) print(mydata[,expl[j]]) } } result<- trial(mydata=dataset,formule=respons...
2007 Jul 18
1
Neuman-Keuls
...oblem the function return an empty list and I don't know why. summary(fm1) E <- sqrt((summary(fm1)[[1]]["Residuals","Mean Sq"])/length(LR)) lst <- list() lst1 <- list() lst2 <- list() NK <- function (x) { if (length(x) == 2) { Tstudent <- t.test(subset(exple, groupe == names(x)[1])$vd,subset(exple, groupe == names(x)[2])$vd) t <- as.numeric(Tstudent$statistic) if (t >= Tstudent$conf.int[1:2][1] & t <= Tstudent$conf.int[1:2][2]) { lst1[[1]] <- x lst <- c(lst,lst1) } else { lst1[[1]] <- x[1] lst2[[1]] <- x[2]...
2012 Aug 02
1
documentation for configuring folder redirection
I believe that once you have roaming profiles configured, all you need to do to configure folder redirection is set some registry keys. I'd like to turn that job over to our Windows sys admin. Can someone provide me with their favorite documentation for configuring folder redirection? Keep in mind I am passing this link along to a Windows sys admin. Our backend is samba 3.6.3 if it
2009 Oct 01
0
Nested Anova and type II sum of square
...4014,19.856307,21.966194,21.445263,18.100480,17.887656,17.444490,11.355896,12.246672,11.462910,12.484537,11.742058,11.937823,16.838480,15.412491,17.789735,11.660008,12.355745,12.963518,10.629601,11.781656,10.693390,5.637602,6.181518,6.853488,8.136201,9.224135,8.309939,10.938328,11.070514,10.965592) exple<-data.frame(cbind(month,condition,species,variety,leafsize)) exple[,5]<-leafsize exple   I’d like to estimate the effects of these different factors (condition, species, variety within species, interaction between condition*species, interaction between condition*variety within species and fi...
2011 Jan 12
1
graphics: 3D regression plane
...rame(id=c("1","2","3"),t=t0) B<-data.frame(id=id,tempo=time) C<-merge(A,B);C rd<-as.vector(C$tempo-C$t);rd #time centered on sbj specific first occurrence mod<-lm(y~rd*k) newax<- expand.grid( days = giorni<-seq(min(rd),max(rd), length=100), expl= esplic<- seq(min(k), max(k), length=100) ) fit <- predict(mod,data.frame(rd=giorni,k=esplic)) graph <- persp(x=giorni, y=esplic,fit, expand=0.5, ticktype="detailed", theta=-45) #error : z argument not valid I would be grateful if someone would give me some suggestions. T...
2011 Nov 10
1
Sum of the deviance explained by each term in a gam model does not equal to the deviance explained by the full model.
Dear R users, I read your methods of extracting the variance explained by each predictor in different places. My question is: using the method you suggested, the sum of the deviance explained by all terms is not equal to the deviance explained by the full model. Could you tell me what caused such problem? > set.seed(0) > n<-400 > x1 <- runif(n,...
2011 Jul 29
1
Environment of a LM created in a function
...es my usual approach: ---------------8<--------------- set.seed(123) dat <- data.frame(x = rep(rep(1:3, each = 3), 4), y = rep(1:3, 12)) dat$z1 <- rnorm(36, dat$x + dat$y) dat$z2 <- rnorm(36, dat$x + 2*dat$y) dat$z3 <- rnorm(36, dat$x + 3*dat$y) modelInFunction <- function(resp, expl, df) { fo <- as.formula(paste(resp, paste(expl, collapse = " + "), sep = " ~ ")) lm(fo, data = df) } ex <- c("x", "y") resp <- paste("z", 1:3, sep = "") models <- lapply(resp, modelInFunction, expl = ex, df = dat) -------...
2009 Sep 02
0
Cointegration/urca package
Hello!   I estimate vector error correction model (vecm) model. I have only one cointegratio relationship. I write :   joh.vecm.rls <- cajorls(joh.vecm, r=1) The output estimation is : Call: lm(formula = substitute(form1), data = data.mat) Coefficients:                up.d            expl.d        upd.d           r.d      ect1      -1.34e-01   4.55e+02   6.91e+00   2.43e+03 constant  -4.90e+01   1.82e+05   2.46e+03   9.54e+05 up.dl1     6.68e-01   2.07e+03   3.49e+01   2.51e+03 expl.dl1   1.72e-04  -1.87e-01   9.22e-03   1.34e-01 upd.dl1   -2.48e-03   8.15e+00   4.36e-01   2.29e+01...
2005 May 23
1
Can't reproduce clusplot princomp results.
Dear R folk: Perhaps I'm just dense today, but I am having trouble reproducing the principal components plotted and summarized by clusplot. Here is a brief example using the pluton dataset. clusplot reports that the first two principal components explain 99.7% of the variability. But this is not what princomp is reporting. I would greatly appreciate any advice. With best regards, -- Tom > R.version _ platform i386-pc-mingw32 arch i386 os mingw32 system i386, mingw32 status...
2014 Dec 13
2
samba & Oracle ACFS Issues
...[dossiers] comment = xxxxxxxxxxxxxxxxxxxxxx path = /opt/srv007/app guest ok = yes writable = yes browseable = no create mask = 0664 directory mask = 0775 force create mode = 0664 force directory mode = 0775 force user = expl force group = expl # The following to avoid file system lockings locking = Yes strictlocking = No posixlocking = Yes oplocks = No level2oplocks = No fakeoplocks = No blockinglocks = Yes $ df /opt/srv007/app/ Filesystem...
2010 Jun 25
0
WG: Samba PDC and big files
...uot; "\\tpdc\@userID\" ENDIF ;nun setzen wir den hinweis das Eigene Dateien kopiert worden sind ADDKEY("HKEY_CURRENT_USER\tpdc\profile_copied") ;set the redirected shell folders in the registry WRITEVALUE("HKEY_CURRENT_USER\Software\Microsoft\Windows\CurrentVersion\Expl orer\Shell Folders","Personal","\\tpdc\@userID","REG_SZ") WRITEVALUE("HKEY_CURRENT_USER\Software\Microsoft\Windows\CurrentVersion\Expl orer\Shell Folders","My Pictures","\\tpdc\@userID\Meine Bilder","REG_SZ") WRITEVALUE(&quo...
2010 Feb 03
3
to convert a character string in time
hi, I have my data time expressed in character string exple "5:20" (hour:min) and i want to convert these in times recognized by R. I have tried the POSIXct function: balise07$Hour <- as.POSXIct(balise07$Hour) but it didn't work. Do you know why? Do you know how i can convert my string character in a real time? Thanks Karine...
2004 Nov 20
3
Another try: apps can't see data files until use of Win. Expl.
...no responses. So I'm trying again] I have a couple of applications on a WinXP/SP2 system that use data files on a Samba (v2.2.12, on Linux) shared drive. Immediately after booting the WinXP system these data files cannot be seen, yet become visible when the share is browsed with Windows Explorer. These applications are started automatically when the WinXP system is booted. The Samba-exported network drive is also reconnected automatically at boot time. After the WinXP system is completely booted these data files are still not seen by their respective application. When I open Win...
2014 Dec 16
2
Fwd: samba & Oracle ACFS Issues
...xxxxxx > path = /opt/srv007/app > guest ok = yes > writable = yes > browseable = no > create mask = 0664 > directory mask = 0775 > force create mode = 0664 > force directory mode = 0775 > force user = expl > force group = expl > # The following to avoid file system lockings > locking = Yes > strictlocking = No > posixlocking = Yes Did you try "posix locking = no"? That is mostly criticial if you are exporting files from a file system w...
2014 Dec 16
1
Fwd: samba & Oracle ACFS Issues
...7f4d64ee9000, 4096) = 0 geteuid() = 504 fstat(34, {st_mode=S_IFREG|0644, st_size=25353, ...}) = 0 mmap(NULL, 4096, PROT_READ|PROT_WRITE, MAP_PRIVATE|MAP_ANONYMOUS, -1, 0) = 0x7f4d64ee9000 lseek(34, 0, SEEK_CUR) = 25353 write(34, " expl closed file tf-PRENSA_Aca"..., 85) = 85 munmap(0x7f4d64ee9000, 4096) = 0 writev(28, [{"\0\0\0#\377SMB\4\0\0\0\0\210\3\300\0\0\0\0\0\0\0\0\0\0\0\0\1\0\377\376"..., 39}], 1) = -1 EPIPE (Broken pipe) stat("/etc/localtime", {st_mode=S_IFREG|0644, st_size=2593, ......
2015 Mar 06
0
Fwd: samba & Oracle ACFS Issues
Hi again Volker (& list) I think I am very closer of the problem. Look at this please # A file is deleted => OK [2015/03/06 07:31:45.359108, 2] smbd/open.c:704(open_file) expl opened file PRENSA_Avance1_20150306_070500.pdf read=No write=No (numopen=1) [2015/03/06 07:31:45.359145, 5] smbd/oplock.c:92(set_file_oplock) set_file_oplock: granted oplock on file PRENSA_Avance1_20150306_070500.pdf, 30c0fc03:19d62:0/422320395, tv_sec = 54f949d1, tv_usec = 57a9d [20...
2016 Apr 04
9
RFC: Constant folding math functions for long double
Hi, Clang is currently unable to constant fold calls to math.h functions such as logl(), expl() etc. The problem is that APFloat doesn't have these functions, so Clang is forced to rely on the host math library. Because long double isn't portable, we only ever query the host math library for double or float results. I can see three methods for allowing constant folding for types t...
2013 Oct 18
2
pamer.fnc y la nueva versión de R
...n1 1 54.0666 54.0666 0.1332 16 > 0.7199 > > Condicion2 1 343.4881 343.4881 0.8463 16 > 0.3713 > > Condicion1:Condicion2 1 36.9835 36.9835 0.0911 16 > 0.7666 > > lower.den.df lower.p.val expl.dev.(%) > > Condicion1 12 0.7215 0.6186 > > Condicion2 12 0.3757 3.9298 > > Condicion1:Condicion2 12 0.7679 0.4231 > > > sessionInfo() > > R version 2.15.2 (2012-10-26) > > P...
2013 Oct 18
0
pamer.fnc y la nueva versión de R
Gracias a todos por las recomendaciones. Ya me he puesto en contacto con el autor y le explicado donde esta el error. Es tan fácil como que han cambiado la estructura de los objetos tipos lmer desde la versión 2.15.3 con lo que su paquete dejo de funcionar. Por suerte la nueva estructura conserva por lo menos la parte necesaria para hacer sus funciones. Se localizar el fallo y como arreg...
2015 Feb 11
2
Fwd: samba & Oracle ACFS Issues
On Wed, Feb 11, 2015 at 12:01:34PM +0100, Nacho del Rey wrote: > The symptom is that the windows process which is accessing the samba share > hangs > Also, if you try to open the same share (you can do the connection) to see > the files, the ls command hangs > > The other samba shares don't be affected at all, they work ok > > So the only thing you can do is a