Displaying 20 results from an estimated 815 matches for "np".
2002 Mar 25
2
Extreme value distributions (Long.)
...dResources: font Helvetica
%%+ font Helvetica-Bold
%%+ font Helvetica-Oblique
%%+ font Helvetica-BoldOblique
%%+ font Symbol
%%DocumentMedia: a4 595 841 0 () ()
%%Title: R Graphics Output
%%Creator: R Software
%%Pages: (atend)
%%Orientation: Portrait
%%BoundingBox: 18 61 577 781
%%EndComments
%%BeginProlog
/bp { gs gs } def
% begin .ps.prolog
/gs { gsave } def
/gr { grestore } def
/ep { showpage gr gr } def
/m { moveto } def
/l { lineto } def
/np { newpath } def
/cp { closepath } def
/f { fill } def
/o { stroke } def
/c { newpath 0 360 arc } def
/r { 3 index 3 index moveto 1 in...
2009 Jul 16
1
Compilation error
Hi all
I'm trying to install asteris 1.4.22.1 on Solaris 10...the server is V120
SUN spark...During compilation (gmake) I got the following error
/vis.c -o np/vis.o_a
np/vis.c: In function `svis':
np/vis.c:205: error: `u_int32_t' undeclared (first use in this function)
np/vis.c:205: error: (Each undeclared identifier is reported only once
np/vis.c:205: error: for each function it appears in.)
np/vis.c:205: error: syntax error before "u_char&...
2012 Nov 06
1
Filling matrix elements with a function
...on certain conditions as
defined in the function.
Here is the code:
WET<-function(t) {everglades$precipitation[t]} #simply reads
precipitation data from a csv, value is numeric
AB<-function(WET,t) {ifelse(WET(t)>0, 0.0001, 0)}
BC<-function(WET,t) {ifelse(WET(t)>0, 0.0001, 0)}
NP<-4
m1 <- matrix(0, NP,NP)
m2 <- matrix(0,NP,NP)
m3 <- matrix(0,NP,NP)
for (i in 1:NP)
{
for (j in 1:NP)
{
if ((i%%sqrt(NP)) == 0 & i!=j)
{
if(j == i+sqrt(NP) | j == i-1 | j == i-sqrt(NP))
{
m1[j,i] <- AB
m1[i,j] <- AB
m2[j,i...
2007 Oct 03
0
[PATCH 6/6] Network acceleration improvements
.../*
+ * Remove the hooks from a single vif state.
+ */
+static void
+accelerator_remove_single_hook(struct netfront_accelerator *accelerator,
+ struct netfront_accel_vif_state *vif_state)
+{
+ /* Make sure there are no data path operations going on */
+ netif_poll_disable(vif_state->np->netdev);
+ netif_tx_lock_bh(vif_state->np->netdev);
+
+ /*
+ * Remove the hooks, but leave the vif_state on the
+ * accelerator''s list as that signifies this vif is
+ * interested in using that accelerator if it becomes
+ * available again
+ */
+ vif_state->hooks = NULL;...
2008 Dec 05
3
MIGRATE SHARES always fails
...permissions for the share:
DATA_SHARE
The <admin> account is in the "Domain Admins" group, and has full
rights through the group according to "rights list"
(SeMachineAccountPrivilege, SeTakeOwnershipPrivilege,
SeBackupPrivilege, SeRestorePrivilege, SeRemoteShutdownPrivilege,
SePrintOperatorPrivilege, SeAddUsersPrivilege, SeDiskOperatorPrivilege)
on the Samba a box. It also has full access to the whole share on the
Win server. The destination share exists and the "Domain Admins" group
has write access.
Any idea what goes wrong here, and how...
2015 Jan 12
3
[LLVMdev] NP-hard problems in the LLVM optimizer?
Hi all.
I’ve heard a couple of times that some of the problems solved by various
passes in the optimizer are indeed NP-hard, even though the instances
are small enough to be tractable (and very quickly).
Is this true? If so, which are these problems?
Register allocation? Instruction scheduling?
Are they solved exactly or by approximations?
Or not solved at all (the need of solving them is avoided in some way)?...
2012 Jan 08
0
Adding a migration element to a deterministic spatial model
...y success. I need help figuring out
why m#[i,j] consistently returns a 0 value (or at least appears to)
despite the code instructing R to return different values under set
circumstances.
thanks for any help you are able to give,
yours sincerely,
Aimee
with(as.list(c(y,p)),
{
dydt <- rep(0,NP*16)
# Initialize m1,m2,m3
m1 <- matrix(0,NP,NP)
m2 <- matrix(0,NP,NP)
m3 <- matrix(0,NP,NP)
# Only nearest neighbors have nonzero travel rates between each other
for (i in 1:NP)
{
for (j in 1:NP)
{
if ((i%%sqrt(NP)) == 0 & i!=j)
{
if (j == i+sq...
2009 Jul 30
4
truncating values into separate categories
Hi all,
Simple question which i thought i had the answer but it isnt so simple for
some reason. I am sure someone can easily help. I would like to categorize
the values in NP into 1 of the five values in "Per", with the last
category("4") representing values >=4(hence 4:max(NP)). The problem is that
R is reading max(NP) as multiple values instead of range so the lengths of
the labels and the breaks are not matching. Suggestions?
Per <- c(&qu...
2003 Jul 31
2
how as.numeric() !-> factor
Dear all,
I have divided two vectors:
Np.occup97.98<- as.data.frame(cbind(site = levels(sums$site),
Np.occup97.98 = sums$Ant.Nptrad97.98/Ant.trad$Ant.trad97.98))
> Np.occup97.98
site Np.occup97.98
1 erken97 0.342592592592593
2 erken98 0.333333333333333
3 rormyran 0.48471615720524
4 valkror 0.286026200873362...
2012 Jan 12
9
Re: [PATCH] add netconsole support for xen-netfront
...+ unsigned long flags;
>
> frags += DIV_ROUND_UP(offset + len, PAGE_SIZE);
> if (unlikely(frags > MAX_SKB_FRAGS + 1)) {
> @@ -498,12 +499,12 @@ static int xennet_start_xmit(struct sk_buff *skb, struct net_device *dev)
> goto drop;
> }
>
> - spin_lock_irq(&np->tx_lock);
> + spin_lock_irqsave(&np->tx_lock, flags);
>
> if (unlikely(!netif_carrier_ok(dev) ||
> (frags > 1 && !xennet_can_sg(dev)) ||
> netif_needs_gso(skb, netif_skb_features(skb)))) {
> - spin_unlock_irq(&np->tx_lock);
> +...
2006 Nov 05
1
diag()<- in Matrix?
Dear all,
I am trying to use the Matrix package to do some calculations on rather
large and sparse matrices. An example of such a matrix is given below.
mig<-0.2
side<-10
np<-side^2
mig.mat<-matrix(0,np,np)
diag(mig.mat[1:(np-side),(side+1):np])<-mig/4
diag(mig.mat[(side+1):np,1:(np-side)])<-mig/4
diag(mig.mat[-np,-1])<-mig/4
nomig<-which(1:(side^2-1)%%side==0)
diag(mig.mat[-np,-1])[nomig]<-0
diag(mig.mat[-1,-np])<-mig/4
diag(mig...
2008 Feb 04
1
strftime fails on POSIXct objects (PR#10695)
...t; strftime
function (x, format = "", usetz = FALSE, ...)
{
if (!inherits(x, "POSIXlt"))
stop("wrong class")
if (format == "") {
times <- unlist(unclass(x)[1:3])
secs <- x$sec
secs <- secs[!is.na(secs)]
np <- getOption("digits.secs")
if (is.null(np))
np <- 0
else np <- min(6, np)
if (np >= 1) {
for (i in (1:np) - 1) if (all(abs(secs - round(secs,
i)) < 1e-06)) {
np <- i
break...
2013 Apr 24
1
Floating point precision causing undesireable behaviour when printing as.POSIXlt times with microseconds?
...:
[1] "1970-01-01 01:00:01.000002 BST"
[1] "1970-01-01 01:00:01.999998 BST"
[1] "1970-01-01 01:00:01 BST"
If options( digits.secs = 6 ) should I not expect to be able to print 1.999999 seconds? This seems to be caused by the following code fragment in format.POSIXlt:
np <- getOption("digits.secs")
if (is.null(np))
np <- 0L
else np <- min(6L, np)
if (np >= 1L)
for (i in seq_len(np) - 1L) if (all(abs(secs - round(secs,
i)) < 1e-06)) {
np <- i
b...
2013 May 21
1
[PATCH net-next V2 2/2] xen-netfront: split event channels support for Xen frontend driver
...+ /* Only used when split event channels support is enabled */
+ char tx_irq_name[IFNAMSIZ+4]; /* DEVNAME-tx */
+ char rx_irq_name[IFNAMSIZ+4]; /* DEVNAME-rx */
+
struct xenbus_device *xbdev;
spinlock_t tx_lock;
@@ -330,7 +338,7 @@ no_skb:
push:
RING_PUSH_REQUESTS_AND_CHECK_NOTIFY(&np->rx, notify);
if (notify)
- notify_remote_via_irq(np->netdev->irq);
+ notify_remote_via_irq(np->rx_irq);
}
static int xennet_open(struct net_device *dev)
@@ -623,7 +631,7 @@ static int xennet_start_xmit(struct sk_buff *skb, struct net_device *dev)
RING_PUSH_REQUESTS_AND_CHEC...
2011 Mar 31
3
[PATCH RESEND] net: convert xen-netfront to hw_features
...= xennet_set_features,
};
static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev)
@@ -1209,7 +1211,9 @@ static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev
netdev->netdev_ops = &xennet_netdev_ops;
netif_napi_add(netdev, &np->napi, xennet_poll, 64);
- netdev->features = NETIF_F_IP_CSUM;
+ netdev->features = NETIF_F_IP_CSUM | NETIF_F_RXCSUM |
+ NETIF_F_GSO_ROBUST;
+ netdev->hw_features = NETIF_F_IP_CSUM | NETIF_F_SG | NETIF_F_TSO;
SET_ETHTOOL_OPS(netdev, &xennet_ethtool_ops);
SET...
2011 Mar 31
3
[PATCH RESEND] net: convert xen-netfront to hw_features
...= xennet_set_features,
};
static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev)
@@ -1209,7 +1211,9 @@ static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev
netdev->netdev_ops = &xennet_netdev_ops;
netif_napi_add(netdev, &np->napi, xennet_poll, 64);
- netdev->features = NETIF_F_IP_CSUM;
+ netdev->features = NETIF_F_IP_CSUM | NETIF_F_RXCSUM |
+ NETIF_F_GSO_ROBUST;
+ netdev->hw_features = NETIF_F_IP_CSUM | NETIF_F_SG | NETIF_F_TSO;
SET_ETHTOOL_OPS(netdev, &xennet_ethtool_ops);
SET...
2011 Mar 31
3
[PATCH RESEND] net: convert xen-netfront to hw_features
...= xennet_set_features,
};
static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev)
@@ -1209,7 +1211,9 @@ static struct net_device * __devinit xennet_create_dev(struct xenbus_device *dev
netdev->netdev_ops = &xennet_netdev_ops;
netif_napi_add(netdev, &np->napi, xennet_poll, 64);
- netdev->features = NETIF_F_IP_CSUM;
+ netdev->features = NETIF_F_IP_CSUM | NETIF_F_RXCSUM |
+ NETIF_F_GSO_ROBUST;
+ netdev->hw_features = NETIF_F_IP_CSUM | NETIF_F_SG | NETIF_F_TSO;
SET_ETHTOOL_OPS(netdev, &xennet_ethtool_ops);
SET...
2012 Oct 21
2
help speeding up simple Theil regression function
...-packaged version from "MBLM",
which isnt very fast either, but it appears mine is faster with N = 1000
(see results below). I plan on running this function repeatedly, and I
generally have data lengths of ~ N = 6000 or more.
# My function following Hollander and Wolfe text, Chapter 9
np.lm <-function(dat, X, Y, ...){
# Ch 9.2: Slope est. (X) for Thiel statistic
combos <- combn(nrow(dat), 2)
i.s <- combos[1,]
j.s <- combos[2,]
num <- vector("list", length=length(i.s))
dom <- vector("list", length=length(i.s))
for(i in 1:length(i.s)){...
2011 Oct 05
0
[PATCH 3/8] xen: netfront: convert to SKB paged frag API.
...ont.c
index d7c8a98..6e5d4c0 100644
--- a/drivers/net/xen-netfront.c
+++ b/drivers/net/xen-netfront.c
@@ -275,7 +275,7 @@ no_skb:
break;
}
- skb_shinfo(skb)->frags[0].page = page;
+ __skb_fill_page_desc(skb, 0, page, 0, 0);
skb_shinfo(skb)->nr_frags = 1;
__skb_queue_tail(&np->rx_batch, skb);
}
@@ -309,8 +309,8 @@ no_skb:
BUG_ON((signed short)ref < 0);
np->grant_rx_ref[id] = ref;
- pfn = page_to_pfn(skb_shinfo(skb)->frags[0].page);
- vaddr = page_address(skb_shinfo(skb)->frags[0].page);
+ pfn = page_to_pfn(skb_frag_page(&skb_shinfo(skb)-&...
2002 Feb 22
1
Head & Rotor VE(CHINA-LuTong) 2/23
...mechanical company. Located in the south east
of China, we specialize in hydraulic heads for the VE
distributor pump.
We can supply standard, good quality units at a very
competitive price. The following types are available:
Engine model VE PUMS code NO UNIT PRICE(EX WORKS)
ISUZU) NP-VE4/11L 096400-1600 $USD40
(NIPPON DENSO)
ISUZU NP-VE4/11R 146402-0820(zexel) $USD45
ISUZU NP-VE4/11L 146402-0920(zexel) $USD40
ISUZU NP-VE4/11L 146402-3820(zexel) $USD45
NISSAN NP-VE4/12R 146402-4320(zexel) $USD50
IVECO...