Displaying 20 results from an estimated 3497 matches for "nb".
2010 May 19
8
Generating all possible models from full model
...am missing models or have made a mistake somewhere. It is also difficult to alter models if I want to change a term. For example, below are the set of models I would like to run. Is there a way to specify the full model and have R generate the rest? I.e. specify
m1234567<-glm.convert(glm.nb(mantas~site*year+cosmonth+sinmonth+coslunar+sinlunar+plankton, data=mydata))
and have R run all the other models.
library(MASS)
#Intercept only
m0<-glm.convert(glm.nb(mantas~1,data=mydata))
#One term - 7 models
#Manta abundance is greater at one of the two sites
m1<-glm.convert(gl...
2014 Oct 09
0
xen 4.5-unstable, oxenstored cannot start (centos 7, kernel 3.17.0)
...g.
But. The oxenstored is not starting.
Simple sudo xl list just hangs. I looked at the
/var/log/messages and found there some bad looking messages.
I don't know if they are connected somehow but here they
are:
1. xenstored.service and xenconsoled.service
Oct 9 02:03:05 kvmxen-centos7-test1-nb systemd-cgroups-agent: Failed to
get D-Bus connection: Failed to connect to socket /run/systemd/private: No
such file or directory
Oct 9 02:03:05 kvmxen-centos7-test1-nb systemd: systemd 208 running in
system mode. (+PAM +LIBWRAP +AUDIT +SELINUX +IMA +SYSVINIT +LIBCRYPTSETUP
+GCRYPT +ACL +XZ)
Oct...
2018 Jan 27
0
GAM: mismatch between nb/polys supplied area names and data area names
...tribution) as a function of two covariates, and wish to incorporate
spatial correlation among areal neighbors, n = 50 polygons, identified by
"id". For data observed over discrete spatial units, a Markov random field
can be used through the GAM syntax:
s(id, bs="mrf", xt = list(nb = nb), where the latter nb refers to an object
with a neighbor list.
The error is "Error in smooth.construct.mrf.smooth.spec(object, dk$data,
dk$knots) :
mismatch between nb/polys supplied area names and data area names".
I have read the documentation, studied the function, and looked a...
2011 Sep 01
3
Oh apply functions, how you confuse me
...ng a script that
takes this data and creates a number of useful graphics for our area. I am
unable to figure out one summary though and its all cause I dont fully
understand the apply family of functions. Consider the following:
#Create data
Df..<-rbind(data.frame(Id=1:1008,Dir=rep(c("NB","NB","SB","SB"),252),Mph=runif(1008,0,65),
Volume=runif(1008,0,19),Hour=rep(00,1008),Min5Break=rep(1:12,84),Day=rep(1,1008)),
data.frame(Id=2009:2016,Dir=rep(c("NB","NB","SB","SB"),252),Mph=runif(1008,0,65),
Volume=runif(10...
2004 Apr 15
0
phyper accuracy and efficiency (PR#6772)
...wer
is
dhyper(0, 150, 150, 60, FALSE) which is 5.111204798e-22.
phyper is also really slow for large arguments.
Therefore, I suggest using the code below. This is a sniplet from Gnumeric, so
you'll have to s/gnm_float/double/ and s/gnum//, etc. The code isn't perfect.
In fact, if i*(NR+NB) is close to n*NR, then this code can take a while.
Not longer than the old code, though.
/*
* New phyper implementation. Copyright 2004 Morten Welinder.
* Distributed under the GNU General Public License.
*
* Thanks to Ian Smith for ideas.
*/
/*
* Calculate
*
* phyper (i,...
2007 Dec 31
2
the woes of NA
...#39;m adapting a FORTRAN 77 package for use with R. Pretty
straightforward.
Except for a glitch it took me some time to figure out. This existing
package has subroutines which have parameters called "NA". So, I called
subroutines like
bnodes <- function(n, lst, lptr, lend, nodes, nb, na, nt)
{
ensure.all.numeric(list(n, lst, lptr, lend, nodes, nb, n.a, nt),
"all arguments to -bnodes- must be numeric")
out <- .Fortran("bnodes", N=as.integer(n), LIST=as.integer(lst),
LPTR=as.integer(lptr), LEND=as.integer(lend),...
2005 Feb 25
0
3.0.7 - NT Create AndX Response, Error:, QUERY_PATH_INFO, Error:
...the 23 second hang. I am
running 3.0.7. Does anybody have any idea what could be happening?
Note the 3 second delay between packet 27 & 28. It also appears that XP
does some dns caching that is persistant during shutdown and restart. I have
the laptop at home right now, but you can see the NBNS packets still looking
for "Nemesis" and "Bonza" which are two samba servers at work. Go figure??
Any ideas what is happening or how to fix it??
No. Time Source Destination Protocol
Info
1 0.000000 rankin-p35.3111skyline.com ww...
2009 Apr 14
1
mean fold change issues and p values
...)
ncol <- ncol(data.norm.test)
p.ttest = rep(NA, nrow) #parametric test -- t test
p.wilcox = rep(NA, nrow) #non-parametric test -- Mann-Whitney test
fold.mean <- rep(NA, nrow)
mean.na <- rep(NA, nrow)
mean.nb <- rep(NA, nrow)
sig.peak.all = data.norm.test
g_1 = sig_test[1]
g_2 = sig_test[2]
col_s1 = 1; col_s2 = 1;
for(i in 1:group){
if(i < g_1)
col_s1 = col_s1+group_size[i]
if(i < g_2)...
2011 Jul 22
0
failed creating protocol instance to play queued url
...derbird debug logs are not time stamped (that I can
tell), so its difficult to go back and find the delays from the log.
Here is an example of one of the delays. Any thought?
-1215891312[b760f060]: considering playing queued
url:imap://km at mailhost.mathcs.emory.edu:993/addmsgflags>UID>/INBOX>134829>1
-1215891312[b760f060]: creating protocol instance to play queued
url:imap://km at mailhost.mathcs.emory.edu:993/addmsgflags>UID>/INBOX>134829>1
-1215891312[b760f060]: failed creating protocol instance to play queued
url:imap://km at mailhost.mathcs.emory.edu:993/addms...
2011 Mar 15
2
Feature request: txtProgressBar with ability to write to arbitrary stream
...willing to incorparate this idea, I
attached the patch file for the necessary changes below.
Best regards,
Andreas
3c3
< width = NA, title, label, style = 1)
---
> width = NA, title, label, style = 1, file=stderr())
23c23
< cat(paste(rep.int(char, nb-.nb), collapse=""))
---
> cat(paste(rep.int(char, nb-.nb), collapse=""), file = file)
27c27
< "\r", paste(rep.int(char, nb), collapse=""), sep = "")
---
> "\r", paste(rep.int(char, nb)...
2019 Aug 10
1
Dovecot for imap with LDAP
On 2019-08-09, Joseph Mays via dovecot <dovecot at dovecot.org> wrote:
> I am looking at replacing our creaky old courier-imap server, which takes
> authentication and user info from an LDAP database, with dovecot imap. Any
> comments on the wisdom of this choice of action, or anything I should know
> about the setting up before starting to work on it?
Plenty of people have
2000 Apr 20
1
installation pbm on irix 6.2 : make step
Hi everybody,
i try to install the R 1.0.1 on a mips-sgi-irix6.2 system.
The configure seems ok : it ends with
- souce directory : .
- installation dircetory : /usr/local
- C compiler : cc -g
- Fortran compiler : fort77
- Gnome support : no
But when i enter : make it says:
-syntax error in file ../tools/jeywords2html at line 9, next 2 tokens
"my $key"
-syntax error in file
2011 Nov 18
0
NB and poisson glm models: three issues
Hi,
I fit both Poisson and NB (negative binomial) models to some empirical data.
Although models provide me with sensible parameters, in the case of the NB
models i get three inconsistencites:
- First, the total number of occurrences predicted by the model (i.e.
fitted(fit)) is much greater than those of the data. I realise...
2007 Feb 01
3
Can this loop be delooped?
Hi.
I have the following code in a loop. It splits a vector into subvectors of
equal size. But if the size of the original vector is not an exact multiple
of the desired subvector size, then the first few subvectors have one more
element than the last few. I know that the cut function could be used to
determine where to break up the vector, but it doesn't seem to provide
control over
2001 May 16
0
glm.nb difficulties
I'm having problems (or to be precise a student is having problems,
which I'm having problems helping her with) trying to use glm.nb() from
the MASS package to do some negative binomial fits on a data set that is,
admittedly, wildly overdispersed (some zeros and some numbers in the
hundreds).
glm.nb is failing to converge, and furthermore is (to my surprise)
producing values of theta that are larger and larger.
Does anyone...
2004 May 19
7
Help with hclust() and plot()
Hi
When I use plot(hclust(dist..)...)...) etc to create a dendrogram of a
hierarchial cluster analysis, I end up with a vertical tree. What do I
need to do to get a horizontal tree?
Also, my users are used to seeing trees who's leaves all "end" at the
same place (eg. Like in minitab). Is this possible in R?
Thanks
Mick
Michael Watson
Head of Informatics
Institute for Animal
2010 Feb 10
1
OrdFacReg
...un my analysis, but I am having a difficult time deciphering the code and making it work for my dataset. Given that this is a new package, I was unable to find any posts regarding OrdFacReg or examples to use as a template. Normally, I would run the analysis as an anova with the following code:
NB.aov<-aov(effect~NB, data=LH.df)
To give you some background, "effect" is a continuous variable and "NB" is ordered 0, 1, 2, 3, 4. I tried each of following code to no avail:
ordFacReg(effect, NB)
ordFacReg(effect, NB, ordering="i", type="LS")
ordFacReg...
2005 Feb 18
2
bivariate empirical cdf
Dear R users,
I'm trying to write a small function in order to compute empirical cumulative density function.All seems to work but when I try to plot the function, I always get error messages.
This is the function I use
mecdf<-function(u,v,z) {
u=sort(u)
v=sort(v)
n=length(u)
nb=0
for (i in seq(1,n)) {
if (u[i]<z & v[i]<z) {
nb<-nb+1
}
}
nb=nb/n
return(nb)
}
In fact if I try to obtain mecdf(u,v,0.1) or mecdf(u,v,0.2), all is good, but with mecdf(u,v,c(0.1,0.2)), for example, I get errors and wrong results for both mecdf(u,v,0.1) and mecdf(u,v,0....
2006 Apr 19
1
Probable Numeric Bugs in svd function (PR#8781)
...D2)=0D
sigmas<-c(13.71,162.71,8.78,103.83,5.29,77.08,3.42,41.04)=0D
temp1<-sigmas[1]*usLow+sigmas[2]*usHigh+sigmas[5]*euLow+sigmas[6]*euHigh=0D
temp10<-sigmas[3]*usLow+sigmas[4]*usHigh+sigmas[7]*euLow+sigmas[8]*euHig=0D
h=0D
CorrEU<-0.89=0D
CorrUS<-0.82=0D
=0D
CorrR<-matrix(0,2*SN.nb,2*SN.nb)=0D
diag(CorrR)<-c(temp1^2,temp10^2)=0D
=0D
temp<-ifelse(Region=3D=3D1,CorrUS,CorrEU)=0D
tempMat<-matrix(0,SN.nb,SN.nb)=0D
diag(tempMat)<-temp*temp1*temp10=0D
CorrR[(SN.nb+1):(2*SN.nb),1:SN.nb]<-tempMat=0D
CorrR[1:SN.nb,(SN.nb+1):(2*SN.nb)]<-tempMat=0D
=0D
CorrR is positiv...
2004 May 04
1
spdep question
Dear list,
(also sent to Roger Bivand, but perhaps somebody of you can help me also)
I am trying to use package spdep for fitting an SAR model with errorsarlm.
However, I am not sure how to make a valid nb object out of my
neighborhood. As far as I have seen, there is no documentation for
nb.object.
I have done the following:
class(pschmid$nb) <- "nb"
# pschmid is a prab object as generated from function prabinit, package
# prabclus, and the neighborhood looks as follows:
> unclass(...