search for: clm

Displaying 20 results from an estimated 42 matches for "clm".

Did you mean: cl
2009 Oct 29
3
Removing & generating data by category
...m the following arbitrary data set: a <- data.frame(id=c(c("A1","A2","A3","A4","A5"),c("A3","A2","A3","A4","A5")),loc=c("B1","B2","B3","B4","B5"),clm=c(rep(("General"),6),rep("Life",4))) > a id loc clm 1 A1 B1 General 2 A2 B2 General 3 A3 B3 General 4 A4 B4 General 5 A5 B5 General 6 A3 B1 General 7 A2 B2 Life 8 A3 B3 Life 9 A4 B4 Life 10 A5 B5 Life I desire removing records (highligh...
2009 May 28
3
String replacement in an expression
Dear R-experts, I need to replace in an expression the character "Cl" by "Cl+beta" But in the following case: form<-expression((Cl-(V *ka) ) +(V *Vm *exp(-(Clm/Vm) *t))) gsub("Cl","(Cl+beta)",as.character(form)) We obtain: [1] "((Cl+beta) - (V * ka)) + (V * Vm * exp(-((Cl+beta)m/Vm) * t))" the character "Clm" has been also replaced. How could I avoid this unwanted replacement ? Thank you in advance for an...
2010 Aug 20
1
ocfs2 hang writing until reboot the cluster-dlm: set_fs_notified: set_fs_notified no nodeid 1812048064#012
...ip(192.168.1.108) votes=1 born=235504 seen=235504 proc=00000000000000000000000000053312 Aug 18 13:12:31 nodo1 openais[8462]: [TOTEM] Sending initial ORF token Aug 18 13:12:31 nodo1 crmd: [8479]: info: ais_status_callback: status: nodo3 is now lost (was member) Aug 18 13:12:31 nodo1 openais[8462]: [CLM ] CLM CONFIGURATION CHANGE Aug 18 13:12:31 nodo1 cluster-dlm: [8721]: info: crm_update_peer: Node nodo3: id=1812048064 state=lost (new) addr=r(0) ip(192.168.1.108) votes=1 born=235504 seen=235504 proc=00000000000000000000000000053312 Aug 18 13:12:31 nodo1 ocfs2_controld: [8786]: info: crm_update_...
2013 Apr 15
1
Optimisation and NaN Errors using clm() and clmm()
Dear List, I am using both the clm() and clmm() functions from the R package 'ordinal'. I am fitting an ordinal dependent variable with 5 categories to 9 continuous predictors, all of which have been normalised (mean subtracted then divided by standard deviation), using a probit link function. From this global model I a...
2013 Nov 04
1
How to plot results of clmm()?
Dear list, I'd like to create a visual plot of a clmm() I've fitted using the 'ordinal' package in R. It's possible to do this with a glm() by using the 'effects' package. For example: library(effects) data(BEPS) mod <- lm(political.knowledge ~ age + gender + vote, data=BEPS) eff <- effect("age&qu...
2012 Jul 01
0
Cumulative Link Models
Dear R community, I'm trying to analyze a model with an ordinal response variable. I wonder if clm()s (Cumulative Link Models) are appropriate in my case. The study compares parasite infestation of porpoises in 1995 and 2009. The degree of infestation is a rank (mild to severe, as ordered factor). In some parasite species clm gives meaningful results. But in one case I started to wonder. In the...
2012 Nov 04
3
Problem with CLVM (really openais)
...-blade1 openais[7179]: [TOTEM] aru fd high delivered fd received flag 1 Nov 3 17:44:34 calgb-blade1 openais[7179]: [TOTEM] Did not need to originate any messages in recovery. Nov 3 17:44:34 calgb-blade1 openais[7179]: [TOTEM] Sending initial ORF token Nov 3 17:44:34 calgb-blade1 openais[7179]: [CLM ] CLM CONFIGURATION CHANGE Nov 3 17:44:34 calgb-blade1 openais[7179]: [CLM ] New Configuration: Nov 3 17:44:34 calgb-blade1 openais[7179]: [CLM ] r(0) ip(192.168.226.161) Nov 3 17:44:34 calgb-blade1 openais[7179]: [CLM ] Members Left: Nov 3 17:44:34 calgb-blade1 clurgmgrd[9933]: <eme...
2006 Jul 17
3
POP3: Keep a copy on server failed ...
I have a big problem with our cluster, if i read my mail with POP3 client (and check the option, keep a copy on server), every time I read my mail, my client retrive ALL messages an the mailbox !!! I test this with: - Apple Mail 1.0 + 2.0 - M$ Outlook 2000 + 2003 - Thunderbird We use: - Dovecot RC1 - Postfix on Debian Sarge (stable) Can you know this bug ? Or have a workaround ? This function
2007 Aug 16
6
an easy way to construct this special matirx
Hi, Sorry if this is a repost. I searched but found no results. I am wondering if it is an easy way to construct the following matrix: r 1 0 0 0 r^2 r 1 0 0 r^3 r^2 r 1 0 r^4 r^3 r^2 r 1 where r could be any number. Thanks. Wen [[alternative HTML version deleted]]
2011 Aug 30
2
Error in evalauating a function
...1, 0, 2, 0, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 0, 1, 1, 2, 0, 0, 0, 1, 1, 1, 0, 0 ) GENO <- matrix( g , nrow = n ,byrow=T) GENO[GENO == -1 ] <- NA? # Function library(ordinal) ???? Rplink <- function(PHENO,GENO,CLUSTER,COVAR) ???? { ????? f1 <- function(s) ????? { ??????? m <- summary(clm(PHENO ~ s)) ??????? r <- c(m$coef) ??????? c( length(r) , r ) ????? } ???? apply( GENO , 2 , f1 ) ???? } Thanks, ?Debs
2020 Jan 21
2
class(<matrix>) |--> c("matrix", "arrary") -- and S3 dispatch
...rns this S3_dispatch_class() also in current versions of R: > > my.class2 <- function(x) { # use a fn name not used by any sane .. > foo.7.3.343 <- function(x) UseMethod("foo.7.3.343") > msg <- tryCatch(foo.7.3.343(x), error=function(e) e$message) > clm <- sub('"$', '', sub(".* of class \"", '', msg)) > if(is.language(x) || is.function(x)) > clm > else { > cl <- str2lang(clm) > if(is.symbol(cl)) as.character(cl) else eval(cl) > } > } &g...
2006 Jun 15
3
Problem with Dovecot LDA / Postfix
Our setup is ok with Postfix / Dovecot. I just need to add dovecot LDA. I use the 1.0beta9 LDA Configuration: protocol lda { postmaster_address = postmaster@clm.net4all.ch #hostname = #mail_plugins = #mail_plugin_dir = /usr/lib/dovecot/imap #sendmail_path = /usr/lib/sendmail auth_socket_path = /var/run/dovecot/auth-master } auth default-socket { mechanisms = plain login passdb sql { args = /usr/local/dovecot-1.0-beta9/etc/dovecot-pgsql.co...
2008 Oct 11
1
Asterisk 1.6.1 + openais
Hello, I followed the steps by Russell* http://www.venturevoip.com/news.php?rssid=1980* and I got it working for publish_event only. As soon as I add subscribe_event, Asterisk doesn't start and I just get the following message: *Oct 11 6:38:04.340485 [CLM ] nodeget: trying to find node ffffffff* I have no idea what's wrong. There is not very much information about this issue. Where are my conf, just in case. Any idea please bring it up. root at asterisk-slb01:~# cat /etc/ais/openais.conf # Please read the openais.conf.5 manual page totem {...
2017 Jun 26
1
Changing the order of the factors in a cumulative logit model
Hi all, I am using the clm function from the ordinal package to fit a cumulative logit model. If I run the regression without formatting my dependent variable (which is a factor), it works fine, however I need to change the order of the factors to be able to interpret the estimates. I have tried doing this using the relevel...
2012 Nov 06
1
Ordered probit using clm2
Hi, I am new in R. I would like to do a ordered probit regression using clm2 (in the ordinal package). My dependent variable y is the way of payment in M&A: y=0 if the deal is financed by stock only, y=1 if the deal is financed by a mix of cash and stock and y=2 if it is by cash only. My independent variables are CollateralB, Cashavailable and Leverage. This is the co...
2019 Apr 11
2
chown: changing ownership of 'test': Invalid argument
Hai Ian, Can you run this one again on both servers and pm me both outputs. I'll have a good look. https://raw.githubusercontent.com/thctlo/samba4/master/samba-collect-debug-info.sh I've updated the file, so do use the new one. Greetz, Louis > -----Oorspronkelijk bericht----- > Van: samba [mailto:samba-bounces at lists.samba.org] Namens Ian > Coetzee via samba >
2010 Mar 13
3
(no subject)
Dear Colleagues, We are attempting to create trees using R with our Ruby on Rails application. However, we are running into a problem involving the creation of the graphic. We would like them to be in either jpg or png format so that users can save, but due to a lack of control over our sever we are unable to start X11 server. Is there a way to create these images without using X11 server?
2019 Apr 11
0
chown: changing ownership of 'test': Invalid argument
...amba 4.9   < Collected config  --- 2019-04-11-09:30 ----------- --- > Collected config  --- 2019-04-11-07:29 ----------- Which means your time setup is not the same.  2 hours different? Check you timezone setup and setup ntp client that sync with the AD-DC's.     < 10.10.100.12  ho-clm-ph-tempvisor01.jeoffice.jacklin.co.za    ho-clm-ph-tempvisor01 < < # The following lines are desirable for IPv6 capable hosts < ::1     localhost ip6-localhost ip6-loopback < ff02::1 ip6-allnodes < ff02::2 ip6-allrouters --- > ::1           localhost ip6-localhost ip6-loopback &gt...
2009 Dec 02
2
Error when running Conditional Logit Model
Dear R-helpers, I am very new to R and trying to run the conditional logit model using "clogit " command. I have more than 4000 observations in my dataset and try to predict the dependent variable from 14 independent variables. My command is as follows clmtest1 <- clogit(Pin~Income+Bus+Pop+Urbpro+Health+Student+Grad+NE+NW+NCC+SCC+CH+SE+MRD+strata(IDD),data=clmdata) However, it produces the following errors: Error in fitter(X, Y, strats, offset, init, control, weights = weights, : NA/NaN/Inf in foreign function call (arg 6) In addition: Warni...
2019 Nov 21
0
class(<matrix>) |--> c("matrix", "arrary") -- and S3 dispatch
...ion my.class2() which returns this S3_dispatch_class() also in current versions of R: my.class2 <- function(x) { # use a fn name not used by any sane .. foo.7.3.343 <- function(x) UseMethod("foo.7.3.343") msg <- tryCatch(foo.7.3.343(x), error=function(e) e$message) clm <- sub('"$', '', sub(".* of class \"", '', msg)) if(is.language(x) || is.function(x)) clm else { cl <- str2lang(clm) if(is.symbol(cl)) as.character(cl) else eval(cl) } } ## str2lang() needs R >= 3.6.0: if(getR...