search for: tf

Displaying 20 results from an estimated 525 matches for "tf".

Did you mean: utf
2003 Sep 22
1
Managing a list with a list
...n, a logical value set to T if it's alive, some parameters for growth, diameter, etc. The tree list has another list in it which is a new data type for me. I want to make a new list that retains all the live trees. That is where Living == T. Here's the summary of the list: > summary(tf) Length Class Mode id 10 -none- numeric x 10 -none- numeric y 10 -none- numeric A 10 -none- numeric NegB 10 -none- numeric K 10 -none- numeric Age 10 -none- numeric DBH 10 -none- numeric Living 10 -none- logical pSeed 1...
2007 Aug 22
3
Help with vector gymnastics
Hello, What is the best way of solving this problem? answer <- ifelse(tf=TRUE, i * 5, previous answer) where as an initial condition tf[1] <- TRUE For example if, tf <- c(T,F,F,F,T,T,F) over i = 1 to 7 then the output of the function will be answer = 5 5 5 5 25 30 30 Thank you. Phil,
2019 Jan 16
2
optimizacion costos
Estimado Jesús Para Fernández En teoría es ese material, lo vi muy rápido y en la parte genética tiene cosas que biológicamente no son así, hay un libro de Falconer, Introducción a la genética cuantitativa, que tiene escrita la parte matemática, hay un abismo entre la biología y los ingenieros que se inspiran en la biología. Yo pensaba en la resolución de un problema real, aunque relativamente
2006 Apr 28
2
entries that match a regexp
Hi all, I am trying to filter the element of a df that start with "TF", like this: alfa = c(123221,"TF13124",41243,"TF1234",32414,"TF13124","TF14333",2134123,"TF1234") beta = c("type_a","type_b","type_a","type_g","type_d","type_a","type_g",&qu...
2009 Oct 22
1
loop vs. apply(): strange behavior with data frame?
...,1,g,data.row)) } g <- function(row2,row1) { return(sum(abs(row1-row2))/length(row1)) } dist.apply <- function(data) { d <- apply(data,1,f,data) return(as.dist(d)) } ######## TESTING ####### library(mvtnorm) data <- rmvnorm(100,mean=seq(1,10),sigma=diag(1,nrow=10,ncol=10)) tf <- system.time(df <- dist.for(data)) ta <- system.time(da <- dist.apply(data)) print(paste('diff = ',sum(as.matrix(df) - as.matrix(da)))) print("tf = ") print(tf) print("ta = ") print(ta) print('----------------------------------') print('Same e...
2005 Nov 28
1
terms.object documentation bug? (PR#8353)
...read something like: specials: If the 'specials' argument was given to 'terms.formula' there is a 'specials' attribute, a list of vectors indicating the variables that contain these special functions. Here is some example code illustrating the problem: tf <- terms.formula(y~x+x:z+s(x),specials="s") ## make a `terms' object attr(tf,"specials") ## documented to index `s' in list of terms ## but in lists of terms, `s' is in position 2, not 4 .... attr(tf,"term.labels") colnames(attr(tf,"factors"))...
2005 Aug 03
1
abline and linearity over groups
...,30)), t = c(rep(0,10), rep(1,10), rep(2,10)) )) when I do: plot(test$l~test$t) abline(lm(test$l~test$t)) the abline is a straight line through the centre of the points of each of the groups. If, however, I factorise the groups (in order to do e.g. anova analysis) and then plot the data test$tF=factor(test$t) plot(test$l~test$tF) abline(lm(test$l~test$tF)) the abline is now shifted up and to the left of where I would expect the line to go (through the centre of the points of each of the groups). If there is a simple explanation, could someone tell me it? ------------------------...
2015 Feb 22
2
[LLVMdev] Resolving an opaque type in llvm-assembly
According to the Assembly language reference: "In LLVM, opaque types can eventually be resolved to any type (not just a structure type)." But the only way I can think of to do so is to give it a type name, then later redeclare the name. But that gives an error: %TO = type opaque %TF = type i32 ( %TO* ) %TO = type %TF gives: $ llvm-as types1.ll llvm-as: types1.ll:3:1: error: redefinition of type %TO = type %TF ^ Also, what is the set of things that can be done with an as-yet unresolved opaque type? -- Rodney Bates rodney.m.bates at acm.org
2009 Jun 23
3
subset POSIXct
Hi, I have a data frame with two columns: dt and tf. The dt column is datetime and the tf column is a temperature. dt tf 1 2009-06-20 00:53:00 73 2 2009-06-20 01:08:00 73 3 2009-06-20 01:44:00 72 4 2009-06-20 01:53:00 71 5 2009-06-20 02:07:00 72 ... I need a subset of the rows where the minutes are 53. The hour...
2010 Nov 15
1
Aggregate on identical link attributes
...ata..<-data.frame(TNode=TNode,FNode=FNode,Volume=Volume,ClassCode=ClassCode) #Create list to store results LinkSum_<-list() #Create vecotrs to establish loops TNodes<-unique(EmmeData..$TNode) FNodes<-unique(EmmeData..$FNode) for(tn in TNodes){ for(fn in FNodes){ TF<-EmmeData..[EmmeData..$TNode==tn & EmmeData..$FNode==fn,] FT<-EmmeData..[EmmeData..$TNode==fn & EmmeData..$FNode==tn,] if(length(TF$TNode)>0){ LinkSum_[[tn]]<-list(ID=list(c(TF$TNode,TF$FNode)),ClassCode=TF$ClassCode,TotalVolume=TF$Volume+FT$Vo...
2020 Apr 29
2
[Posible SPAM] Re: Stopwords: Topic modelling con LDA
Hola, Acabo de calcular tf-idf y me surge una duda. ¿Habría un valor de idf o tf-idf que se considerara como umbral para establecer que una palabra es muy común o no? Los valores de idf en mis datos van entre 0 y 3.78 y los de tf-idf ente 0 y 0.07. Un saludo El Mar, 28 de Abril de 2020, 12:53, Carlos Ortega escribió: >...
2009 Nov 17
2
Just what is puppet doing here?
What is puppet doing here? Nov 17 00:02:01 gumby yum: Installed: tf-starterkit-tfel0-1.0-1.tf.noarch Nov 17 00:02:01 gumby puppetd[720]: (//Node[gumby.fr.xxx.com]/Starterkit::Setup[tfel0]/Package[tf-starterkit-tfel0]/ensure) created Nov 17 00:02:07 gumby yum: Installed: tf-jboss-server-4.2.3.GA-1.tf.noarch Nov 17 00:02:07 gumby puppetd[720]: (//Node[app_node]/jboss...
2008 Mar 13
3
fast way to compare two matrices of combinations
...sible triplets and their frequency within gene elements. Using combn and a lot of looping, I am accomplishing this but it is VERY slow. I've tried to figure out a way to vectorize this, using "match" and "%in%", but can't get my mind around it. Below is my code. sig.tf.pairs is the list. Suggestions? Mark ############################################################ M <- 3 # 3 for triplets, etc. ########################################################## # count all triplets all.triplets <- NULL all.count.vec <- NULL for (i in 1:length(sig.tf.pairs)){...
2013 Jan 09
1
deparse substitute
Hi, I'm writing a function that needs the input names (as characterstrings) as part of the output. With deparse(substitute( ) ) that works fine, until I replace all zeros with 0.001 (log is calculated at some time): tf <- function(input) { input[input==0] <- 0.001 ; deparse(substitute(input)) } myguess <- 42 tf(myguess) # not "myguess", but "42" Now when I extract the input names before replacing the zeros, this works: tf <- function(input) { out <- deparse(substitute(i...
2018 May 01
2
possible internal (un)tar bug
This is a not too old R-devel on Linux, it already fails in R 3.4.4, and on macOS as well. The tar file seems valid, external tar can untar it, so maybe an untar() bug. setwd(tempdir()) dir.create("pkg") cat("foobar\n", file = file.path("pkg", "NAMESPACE")) cat("this: that\n", file = file.path("pkg", "DESCRIPTION"))
2017 Feb 07
3
[cfe-dev] lli: LLVM ERROR: Cannot select: X86ISD::WrapperRIP TargetGlobalTLSAddress:i64
...can be reproduced by this simple program: > > thread_local int x = 0; > int main() { > return 0; > } > >When compiled into IR it produces similar error: > >LLVM ERROR: Cannot select: t19: i64 = X86ISD::WrapperRIP TargetGlobalTLSAddress:i64<i32* @x> 0 [TF=19] > t18: i64 = TargetGlobalTLSAddress<i32* @x> 0 [TF=19] >In function: _ZTW1x interestingly this works on my machine. llvm-ir attached 2017-02-07 15:31 GMT+00:00 Alex Denisov <1101.debian at gmail.com>: > I’ve seen the same problem, but didn’t find solution back then....
2016 Jul 27
2
Model object, when generated in a function, saves entire environment when saved
Another solution is to only save the parts of the model object that interest you. As long as they don't include the formula (which is what drags along the environment it was created in), you will save space. E.g., tfun2 <- function(subset) { junk <- 1:1e6 list(subset=subset, lm(Sepal.Length ~ Sepal.Width, data=iris, subset=subset)$coef) } saveSize(tfun2(1:4)) #[1] 152 Bill Dunlap TIBCO Software wdunlap tibco.com On Wed, Jul 27, 2016 at 11:19 AM, William Dunlap <wdunlap at tibco.com> wrote...
2020 Jan 29
2
Model object, when generated in a function, saves entire environment when saved
...through the release notes for the last few years (Ctrl-F-ing "environment") and couldn't see it. Many thanks for any help and best wishes to all. The following code uses R 3.6.2 and requires you to run install.packages("qs") first: save_size_qs <- function (object) { tf <- tempfile(fileext = ".qs") on.exit(unlink(tf)) qs::qsave(object, file = tf) file.size(tf) } save_size_rds <- function (object) { tf <- tempfile(fileext = ".rds") on.exit(unlink(tf)) saveRDS(object, file = tf) file.size(tf) } normal_lm <- function(){...
2018 May 01
1
possible internal (un)tar bug
...in the example), you can currently do that easily when you ensure the connection is a "gzcon" one : ##=========> Workaround for now: ## Create : setwd(tempdir()) ; dir.create("pkg") cat("this: that\n", file = file.path("pkg", "DESCRIPTION")) tf <- "pkg_1.0.tar.gz" tar(tf, "pkg", compression = "gzip", tar = "internal") unlink("pkg", recursive = TRUE) ## As it is a compressed tar file, use it via a gzcon() connection, ## and both cases work fine: con <- gzcon(file(tf, open = "rb&...
2013 Jul 09
1
set the eflags.tf of VM
hi,all has anyone set the eflags.TF of vm? I want to introdeuce a VM into single-step by setting the eflags.TF of vm, then I disassemble the bytes at RIP to figure out what''s going on . I have set the trap flag ,but I didn''t achieve what I want. First, I only get hlt,mov, rdtsc, clts, in, out . Second, the...