similar to: floodfill with matrix data

Displaying 20 results from an estimated 110 matches similar to: "floodfill with matrix data"

2001 Jan 08
0
patent on 3D floodfill?
http://www.delphion.com/details?&pn=US04751643__&s_clms=1#clms This patent was referred to in conjunction with marching cubes in the comp.graphics.algorithms. Looking at claim 1, it seems like they patented a 3D version of a floodfill. Silly? Obvious? Lourens --- >8 ---- List archives: http://www.xiph.org/archives/ Ogg project homepage: http://www.xiph.org/ogg/ To unsubscribe from
2018 Feb 12
2
[PATCH]Add address overflow check
On 09 February 2018 15:56 Jean-Marc Valin wrote: > Pointers are unsigned so this shouldn't be an issue. I suspect you're > being hit by something else. That or your compiler is really broken. I don't know how important it is in this case (probably pretty minor) but in general Ruikai's right. It doesn't matter that pointers are unsigned; that fact that a pointer could
2011 Jul 19
2
strang behaviour of mice package
I am using mice package for multiple imputation. For one data (attached), mice doesn't impute all missing values. Specifically, some variables were not imputed at all. the reproducible code library(mice) test.df<-read.table(c:\\test.txt',header=T,sep=',') mi<-mice(test.df,maxit=10,m=5) sum(is.na(complete(mi,1))) >129 and x41, x50... were not imputed at all. Any
2011 Apr 08
3
a strange behavior with ifelse
I have used R for years but run into a seemingly simple problem involving 'ifelse'. condensed code like this a=c(2,NA,NA,NA,2,2,NA,2,NA,2) b=c(NA,1,1,NA,2,2,2,2,2,2) #I want to combined a and b into c so that c would be a valid number either a or b is not missing c=ifelse(a==1|b==1,1,ifelse(a==2|b==2,2,NA)) cbind(a,b,c) a b c [1,] 2 NA NA [2,] NA 1 1 [3,] NA 1 1
2007 Mar 29
0
[929] branches/wxruby2/wxwidgets_282/swig/classes: Fix virtual methods that shouldn''t be (Bug 9682); Add missing methods and
<!DOCTYPE html PUBLIC "-//W3C//DTD XHTML 1.1//EN" "http://www.w3.org/TR/xhtml11/DTD/xhtml11.dtd"> <html xmlns="http://www.w3.org/1999/xhtml"> <head><meta http-equiv="content-type" content="text/html; charset=utf-8" /><style type="text/css"><!-- #msg dl { border: 1px #006 solid; background: #369; padding:
2006 Oct 02
2
R function to compute kappa statistics for two vector
Dear R-user, Did anybody know how to calculate the kappa statistics of two vectors for the agreement? for example: a<-c(0,1,0,0,1,0) b<-c(0,1,1,0,0,1) I know the percent of agreement is 3/6, but how to get the kappa? [[alternative HTML version deleted]]
2007 Jan 04
1
Parameter changes and segfault when calling C code through .Call
I am experiencing some odd behavior with the .Call interface, and I am hoping someone out there can help me with it. Below is a simple example (in that there are R packages that do exactly what I want), but this code illustrates the problem. Thanks in advance for any help you can provide. Suppose I want to compute the log density of a multivariate normal distribution using C code and the gsl
2007 Mar 27
0
[922] branches/wxruby2/wxwidgets_282: Changes, additions and deprecations 2.6 -> 2.8 Wx API
<!DOCTYPE html PUBLIC "-//W3C//DTD XHTML 1.1//EN" "http://www.w3.org/TR/xhtml11/DTD/xhtml11.dtd"> <html xmlns="http://www.w3.org/1999/xhtml"> <head><meta http-equiv="content-type" content="text/html; charset=utf-8" /><style type="text/css"><!-- #msg dl { border: 1px #006 solid; background: #369; padding:
2009 Oct 22
1
S4 object??
Hi all,   I have loaded the LIMMA and Biobase package and tried these commands:   library(limma) library("Biobase") data <- read.table("c:/temp/data.txt",header=T,row.names=1) ExpressionData <- as.matrix(data[,c(2,3,4,6,7,8)]) eset <- new("ExpressionSet", exprs = ExpressionData) design <- cbind(WT=1,P=c(0,1,1,0,1,1),G=c(0,1,0,0,1,0)) fit <-
2003 Jul 22
2
animal models and lme
Hi, You should look at Pinheiro and Bates (2000) Mixed-effects models in S and S-Plus. It describes how to format the correlation matrix to pass to functions lme and gls. Basically, the correlation matrix has to be one of the corStruct classes, probably corSymm for your example. So in the call to lme (or gls if you really have no random effects), use something like:
2003 Sep 27
1
A re-sampling problem
I plan on analyzing some bird point count data. I need to develop a re-sampling regime for data like this. I used scan(file="Sample.txt",what=list(0,0,0,0,0,0),sep="\t") [[1]] [1] 1 2 3 4 5 [[2]] [1] 6 7 8 9 NA [[3]] [1] 10 11 12 13 NA [[4]] [1] 14 15 16 NA NA [[5]] [1] 17 18 19 20 21 Each row represents one site and the numbers (1-21) are visits to that site.
2006 Jul 05
0
package simecol uploaded to CRAN
Dear useRs, a new and completely re-worked version of the "simecol" package SIMulatiion of ECOLogical (and other) dynamic systems is now available on CRAN. Compared to the S3 based 0.2-x versions an improved object model using S4 classes was employed. Please ask me for assistance in case of incompatibility. Comments are welcome, Thomas Petzoldt
2006 Jul 05
0
package simecol uploaded to CRAN
Dear useRs, a new and completely re-worked version of the "simecol" package SIMulatiion of ECOLogical (and other) dynamic systems is now available on CRAN. Compared to the S3 based 0.2-x versions an improved object model using S4 classes was employed. Please ask me for assistance in case of incompatibility. Comments are welcome, Thomas Petzoldt
2011 Mar 26
1
Exporting columns into multiple files - loop query
Hi, I'm using a loop to extract 2 columns from an array into multiple files. I can use the following to export 3 files, containing column 'ID' with one of the three event columns. > ID<-c("A","B","C","D","E","F") > event1<-c(0,1,0,0,1,0) > event2<-c(1,1,0,1,0,0) > event3<-c(1,0,1,0,1,0) >
2012 Feb 28
1
Error in solve.default(res$hessian * n.used) :Lapack routine dgesv: system is exactly singular
Hi there! I´m a noob when it comes to R and I´m using it to run statisc analysis. With the code for ARIMA below I´m getting this error: Error in solve.default(res$hessian * n.used) :Lapack routine dgesv: system is exactly singular The code is: > s.ts <- ts(x[,7], start = 2004, fre=12) > get.best.arima <- function (x.ts, maxord=c(1,1,1,1,1,1)) + { + best.aic <- 1e8 + n <-
2009 Jun 03
1
Using constrOptim() function
I have a function myFunction(beta,x) where beta is a vector of coefficients and x is a data frame (think of it as a matrix). I want to optimize the function myFunction() by ONLY changing beta, i.e. x stays constant, with 4 constraints. I have the following code (with a separate source file for the function): rm(list=ls()) source('mySourceFile')
2006 Dec 08
1
MAXIMIZATION WITH CONSTRAINTS
Dear R users, I?m a graduate students and in my master thesis I must obtain the values of the parameters x_i which maximize this Multinomial log?likelihood function log(n!)-sum_{i=1]^4 log(n_i!)+sum_ {i=1}^4 n_i log(x_i) under the following constraints: a) sum_i x_i=1, x_i>=0, b) x_1<=x_2+x_3+x_4 c)x_2<=x_3+x_4 I have been using the ?ConstrOptim? R-function with the instructions
2002 Jan 25
0
Simplex difficulties
I'm exploring the simplex algorithm with a simple transportation problem of the form: minimize: 8a + 6b + 10c + 9d + 5e + 7f subject to the constraints: a + b + c = 11 d + e + f = 14 a + d = 10 b + e = 8 c + f = 7 I've implemented this in R (1.4.0 (2001-12-19), SunOS 5.7) as: require(boot) costs = c(8,6,10,9,5,7) constraints = c( 1,1,1,0,0,0, 0,0,0,1,1,1, 1,0,0,1,0,0,
2010 Aug 11
0
R and TK Error "can't find objects"
Dear R People, I?m trying to link R and TK. I?m using R 2.11.1 with Tinn-R 1.17.2.4. For simple examples like the following one it?s working (see the initiation of the variables, the handler and the link to the function which multiply Zahl, Exponent and Factor) : require(tcltk) Ergebnis<-tclVar(c(0,0,0,0,0,0)) Zahl<-tclVar(c(0,0,1,1,1,0)) Exponent<-tclVar(c(1,1,1,1,1,1))
2013 Feb 02
1
Why replacement has length zero? And How can I fix it?
Hi for the loop section runif needs curved brackets Try IAP <-NA for (i in 1:Sample.Size){ if (DataSet$SES[i]>0) { IAP[i] <- ifelse(runif(1)>0.75, 1, 0) # High SES, higher chance to be in Treatment # } else { IAP[i] <- ifelse(runif(1)<=0.25, 1, 0) # Low SES, lower chance to be in Treatment # } } # End loop # IAP IAP zjiaqi19880219 wrote > Hi,