search for: eq2

Displaying 20 results from an estimated 27 matches for "eq2".

Did you mean: eq
2009 May 25
0
eve
...om http://runescape-gold.virdeal.com/ http://maplestory-mesos.virdeal.com http://www.mesos-maplestory.net http://flyff-penya.virdeal.com http://swg-credits.virdeal.com http://silkroad-gold.virdeal.com http://cabal-alz.virdeal.com http://archlord-gold.virdeal.com http://2moons-dil.virdeal.com http://eq2-platinum.virdeal.com/ http://www.rsgoldvip.com http://www.wowgoldbmw.com http://www.ffxigilbmw.com http://www.eveiskbmw.com http://www.lotrogoldbmw.com http://www.runescapegoldseller.com http://www.aiongoldshop.com http://vanguard-gold.virdeal.com/ http://12sky-gold.virdeal.com/ http://tibia-coin....
2007 Sep 18
1
Running EQ2 under Wine locks my system... anyone else?
...ht is stuck on - the only thing I can do is reboot. I'm running the latest GIT source compiled on my box running the latest Ubuntu Feisty with the latest drivers from ATI for my X1600. Other (linux native) 3D apps work fine, such as supertux cart etc. Can anyone else confirm this happens with EQ2? -- Chris
2011 Jun 21
1
Setting up list of many equations for systemfit
Dear List Members,I am trying to set up a large system of equations and I am trying to find a simple way to set up the list command under the package system fit. Here is the example from system fit and what I am trying to do: EQ1 <- Y1 ~ X1 + X2 + X4EQ2 <- Y2 ~ X2 + X3EQ3 <- Y3 ~ X2 + X3 + X4EQ4 <- Y4 ~ X1 + X3 + X4eqSystem <-list(form1 = EQ1, form2 = EQ2, form3 = EQ3, form4 = EQ4) #atempt 1 to "automate" above:eqSystem1 <-paste(paste("form", 1:4, sep=""), paste("EQ", 1:4,sep=""),sep...
2009 Apr 13
2
joint estimation of two poisson equations
...avoid doing that unless it's entirely necessary. I'll post my solution to the list when I've worked it out. Regards, ~Owen # CODE FOR "sur" OPTION rm(list = ls()) library(Zelig) y1 = c(1,2,3,4) y2 = c(0,2,0,2) x = c(2,3,4,8) d = data.frame(cbind(y1, y2, x)) eq1 = y1 ~ x eq2 = y2 ~ x eqSystem = list (eq1, eq2) system_out = zelig(formula = eqSystem, model = "sur", data = d) summary(system_out) ----------------------------------------------------------------- # ERROR FROM REPLACING "sur" WITH "poisson" Error in switch(mode(x), `NULL` = st...
2010 Sep 18
3
Microphone in EQ2 2 devices
Hi, I have following problem. In my Computer is an on board HDA Intel Sound Chip. This device has 5.1 out and an input connection for an microphone. My TFT Monitor has also a build in microphone with web Cam connected via USB. The big advantage is, I don't need an separate Microphone or Head Set. Both works fine under Suse Linux (Skype, or other applications that uses that microphone). But
2004 Nov 29
3
systemfit - SUR
Hello to everyone, I have 2 problems and would be very pleased if anyone can help me: 1) When I use the package "systemfit" for SUR regressions, I get two different variance-covariance matrices when I firstly do the SUR regression ("The covariance matrix of the residuals used for estimation") and secondly do the OLS regressions. In the manual for "systemfit" on page
2011 Jun 23
0
Loops, Paste, Apply? What is the best way to set up a list of many equations?
Is there a way to apply paste to?list(form1 = EQ1, form2 = EQ2, form3 = EQ3, form4 = EQ4)?such that I don't have to write form1=EQ1 for all my models?(I might have a list of 20 or more)? I also need the EQs to read the formulas associated with them. For example, below, I was able to automate the name assignment but I could not figure out how to?to set up...
2009 Jul 13
1
Games that installed before... now won't, what changed?
the games i'm dealing with are eq and eq2. both the same error so i'm thinking its a wine issue and not a game specific issue i'll list my error here as best possible, and note that i have found "fixes" to this problem but have no idea what anyone in those "fix" threads are talking about. just search my error #...
2012 Oct 17
1
extracting and restricting coefficients
HiĀ  I want to fit two equations simultaneously EQ1<-Y1~X1+X2 EQ2<-Y2~X1+X2 eqsystem<-list(Y1HAT=EQ1,Y2HAT=EQ2) fitols<-systemfit(eqsystem, method="OLS", data=BB) How do I get coefficients for the first equation? R code How do I restrict coefficient of X2 in the first equation (say , restrict it to less thanĀ  zero). R code Your help is appreci...
2017 Jun 11
1
Memory leak in nleqslv()
...that the solver does not appear to clean up memory used in previous iterations. I believe I've isolated the/my issue in a small sample of code: library(nleqslv) cons_ext_test <- function(x){ rows_x <- length(x)/2 x_1 <- x[1:rows_x] x_2 <- x[(rows_x+1):(rows_x*2)] eq1<- x_1-100 eq2<-x_2*10-40 return(c(eq1,eq2)) } model_test <- function() { reserves<-(c(0:200)/200)^(2)*2000 lambda <- numeric(NROW(reserves))+5 res_ext <- pmin((reserves*.5),5) x_test <- c(res_ext,lambda) #print(x_test) for(test_iter in c(1:1000)) nleqslv(x_test,cons_ext_test,jacobian=NULL)...
2007 Mar 28
0
nlsystemfit: Errors with reproducing the manual example
...called R_manuf and containing 3 columns named va98, ts98 and gom98) with the code library(systemfit) dati <- read.table("R_manuf",header=T,na.strings="nan") attach(dati) y1 <- va98/ts98 - 1; y2 <- gom98 - va98; eq1.formula <- y1.98 ~ a1*ts98^(b1-1) ; eq2.formula <- y2.98 ~ a2*ts98^b2 ; labels <- list("eq1", "eq2" ); start.values <- c(a1=-0.5, b1=1.02, a2=-0.8, b2=0.9 ); model <- list( eq1.formula, eq2.formula); model.ols <- nlsystemfit( "OLS", model, start.values, eqnlabels=labels ); print(model....
2011 Jun 28
2
How do I output all the R-squares of an SUR? summary(fitSUR$eq[[1:4]])$r.squared does not work
...,ncol=14, nrow=20)) ## generate variables names(YX) <-c(paste("Y", 1:4, sep=""), paste("X", 1:10, sep="")) ## assign variables' names library(systemfit) ## EQUATIONS: EQ1 <- Y1 ~ X1 + X2 + X4 + X7 + X10 ## equation 1 formula EQ2 <- Y2 ~ X2 + X3 + X5 + X8 + X10 ## equation 2 formula EQ3 <- Y3 ~ X5 + X6 + X7 + X9 ## equation 3 formula EQ4 <- Y4 ~ X1 + X3 + X4 + X6 + X9 ## equation 4 formula eqSystem <-list(form1 = EQ1, form2 = EQ2, form3 = EQ3, form4 = EQ4) fitSUR <- systemfit(eqSystem,...
2009 Apr 25
4
How do I use the developers version of Wine 1.1.20?
...t rebase origin to stay up to date. My question is how do I run programs with it? When I do the normal Code: wine setup.exe for example, it says that I don't have Wine installed. The reason I'm trying to do this is because the Wine in the repository won't even install Warhammer or EQ2 (for example), and the steps to install Wine manually get about as far as uncompressing the thing to my computer. lol I sure wish I knew what voodoo your clever Linux users were using to get this program to work right. I had thought I understood computers pretty well until I installed Jaunty Jackal...
2007 Oct 27
1
creating large graphs
...6 x 6 figure. Does anyone know how to make a large graph so that I can print it and view the details? I have tried changing the graph size and outputting the chart to an image of pdf file, but I keep getting an error: > jpeg(file="dendrogram.jpeg") > par(fin=c(20,20)) > plot(eq2) Error in plot.new() : figure region too large > dev.off() Please advise. Thanks, Jesse Lecy PhD Candidate in Social Science Syracuse University [[alternative HTML version deleted]]
2011 Oct 02
0
deSolve - Function daspk on DAE system - Error
...getting this error on the attached code and breaking my head but can't figure it out. Any help is much appreciated. Thanks, Vince CODE: library(deSolve) Res_DAE=function(t, y, dy, pars) { with(as.list(c(y, dy, pars)), { res1 = -dS -dES-k2*ES res2 = -dP + k2*ES eq1 = Eo-E -ES eq2 = So-S -ES -P return(list(c(res1, res2, eq1, eq2))) }) } pars <- c(Eo=0.02, So=0.02, k2=250, E=0.01); pars yini <- c(S=0.01, ES = 0.01, P=0.0, E=0.01); yini times <- seq(0, 0.01, by = 0.0001); times dyini = c(dS=0.0, dES=0.0, dP=0.0) ## Tabular output check of matrix output DAE <...
2011 Oct 03
0
deSolve - Function daspk on DAE system - Error (Vince)
...getting this error on the attached code and breaking my head but can't figure it out. Any help is much appreciated. Thanks, Vince CODE: library(deSolve) Res_DAE=function(t, y, dy, pars) { with(as.list(c(y, dy, pars)), { res1 = -dS -dES-k2*ES res2 = -dP + k2*ES eq1 = Eo-E -ES eq2 = So-S -ES -P return(list(c(res1, res2, eq1, eq2))) }) } pars <- c(Eo=0.02, So=0.02, k2=250, E=0.01); pars yini <- c(S=0.01, ES = 0.01, P=0.0, E=0.01); yini times <- seq(0, 0.01, by = 0.0001); times dyini = c(dS=0.0, dES=0.0, dP=0.0) ## Tabular output check of matrix output DAE <...
2002 Jul 31
0
Nonlinear Seemingly Unrelated Regression
Hello to everyone, I found some problems using R in the estimation of systems of nonlinear equations like SURE (Seemingly Unrelated Regression Equations) with mutual parameters as the following system example: EQ1 PQ1=P1*G1+B1*(Y-P1*G1-P2*G2-P3*G3) EQ2 PQ2=P2*G2+B2*(Y-P1*G1-P2*G2-P3*G3) where G1,G2,G3,B1,B2 are the coefficients to estimate. command "nls" accept only single equation nonlinear model formula and package "systemfit" doesn't allows any nonlinear estimation. Do you know a solution for this problem? Thanks...
2002 Aug 13
0
Non linear SUR estimation
...roject.org r-help at stat.math.ethz.ch Hello to everyone, I found some problems using R in the estimation of systems of nonlinear equations like SURE (Seemingly Unrelated Regression Equations) with mutual parameters as the following system example: EQ1 PQ1=P1*G1+B1*(Y-P1*G1-P2*G2-P3*G3) EQ2 PQ2=P2*G2+B2*(Y-P1*G1-P2*G2-P3*G3) where G1,G2,G3,B1,B2 are the coefficients to estimate. command "nls" accept only single equation nonlinear model formula and package "systemfit" doesn't allows any nonlinear estimation. Do you know a solution for this problem? Thanks...
2008 Nov 22
1
new to wine and ubuntu-installing programs
...Ubuntu has appealed to my nature as I do quite a bit of art programs on my pc. One program, Poser 7, seems that has been loaded and run in Ubuntu using Wine, but alas as I am new to this, I cannot figure out how to install this program for use. I also play a variety of MMORPG's including SWG, EQ2, and WoW. Any help in using this system and setting up these programs would be very helpful for someone wanting to ditch windows but still use programs that install easy on windows.
2009 Sep 12
1
point me in the right direction?
...lated. i've run into 2 programs that simply wont run? no error msg so i dont even know how to begin trying to fix it. the old game diablo will run the opening 2 credit scenes and then it simply shuts down. same with paretologic drivecure desktop. which i got from trying to download directx9 for eq2.