Displaying 20 results from an estimated 700 matches similar to: "Need help with difficulty loading page www.bioconductor.org"
2005 Aug 07
1
Invalid Page fault in R.dll in mouse click (PR#8055)
Full_Name: Debashis Dutta
Version: 2.1.0
OS: Windows98
Submission from: (NULL) (59.93.160.194)
Working workinf when I mouse click in the top panel, in mist of the cases I
receive message invalid page fault in R.dll.I have reinstalled the R 2.1.0
several times, but the bu persists.Please advise me how to rectify the same.
2010 Feb 19
3
dot-dot-dot as an actual argument
I could not find any documentation of how dot-dot-dot works when used
as an argument in a function call (rather than as a formal argument in
a definition). I would appreciate some references to the rules
governing situations like:
f1<-function(x,y,...){
? print(x)
}
f2<-function(...){
? f1(...)
}
f2(1,2,3)
In the call above how are the three numbers bound to the individual
formal
2005 Jun 07
3
Icecast RTP support
Hi,
Does Icecast has RTP support for streaming OGG/Vorbis and OGG/theora
media files?
If so, then please give me some pointers on how to configure my
Icecast server to listen to RTP requests.
If it's not available, then is the inclusion of this feature, in plans
for future release of the product?
Thanks
--
Subhabrata Bhattacharya
2010 Feb 14
1
unexpected results with higher-order functions and lapply
I want to use lapply and a function returning a function in order to build a
list of functions.
> genr1 <- function(k) {function() {k}}
> l1 <- lapply(1:2,genr1)
> l1[[1]]()
[1] 2
This was unexpected. I had expected the answer to be 1, since that is the
value k should be bound to when genr1 is applied to the first element of
1:2.
By itself genr1 seems to work fine.
>
2012 Mar 23
2
R Error : DATA to MATRIX
Dear Sir/Madam,
I'm getting a problem with a R-code which converts a data frame to a matrix.
It first generate a (m^(n-m) * m) matrix A and then regenerate another
matrix B having less dimension than A which satisfy some condition. Now I
wish to assign each row of B to a vector as individual.
My problem is when I set any choice of (n,m) except m=1 it works fine but
setting m=1 I got the
2012 Jun 01
1
R Error : Error in vector("list", gamma(n + 1)) : vector size specified is too large
Dear R-listers,
I am giving part of my R code :
###########################################################
n=15
m=1
library("partitions")
library("gregmisc")
library("combinat")
x = t(restrictedparts(n-m,m))
l = length(x[,1])
for(u in 1:l){
A= unique(matrix( unlist(permn(x[u,])), ncol=m, byrow=TRUE ))
}
2005 Jun 16
2
Icecast and ezstream
Hi,
What is the actual functionality of ezstream when I use it with
Icecast?What does it exactly do?
Why isn't Icecast written to read a file directly and stream it?
--
~$ubh
2011 Dec 11
3
Bioconductor. MA plot for qPCR array
Dear all,
Is there anyway too generate MA plot for 2 qPCR assays (an array of 2x 400).
--
View this message in context: http://r.789695.n4.nabble.com/Bioconductor-MA-plot-for-qPCR-array-tp4182805p4182805.html
Sent from the R help mailing list archive at Nabble.com.
2008 Dec 01
1
[BioC] Rcurl 0.8-1 update for bioconductor 2.7
Hi Patrick,
Greetings from !(sunny) Pittsburgh.
What's the scoop on RCurl on windows (XP)?
I've tried to install RCurl_0.92-0.zip and RCurl_0.9-3.zip,
with both R 2.7.2 and R 2.8.0 from the RGUI (utils:::menuInstallLocal),
and get the error
"Windows binary packages in zipfiles are not supported".
which (according to google's one and only hit) comes from a perl script.
2006 Mar 01
1
Scheduler Parameters
Hi,
I have a naive question with the xen BVT scheduler.
Supposing I have only one guest domain runnning on domain 0 and with
the xm bvt command I have allocated cpu units in the ratio 9:1 to
domain 0 and domain 1(say) respectively.
Now I create another guest domain. How much CPU share it (or
subsequent domains created after it) will get?
~$ubh
_______________________________________________
2011 Oct 24
0
Problem with calling an user defined R function from Java
Dear All,
I am facing a problem in calling an user defined R function from Java
through JRI. The user defined R function does a loess normalization on micro
array data ( find in the limma package of BioConductor) and the last 2 lines
of the R Code is :
MA <- normalizeWithinArrays(RG, method="loess")
return(MA$A) # where MA$A is the column A of MA.
Now while calling it in Java, I
2005 Jun 27
0
Xen installation from source
Hi,
I am facing the following problems while installing xen from its
source.Ihave compiled
linux-2.6.11.10 with the option ARCH=xen.I had been fiddling with the
various configuration to boot up the kernel but its not working anyway.
When I compiled the kernel with the following option as built-in
[*] Root file system on NFS
I get the following error:
Root-NFS: No NFS server available, giving
2005 Jun 07
0
Icecast RTP support
On 6/7/05, Subhabrata Bhattacharya <subh.arya@gmail.com> wrote:
> Hi,
>
> Does Icecast has RTP support for streaming OGG/Vorbis and OGG/theora
> media files?
Not in the current version. It may be added in the relatively distant
future, but there's nobody workingon it at the moment.
Mike
2008 Feb 07
0
Help w/ density() usage
Dear All,
(this msg is a statistics/computing question to the list)
I'm trying to implement a modern-version of a (classic) "several-step protocol" in Fishery Biology (due to Bhattacharya, 1967): analysis of length-frequency distribution of fish larvae to id cohorts and later estimate growh rates!
I've trouble with the 1st step: using kernel density estimation (KDE) function
2016 Nov 16
0
Announcing new package horseshoe
Dear R users,
The first version of the package ?horseshoe' is now available on CRAN. It contains various functions for implementing the horseshoe prior for sparse linear regression, and faster versions for the special case of the normal means problem.
The functions output, among other things, the horseshoe estimator (posterior mean), credible intervals, and there is a function to perform
2016 Nov 16
0
Announcing new package horseshoe
Dear R users,
The first version of the package ?horseshoe' is now available on CRAN. It contains various functions for implementing the horseshoe prior for sparse linear regression, and faster versions for the special case of the normal means problem.
The functions output, among other things, the horseshoe estimator (posterior mean), credible intervals, and there is a function to perform
2010 Mar 10
1
Trouble with plm in Ubuntu 9
Hello,
Apologies in advance if this is a stupid question. I am running R on Ubuntu
9.
R version 2.9.2 (2009-08-24)
I am trying to work with plm. I think the library is installed, as I can do
> library(plm)
Loading required package: kinship
Loading required package: survival
Loading required package: splines
Loading required package: nlme
Loading required package: lattice
[1] "kinship
2011 Oct 20
1
R code Error : Hybrid Censored Weibull Distribution
Dear Sir/madam,
I'm getting a problem with a R-code which calculate Fisher Information
Matrix for Hybrid Censored Weibull Distribution. My problem is that:
when I take weibull(scale=1,shape=2) { i.e shape>1} I got my desired
result but when I take weibull(scale=1,shape=0.5) { i.e shape<1} it gives
error : Error in integrate(int2, lower = 0, upper = t) : the integral is
probably
2007 Jan 15
0
Advanced course R programming and Bioconductor in Cambridge UK 30.3.+1.4.
Dear R users & developers,
Seth Falcon and Martin Morgan are teaching
Advanced R Programming and Bioconductor 30 March - 1 April 2007 at the
Wellcome Trust Genome Campus, Hinxton, Cambridge, UK.
This two-day course focuses on programming skills required to develop
software for statistical analysis of high-throughput genomic data using
R and Bioconductor. Lectures and practical sessions
2005 Jan 27
1
Help with R and Bioconductor
Hi,
I am new to using R and Bioconductor. My first attempt at installing R
seemed successful. Then while attempting to getBioC() I had to force
quit the R application since I had to attend to something else
urgently. When i returned and tried to getBioC, I am getting errors
indicating that there is a lock on some files. So i would like to
uninstall/remove all R components and Bioconductor