search for: testtyp

Displaying 20 results from an estimated 20 matches for "testtyp".

Did you mean: testtmp
2009 Sep 06
1
[LLVMdev] llc crash when a const struct includes a zero-length member
When I run llc on the (assembled version of) the following code on Linux x86: %testType = type {i32, [0 x i32], i32} define i32 @main() { %1 = alloca %testType store %testType {i32 1, [0 x i32] zeroinitializer, i32 2}, %testType* %1 ret i32 0 } llc crashes with a segmentation fault. It happens in the 2.5 release version and in the version I pulled from svn trunk about two h...
2013 May 05
0
[LLVMdev] llvm-c: Types of functions
...module, &msg); LLVMValueRef testFunc = LLVMGetNamedFunction(module, "test"); assert(testFunc); if (LLVMIsAFunction(testFunc)) printf("Is a Function\n"); // <-- I do see this message, so far so good else printf("Not a Func\n"); LLVMTypeRef testType; testType = LLVMTypeOf(testFunc); printf("Type is: %d\n", LLVMGetTypeKind(testType)); printf("For reference: Function: %d Pointer: %d\n", LLVMFunctionTypeKind, LLVMPointerTypeKind); if( LLVMIsFunctionVarArg(testType)) printf("is vaarg\n");...
2013 Mar 06
1
need help using read.fortran
...t;I1","16I2", "I1","I5","I1","I3","I2", "A4","3A1","A2","A1"), header = FALSE,skip=0,sep="@", col.names = paste(idno,empmo,empyr,birthmo,birthyr,sex,race,teno,testmo,testyr, testtyp,L500,L1k,L2k,L3k,L4k,L6k,L8k,RT1k,R500,R1k,R2k,R3k,R4k,R6k,R8k, HPD,dept,shift,TWA,envclas,jobcode,hobby.med.STS,audclas,disp), row.names = (idno) )) I also tried a separate dimnames statement like so: dimnames(AN35)[[2]] <- c("idno","empmo","empyr",&quot...
2009 Sep 26
1
mboost_1.1-3 blackboost_fit (PR#13972)
...: dt=expand.grid(y=c(2,3,4), x1=c(1,2), x2=c(1,2)) library(mboost) bd=boost_dpp(y ~ .,data=dt, weights = NULL) blackboost_fit(bd, tree_controls = ctree_control( teststat = "max", testtype = "Teststatistic", mincriterion = 0, maxdepth = 2 ), fitmem = ctree_memory( bd,...
2010 Jan 13
1
plotting moving range control chart
...C" (v. 1.0). The package "qAnalyst" (v. 0.6.0) provides an option to produce a moving range chart with individuals data. The example given in the qAnalyst manual for function spc yields an individuals chart: > #i-chart, moving range to estimate st. dev. is equal to 2 points with testType=1, > data(rawWeight) > ichart=spc(x=rawWeight$rawWeight, sg=2, type="i", name="weight", testType=1) > plot(ichart) > summary(ichart) Changing "type = 'i'" to "type = 'mr'" yields the moving chart: > mrchart = spc(x = rawWeigh...
2006 Jul 19
1
Updating a model from a checkbox (noob question)
...39;' it goes through fine, except it places the default value for the field of the combobox. Any suggestions? Here''s the model: class TestResult < ActiveRecord::Base has_one :status_index has_one :test_type has_one :product_area validates_presence_of :statusindex_id, :testtype_id, :productarea_id, :name end This generates the combobox (inside a view partial): <%= select("test_type", "id", TestType.find_all.collect {|tt| [tt.name, tt.id] }, { :include_blank => false}) %> Here''s the command in the controller''s ''up...
2010 Feb 03
0
mboost: how to implement cost-sensitive boosting family
...0, w) 1/(10+1) * log(10*p/1*(1 - p)) } CSAdaExp <- Family(ngradient = ngradient, loss = loss, offset = offset); model.blackboost <- blackboost(tr[,1:DIM], tr.y, family=CSAdaExp, weights=tr.w, control=boost_control(mstop=100, nu=0.1), tree_controls=ctree_control(teststat = "max",testtype = "Teststatistic",mincriterion = 0,maxdepth = 10)); or #loss <- function (y, f) #{ # exp(-y * f * ifelse(y==1,COST_FN,COST_FP)) #} #ngradient <- function (y, f, w = 1) #{ # y * ifelse(y==1,COST_FN,COST_FP) * exp(-y * f * ifelse(y==1,COST_FN,COST_FP)) #} #offset <- funct...
2007 Aug 21
1
Defined function and classes
Hi all I am using the defined function and it seems to work for resource types but fails with classes - I am setting a variable like so: $test = defined(Class[testing]) The test always returns false. Similarly defined functions for resource types like: $testtype = defined(File[test]) Return true. Is there something I am missing? Thanks James Turnbull _______________________________________________ Puppet-users mailing list Puppet-users@madstop.com https://mail.madstop.com/mailman/listinfo/puppet-users
2006 Sep 02
2
Cuzick's test for trend
Hi All: I was looking for, but could not locate in the packages, or in the R archive searches if there exists an R implementation of Cuzick's test of trend. The test is described as follows: An extension of the Wilcoxon rank-sum test is developed to handle the situation in which a variable is measured for individuals in three or more (ordered) groups and a non-parametric test for trend
2006 Mar 31
18
Modelling Foreign Keys
Can someone point me to a reference or tutorial that shows how to map foreign key relationships in the model? For example given: Users id name email Posts id user_id title How do I associate user_id with users.id in the Post and User models? has_many and belongs_to don''t seem to do it. -- Posted via http://www.ruby-forum.com/.
2008 Sep 25
0
varimp in party (or randomForest)
...sis <- subset(arabidopsis, complete.cases(arabidopsis)) arabidopsis <- subset(arabidopsis, is.na(arabidopsis$edit)==FALSE) arabidopsis <- arabidopsis[, !(names(arabidopsis) %in% c("X0", "loc"))] my_cforest_control <- cforest_control(teststat = "quad", testtype = "Univ", mincriterion = 0, ntree = 50, mtry = 3, replace = TRUE) my_cforest <- cforest(edit ~ ., data = arabidopsis, controls = my_cforest_control) varimp_cforest <- varimp(my_cforest) By the way, the same issue arises for the randomForest package. Do...
2009 Mar 13
0
ctree from Java via Rserve
..."); v.voidEval("try(pdf(\"C:\\Documents and Settings\\test4.pdf\"))"); v.voidEval("plot (ctree(ZF2~TKL_f+Regio_f+km1000+SF_f+Geschlecht_f+Alter_VN+Random, data=daten2, weights=daten2$Tage, controls=ctree_control(mincriterion=0.95,maxdepth=4,teststat=\"quad\",testtype=\"Bonferroni\")), type=\"simple\")"); //line 6 v.voidEval("dev.off()"); }catch(RserveException e){e.printStackTrace();} I get the error-message "voidEval failed" for the line 6! What can I do? Although I know it`s a Java question I hope somebody...
2010 Jul 27
1
Cforest mincriterion
Hi, Could anyone help me understand how the mincriterion threshold works in ctree and cforest of the party package? I've seen examples which state that to satisfy the p < 0.05 condition before splitting I should use mincriterion = 0.95 while the documentation suggests I should use mincriterion = qnorm(0.95) which would obviously feed the function a different value. Thanks in advance,
2012 Sep 13
0
cforest and cforest_unbiased for testing and training datasets
...sulting analysis will be applied to my specified testing dataset to assess misclassification and accuracy. I am aware that the options of cforest_unbiased do not allow allow the fraction value to be altered so my second question is is data.controls <- cforest_control(teststat = "quad", testtype = "Univ", replace = FALSE, ntree=2000, mtry=2, fraction=.99) the equivalent to data.controls <- cforest_unbiased(ntree=2000, mtry=2) except I have eliminated the default testing dataset? Thank you for your help -- View this message in context: http://r.789695.n4.nabble.com/cforest...
2012 Aug 23
0
party package: ctree - survival data - extracting statistics/predictors
...to know which variables can predict best a poor/good prognosis based on survival data. I am using function "ctree" from the "party" package. I came up with this command: test <- ctree(Surv(time, event)~., data =data.test, controls=ctree_control(teststat="max", testtype="Bonferroni", mincriterion=0.95,savesplitstats = TRUE), ytrafo = function(data)trafo(data, numeric_trafo = rank), xtrafo=function(data)trafo(data, surv_trafo=logrank_trafo(data, ties.method = "logrank")) ) which works well but as I am not a statistician it is quite confusing...
2007 Aug 20
1
Q: combine 2 data frames with missing values
Een ingesloten tekst met niet-gespecificeerde tekenset is van het bericht gescrubt ... Naam: niet beschikbaar Url: https://stat.ethz.ch/pipermail/r-help/attachments/20070820/920567a6/attachment.pl
2011 Mar 31
2
[LLVMdev] More DWARF problems
...his one down, it is apparently unrelated to the earlier problem. After fixing the problem with the subroutine context mentioned above, I now see the following in gdb: Die: DW_TAG_formal_parameter (abbrev = 27, offset = 14760) has children: FALSE attributes: DW_AT_name (DW_FORM_strp) string: "testType" DW_AT_decl_file (DW_FORM_data1) constant: 74 DW_AT_decl_line (DW_FORM_data1) constant: 47 DW_AT_type (DW_FORM_ref4) constant ref: 43711 (adjusted) DW_AT_location (DW_FORM_block1) block: size 2 Dwarf Error: Cannot find type of die [in module /Users/talin/Projects/tart/build-eclipse/test/std...
2011 Mar 30
0
[LLVMdev] More DWARF problems
On Mar 29, 2011, at 7:29 PM, Talin wrote: > I've been trying to track down the problem with the DWARF info that is being emitted by my front end, which has been broken for about a month now. Here's what happens when I attempt to use gdb to debug one of my programs on OS X: > > gdb stack crawl at point of internal error: > [ 0 ] /usr/libexec/gdb/gdb-i386-apple-darwin
2011 Mar 30
5
[LLVMdev] More DWARF problems
I've been trying to track down the problem with the DWARF info that is being emitted by my front end, which has been broken for about a month now. Here's what happens when I attempt to use gdb to debug one of my programs on OS X: gdb stack crawl at point of internal error: [ 0 ] /usr/libexec/gdb/gdb-i386-apple-darwin (align_down+0x0) [0x122300] [ 1 ] /usr/libexec/gdb/gdb-i386-apple-darwin
2007 Aug 21
2
Partial comparison in string vector
...If someone out there knows how to use sql, in R, i d be delited if he or she could explain it to me, more understandible then the manuals i find on the web. Here is what io would want sql to do . My data is in columns, one column holds all the case numbers, one the messured values, one all the testtypes and one the timeperiod and then one column for the lab's that preformed the test. is is stored in a txt file. So it is a long 5 column data table. Now is it possible to make a cross table holding the case nr's, and timeperiod in 2 column's, and then have a different column for ever...