search for: sm2

Displaying 20 results from an estimated 21 matches for "sm2".

Did you mean: s2
2009 Jun 03
2
code for double sum
Hi R-users,   I wrote a code to evaluate double sum as follows:   ff2 <- function(bb,eta,z,k) { r <- length(z) for (i in 1:r) { sm1 <- sum((z[i]*bb/2)*(psigamma((0:k)+eta+1,deriv=0)/(factorial(0:k)*gamma((0:k)+eta+1))))  sm2 <- sum((besselI(z[i]*bb,eta)*log(z[i]*bb/2) - sm1)/besselI(z[i]*bb,eta))  sm2 } ff2(bb,eta,z,10)     but it gave me the following message:   > source(.trPaths[5], echo=TRUE, max.deparse.length=10000) Error in source(.trPaths[5], echo = TRUE, max.deparse.length = 10000) :   C:\Documents and S...
2008 Oct 08
1
Suspicious output from lme4-mcmcsamp
...t mentioned in what I believe to be source code. Regardless, I cannot understand why the mcmcsamp returns the error for this data set. Even when I change the model and the mcmcsamp appears to run, the output is not as expected: > fm2 <- lmer(Reaction ~ Days + (1|Subject), sleepstudy) > sm2 <- mcmcsamp(fm2, 5000) > summary(sm2) Length Class Mode 1 merMCMC S4 > str(sm2) Formal class 'merMCMC' [package "lme4"] with 9 slots ..@ Gp : int [1:2] 0 18 ..@ ST : num [1, 1:5000] 1.198 0.932 0.835 0.826 0.933 ... ..@ call : language...
2018 Feb 15
3
wbinfo -U id gives different users on same dc
....7/man-html/smb.conf.5.html# > winbindenumgroups. However I am removing them as you say. > > For the "dns update command? setting I thought it would solve > my dns update > problem whenever I try to join Active Directory. My samba > version is 4.7.4. > > [root at AA-SM2 ]# net ads join -U administrator > Enter administrator's password: > Using short domain name -- AA > Joined 'AA-SM2' to dns domain 'aa.local' > No DNS domain configured for aa-sm2. Unable to perform DNS Update. > DNS update failed: NT_STATUS_INVALID_PARAMETER >...
2001 Jan 24
3
sm.density
Hello to everyone I''ve downloaded the version sm2 for smoothing methods and when I try the simple code y <- rnorm(50) sm.density(y, model = "Normal") I get the error message Error in if (any(omit)) { : missing value where logical needed I''m running R 1.1.1. on windows 98 Anybody can help? -------------- next part -------...
2010 Sep 15
1
Difficulty creating Julian day in data frame
...a frame: vic.data <- read.table("C:/VIC/data/vic.data.csv", header=F) names(vic.data) <- c("year", "month", "day", "precip", "evap", "runoff", "baseflow", "Tsup", "SM1", "SM2", "SM3", "SWE") vic.data$temp.date <- as.Date(paste(vic.data$year, "/", vic.data$month, "/", vic.data$day, sep="")) vic.data$julian.day <- julian(vic.data$temp.date, origin = as.Date("1900-01-01"))[1]...
2011 Oct 06
0
linear classifiers with sparse matrices
...s! Jeff See below for an example that recreates what my basic attempts at using sparse matrices > L1=rep(0:1,5) > M1=sparseMatrix(i=c(1:5*2,1:5*2),j=c(rep(1,5),rep(10,5)),x=1) > L1=rep(0:1,5) > SM1=sparseMatrix(i=c(1:5*2,1:5*2),j=c(rep(1,5),rep(10,5)),x=1) > DM=as.matrix(SM1) > SM2=as.matrix.csr(DM) > as.matrix(SM2) ? ? ?[,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [1,] ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ? 0 [2,] ? ?1 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ? 1 [3,] ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ? ? 0 [4,] ? ?1 ? ?0 ? ?0 ? ?0 ? ?0 ? ?0 ?...
2018 Feb 15
0
wbinfo -U id gives different users on same dc
...our how to link? I wish to read it. For the .local domain I suppose I have nothing to do. This is a running windows Active Directory and it is not possible to change domain suffix. Here is my /etc/hosts 127.0.0.1 localhost.localdomain localhost 10.254.104.8 wdc04.aa.local wdc04 10.254.105.208 AA-SM2 and /etc/resolv.conf search aa.local nameserver 10.254.104.8 nameserver 10.254.104.13 My distribution is Archlinux. Greetings, Ozkan Sure there is, > Install debian, follow my howto and you will have success. > > Just, your using an .local domain, and thats a reserved name for apples...
2018 Feb 14
3
wbinfo -U id gives different users on same dc
RID solved my problem. But while reading docs I saw new things and I changed my smb.conf completely. I have read almost every parameter but i'm still not %100 sure. Can you do me a last favor? Please can you tell me do I have any problem with new smb.conf? Kernel: Linux 4.14.13-1-ARCH Filesystem: zfs-linux 0.7.5.4.14.13.1-1 Thank you so much for your help. --------------------- [global]
2010 Dec 02
1
Suitable test for ordinal variable vs continuous variable trend
...ith ordinal variables so I am at a bit of a loss. What is the most appropriate test? and is it implemented in R? Many thanks ************************************************************** Daniel Brewer Institute of Cancer Research Molecular Carcinogenesis MUCRC 15 Cotswold Road Sutton, Surrey SM2 5NG United Kingdom Tel: +44 (0) 20 8722 4109 Fax: +44 (0) 20 8722 4141 Email: daniel.brewer at icr.ac.uk ************************************************************** The Institute of Cancer Research: Royal Cancer Hospital, a charitable Company Limited by Guarantee, Registered in England und...
2000 Dec 12
1
smoothing binary data
I'm trying to figure out a good way to smooth binary data. The ideal approach appears to be the "sm.logit" function in library "sm", but I haven't had success with it. Below, is some code illustrating what I've come up with so far, but I'm hoping there is a better approach. I'm using R 1.2 (development) under Windows 98. -Bill library(MASS) data(birthwt)
2009 Mar 23
4
newton method
Hi R-users, Does R has a topic on newton's method? Thank you for the info.
2010 Jan 12
1
Strange behavior when trying to piggyback off of "fitdistr"
...pacing Call$method <- "Nelder-Mead" Call$hessian <- FALSE Call$control$reltol = .Machine$double.eps Call$control$maxit = 30000 res <- eval.parent(Call) k <- length(start) EMC<-0.5772156649 m<-n+1 gm<-m*(log(m)+EMC)-.5-(1/(12*m)) sm2<-m*(pi^2/6-1)-.5-1/(6*m) sm<-sqrt(sm2) C1<-gm-(sqrt(.5*n)*sm) C2<-(2*n)^(-.5)*sm TT<-(res$value+(k/2)-C1)/C2 pwr=pchisq(TT,df=n) structure(list(estimate = res$par, Value = res$value, TestStat = TT, TestPower = 1-pwr, n = n, message=res$message, conv =...
2004 Aug 06
0
Relay question
...am doing something wrong? I added 3 aliases to the icecast.conf file on Host#2. Host#1 has 3 streams that are served up, and that are working. When I connect to one of the aliased screams on host#2, it immediately kicks me off with an error. On Host#2: -> alias list Listing aliases [sm2.757tech.net :8000/ORF] [68.10.144.71:8000/ORF] [sm2.757tech.net :8000/fm99] [68.10.144.71:8000/icy_0] [sm2.757tech.net :8000/vbpd] [68.10.144.71:8000/vbpd] 68.10.144.71 is Host#1 sm2.757tech.net is Host#2 When I connect and get dumped, I see this on sm2's console: &...
2000 Dec 19
1
sm library
Hello to everyone Does someone know where is the bug in sm.logit function in sm library? The estimated probabilities are always 1/2 I'm new to this list, so I don't know if this list is about this kind of things. Sorry for my english, and thanks in advance Oscar -------------- next part -------------- An HTML attachment was scrubbed... URL:
2005 Sep 15
0
Siemens Hi-Path help
hi all, anybody have a siemens hipath 3500 with a sm2/pri card? because i need to connect to my box TE110P (e1) and i dont know how is the mode in the pbx to change it. thanks -- .- Pablo Allietti LACNIC
2001 Jul 18
1
Internet via Firewall
Hi, My linux computer is behind a firewall that I have no control of. Netscape under Wine works fine, if I connect to a webpage within the internal domain. But it cannot find anything outside the domain. The funny thing is... if I use the native linux Netscape, I can access webpages outside my domain too. This means my PC can access the internet, but somehow this does not work under Wine. This
2019 May 16
3
ALTREP: Bug reports
...e > double > > .Internal(inspect(so2)) > @0x0000000005fc5ac0 14 REALSXP g0c0 [MARK,NAM(7)] wrapper > [srt=-2147483648,no_na=0] > @0x0000000005e7fbb0 14 REALSXP g0c0 [MARK,NAM(7)] Share object of type > double > > sm1=peekSharedMemory(so1) > getting data 1 > > sm2=peekSharedMemory(so2) > getting data 1 > getting data 1 We see that so2 call R_altrep_data1 twice to get the internal data. This is very unexpected. Thank you very much for your help again! Best, Jiefei On Thu, May 16, 2019 at 3:47 PM Gabriel Becker <gabembecker at gmail.com> wro...
1997 Aug 06
0
Redhat Linux and Samba crashing
...;(8#4#$K!E+@`R`%VT2\'_")`$ M("/03#,P4$R0!9`GX+]4@#(P3G("(3[4)M4H)03N,3TA2=!?="DN`$XQ*W'? M!"`R`%6Q)U%>$64I$%R%]B=+)U]@8F2F)X`G``0@OU3A+L$Q51<@6J%!L&1? M8/YE5&)4LS0-5%,Q-#5@0B']9%%M!"`QD29Q(T`[4#V1_"AB+T$\<BX`%R`+ M@"2P_V`B!&!M,SM2!"`Q\T91*D)['!$$D"DT'B>0.:<GA#&@+CDN,3<'0'`2 M@+XT)S,I1"00!*`U8"`G`<<`D"31*<`P+C-YX#OR`0.104U$-#@V1,98>!`Q M\SA-8C0>+L/_3F`(D"^$1&@QD3M0*8!DH4,Q\B4B<W5C8UJA.ATAO#$V$'T4 M=PDV<#$Z,2&F,H#F>']YAC(W_30&amp...
2019 May 16
0
ALTREP: Bug reports
...ernal(inspect(so2)) >> @0x0000000005fc5ac0 14 REALSXP g0c0 [MARK,NAM(7)] wrapper >> [srt=-2147483648,no_na=0] >> @0x0000000005e7fbb0 14 REALSXP g0c0 [MARK,NAM(7)] Share object of type >> double >> > sm1=peekSharedMemory(so1) >> getting data 1 >> > sm2=peekSharedMemory(so2) >> getting data 1 >> getting data 1 > > > We see that so2 call R_altrep_data1 twice to get the internal data. This > is very unexpected. > > Thank you very much for your help again! > > Best, > Jiefei > > > > On Thu, May 16, 2...
2019 May 16
3
ALTREP: Bug reports
Hello, I have encountered two bugs when using ALTREP APIs. 1. STDVEC_DATAPTR >From RInternal.h file it has a comment: /* ALTREP support */ > void *(STDVEC_DATAPTR)(SEXP x); However, this comment might not be true, the easiest way to verify it is to define a C++ function: void C_testFunc(SEXP a) > { > STDVEC_DATAPTR(a); > } and call it in R via > a=1:10 > >