library(tidyverse)
## Warning: package 'tidyverse' was built under R version 4.4.3
## Warning: package 'ggplot2' was built under R version 4.4.3
## Warning: package 'dplyr' was built under R version 4.4.3
library(openintro)
## Warning: package 'openintro' was built under R version 4.4.3

Check necessary Library

# Install required packages if not already installed                    
  
required_packages <- c("tidyverse","tidytext", "Matrix", "ranger", "ggplot2", "yardstick")
for (pkg in required_packages) {
  if (!requireNamespace(pkg, quietly = TRUE)) {
    message("Installing package: ", pkg)
    install.packages(pkg, repos = "https://cran.rstudio.com/")
  }
  library(pkg, character.only = TRUE)
}
## Warning: package 'tidytext' was built under R version 4.4.3
## Warning: package 'Matrix' was built under R version 4.4.3
## 
## Attaching package: 'Matrix'
## The following objects are masked from 'package:tidyr':
## 
##     expand, pack, unpack
## Warning: package 'ranger' was built under R version 4.4.3
## Warning: package 'yardstick' was built under R version 4.4.3
## 
## Attaching package: 'yardstick'
## The following object is masked from 'package:readr':
## 
##     spec

Load the packages

library(tidyverse)
library(tidymodels)
## Warning: package 'tidymodels' was built under R version 4.4.3
## ── Attaching packages ────────────────────────────────────── tidymodels 1.3.0 ──
## ✔ broom        1.0.7     ✔ recipes      1.3.0
## ✔ dials        1.4.0     ✔ rsample      1.3.0
## ✔ infer        1.0.8     ✔ tune         1.3.0
## ✔ modeldata    1.4.0     ✔ workflows    1.2.0
## ✔ parsnip      1.3.1     ✔ workflowsets 1.1.0
## Warning: package 'dials' was built under R version 4.4.3
## Warning: package 'infer' was built under R version 4.4.3
## Warning: package 'modeldata' was built under R version 4.4.3
## Warning: package 'parsnip' was built under R version 4.4.3
## Warning: package 'recipes' was built under R version 4.4.3
## Warning: package 'rsample' was built under R version 4.4.3
## Warning: package 'tune' was built under R version 4.4.3
## Warning: package 'workflows' was built under R version 4.4.3
## Warning: package 'workflowsets' was built under R version 4.4.3
## ── Conflicts ───────────────────────────────────────── tidymodels_conflicts() ──
## ✖ scales::discard() masks purrr::discard()
## ✖ Matrix::expand()  masks tidyr::expand()
## ✖ dplyr::filter()   masks stats::filter()
## ✖ recipes::fixed()  masks stringr::fixed()
## ✖ dplyr::lag()      masks stats::lag()
## ✖ Matrix::pack()    masks tidyr::pack()
## ✖ yardstick::spec() masks readr::spec()
## ✖ recipes::step()   masks stats::step()
## ✖ Matrix::unpack()  masks tidyr::unpack()
## ✖ recipes::update() masks Matrix::update(), stats::update()
library(tidytext)
library(parsnip)
library(recipes)
library(workflows)
library(yardstick)
# Load required packages
library(tidyverse)
library(stringr)

# Function to split and clean email text
separate_email <- function(email_text) {
  lines <- unlist(strsplit(email_text, "\n"))
  start_line <- ifelse(grepl("^<DOCUMENT", lines[1]), 2, 1)
  lines <- lines[start_line:length(lines)]
  
  blank_line_index <- which(trimws(lines) == "")[1]
  header <- character()
  body <- character()
  
  if (!is.na(blank_line_index) && blank_line_index > 1) {
    header <- lines[1:(blank_line_index - 1)]
    body <- lines[(blank_line_index + 1):length(lines)]
  } else {
    header_pattern <- "^[A-Za-z-]+:.*$"
    in_header <- TRUE
    for (i in seq_along(lines)) {
      line <- lines[i]
      if (in_header) {
        if (grepl(header_pattern, line) || (i > 1 && grepl("^\\s", line))) {
          header <- c(header, line)
        } else {
          in_header <- FALSE
          body <- c(body, line)
        }
      } else {
        body <- c(body, line)
      }
    }
  }

  # Clean body
  body_lines <- body
  cleaned_body <- character()
  in_quoted_header <- TRUE
  signature_start <- FALSE
  skip_footer <- FALSE

  for (i in seq_along(body_lines)) {
    line <- body_lines[i]
    
    if (in_quoted_header && (grepl("^\\s*[A-Za-z-]+:.*$", line) || trimws(line) == "")) {
      next
    } else {
      in_quoted_header <- FALSE
    }

    if (i < length(body_lines)) {
      next_lines <- body_lines[(i + 1):min(i + 3, length(body_lines))]
      if (any(grepl("mailing list|https://listman|_______________________________________________|Exmh-workers@redhat.com", c(line, next_lines)))) {
        skip_footer <- TRUE
      }
    }
    if (skip_footer) next

    if (grepl("^--\\s*$", line)) {
      signature_start <- TRUE
      next
    }
    if (signature_start || grepl("^ps:.*$|^\\w{1,15}$", line)) {
      next
    }

    cleaned_body <- c(cleaned_body, line)
  }

  list(
    header = paste(header, collapse = "\n"),
    body = paste(cleaned_body, collapse = "\n")
  )
}

# Function to read email file from URL
process_email_file <- function(file_url, label) {
  tryCatch({
    email_text <- readLines(url(file_url), warn = FALSE) %>% paste(collapse = "\n")
    result <- separate_email(email_text)
    word_count <- str_count(result$body, "\\w+")
    
    tibble(
      filename = basename(file_url),
      label = factor(label, levels = c("ham", "spam")),
      header = result$header,
      body = result$body,
      word_count = word_count
    )
  }, error = function(e) {
    message("Error processing: ", file_url, " - ", e$message)
    return(NULL)
  })
}
# GitHub raw folder URLs (replace with raw file links)
ham_base <- "https://raw.githubusercontent.com/tanzil64/Project4_3/main/email/ham"
spam_base <- "https://raw.githubusercontent.com/tanzil64/Project4_3/main/email/spam1"

# List of file names from GitHub (add actual filenames manually or with a script)
ham_files <- c("00001.7c53336b37003a9286aba55d2945844c", "00002.9c4069e25e1ef370c078db7ee85ff9ac")  # Extend this list
spam_files <- c("00208.c9e30fc9044cdc50682c2e2d2be4c466", "00209.d59c9c2822a4b6dc157ba43d9e2e")     # Extend this list

# Create full raw URLs
ham_urls <- file.path(ham_base, ham_files)
spam_urls <- file.path(spam_base, spam_files)

# Process files
ham_data <- map(ham_urls, ~process_email_file(.x, "ham")) %>% compact() %>% bind_rows()
spam_data <- map(spam_urls, ~process_email_file(.x, "spam")) %>% compact() %>% bind_rows()
## Warning in readLines(url(file_url), warn = FALSE): cannot open URL
## 'https://raw.githubusercontent.com/tanzil64/Project4_3/main/email/spam1/00209.d59c9c2822a4b6dc157ba43d9e2e':
## HTTP status was '404 Not Found'
## Error processing: https://raw.githubusercontent.com/tanzil64/Project4_3/main/email/spam1/00209.d59c9c2822a4b6dc157ba43d9e2e - cannot open the connection to 'https://raw.githubusercontent.com/tanzil64/Project4_3/main/email/spam1/00209.d59c9c2822a4b6dc157ba43d9e2e'
# Combine
email_data <- bind_rows(ham_data, spam_data)

# Show summary
message("Total emails: ", nrow(email_data))
## Total emails: 3
message("Ham: ", sum(email_data$label == "ham"), " | Spam: ", sum(email_data$label == "spam"))
## Ham: 2 | Spam: 1
# Preview
email_data %>%
  mutate(
    header_preview = str_trunc(header, 100),
    body_preview = str_trunc(body, 100)
  ) %>%
  select(filename, label, word_count, header_preview, body_preview) %>%
  head() %>%
  knitr::kable(caption = "First 6 processed emails")
First 6 processed emails
filename label word_count header_preview body_preview
00001.7c53336b37003a9286aba55d2945844c ham 208 From Thu Aug 22 12:36:23 2002
Return-Path: < | I can’t reproduce this error.

For me it is very repeatable… (like every time, without fail… | |00002.9c4069e25e1ef370c078db7ee85ff9ac |ham | 127|From Thu Aug 22 12:46:39 2002 Return-Path: <… |Martin A posted: Tassos Papadopoulos, the Greek sculptor behind the plan, judged that the limest… | |00208.c9e30fc9044cdc50682c2e2d2be4c466 |spam | 908|From Mon Jun 24 17:04:13 2002 Return-Path: Delivery… |This is a multi-part message in MIME format.

——=_NextPart_000_0009_01C1EC40.AE23FA20 Content… |

# Show full text for one example
if (nrow(email_data) > 0) {
  cat("\n--- Full Header ---\n", email_data$header[1], "\n")
  cat("\n--- Full Body ---\n", email_data$body[1], "\n")
}
## 
## --- Full Header ---
##  From exmh-workers-admin@redhat.com  Thu Aug 22 12:36:23 2002
## Return-Path: <exmh-workers-admin@spamassassin.taint.org>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id D03E543C36
##  for <zzzz@localhost>; Thu, 22 Aug 2002 07:36:16 -0400 (EDT)
## Received: from phobos [127.0.0.1]
##  by localhost with IMAP (fetchmail-5.9.0)
##  for zzzz@localhost (single-drop); Thu, 22 Aug 2002 12:36:16 +0100 (IST)
## Received: from listman.spamassassin.taint.org (listman.spamassassin.taint.org [66.187.233.211]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g7MBYrZ04811 for
##     <zzzz-exmh@spamassassin.taint.org>; Thu, 22 Aug 2002 12:34:53 +0100
## Received: from listman.spamassassin.taint.org (localhost.localdomain [127.0.0.1]) by
##     listman.redhat.com (Postfix) with ESMTP id 8386540858; Thu, 22 Aug 2002
##     07:35:02 -0400 (EDT)
## Delivered-To: exmh-workers@listman.spamassassin.taint.org
## Received: from int-mx1.corp.spamassassin.taint.org (int-mx1.corp.spamassassin.taint.org
##     [172.16.52.254]) by listman.redhat.com (Postfix) with ESMTP id 10CF8406D7
##     for <exmh-workers@listman.redhat.com>; Thu, 22 Aug 2002 07:34:10 -0400
##     (EDT)
## Received: (from mail@localhost) by int-mx1.corp.spamassassin.taint.org (8.11.6/8.11.6)
##     id g7MBY7g11259 for exmh-workers@listman.redhat.com; Thu, 22 Aug 2002
##     07:34:07 -0400
## Received: from mx1.spamassassin.taint.org (mx1.spamassassin.taint.org [172.16.48.31]) by
##     int-mx1.corp.redhat.com (8.11.6/8.11.6) with SMTP id g7MBY7Y11255 for
##     <exmh-workers@redhat.com>; Thu, 22 Aug 2002 07:34:07 -0400
## Received: from ratree.psu.ac.th ([202.28.97.6]) by mx1.spamassassin.taint.org
##     (8.11.6/8.11.6) with SMTP id g7MBIhl25223 for <exmh-workers@redhat.com>;
##     Thu, 22 Aug 2002 07:18:55 -0400
## Received: from delta.cs.mu.OZ.AU (delta.coe.psu.ac.th [172.30.0.98]) by
##     ratree.psu.ac.th (8.11.6/8.11.6) with ESMTP id g7MBWel29762;
##     Thu, 22 Aug 2002 18:32:40 +0700 (ICT)
## Received: from munnari.OZ.AU (localhost [127.0.0.1]) by delta.cs.mu.OZ.AU
##     (8.11.6/8.11.6) with ESMTP id g7MBQPW13260; Thu, 22 Aug 2002 18:26:25
##     +0700 (ICT)
## From: Robert Elz <kre@munnari.OZ.AU>
## To: Chris Garrigues <cwg-dated-1030377287.06fa6d@DeepEddy.Com>
## Cc: exmh-workers@spamassassin.taint.org
## Subject: Re: New Sequences Window
## In-Reply-To: <1029945287.4797.TMDA@deepeddy.vircio.com>
## References: <1029945287.4797.TMDA@deepeddy.vircio.com>
##     <1029882468.3116.TMDA@deepeddy.vircio.com> <9627.1029933001@munnari.OZ.AU>
##     <1029943066.26919.TMDA@deepeddy.vircio.com>
##     <1029944441.398.TMDA@deepeddy.vircio.com>
## MIME-Version: 1.0
## Content-Type: text/plain; charset=us-ascii
## Message-Id: <13258.1030015585@munnari.OZ.AU>
## X-Loop: exmh-workers@spamassassin.taint.org
## Sender: exmh-workers-admin@spamassassin.taint.org
## Errors-To: exmh-workers-admin@spamassassin.taint.org
## X-Beenthere: exmh-workers@spamassassin.taint.org
## X-Mailman-Version: 2.0.1
## Precedence: bulk
## List-Help: <mailto:exmh-workers-request@spamassassin.taint.org?subject=help>
## List-Post: <mailto:exmh-workers@spamassassin.taint.org>
## List-Subscribe: <https://listman.spamassassin.taint.org/mailman/listinfo/exmh-workers>,
##     <mailto:exmh-workers-request@redhat.com?subject=subscribe>
## List-Id: Discussion list for EXMH developers <exmh-workers.spamassassin.taint.org>
## List-Unsubscribe: <https://listman.spamassassin.taint.org/mailman/listinfo/exmh-workers>,
##     <mailto:exmh-workers-request@redhat.com?subject=unsubscribe>
## List-Archive: <https://listman.spamassassin.taint.org/mailman/private/exmh-workers/>
## Date: Thu, 22 Aug 2002 18:26:25 +0700 
## 
## --- Full Body ---
##    | I can't reproduce this error.
## 
## For me it is very repeatable... (like every time, without fail).
## 
## This is the debug log of the pick happening ...
## 
## 18:19:03 Pick_It {exec pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace} {4852-4852 -sequence mercury}
## 18:19:03 exec pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace 4852-4852 -sequence mercury
## 18:19:04 Ftoc_PickMsgs {{1 hit}}
## 18:19:04 Marking 1 hits
## 18:19:04 tkerror: syntax error in expression "int ...
## 
## Note, if I run the pick command by hand ...
## 
## delta$ pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace  4852-4852 -sequence mercury
## 1 hit
## 
## That's where the "1 hit" comes from (obviously).  The version of nmh I'm
## using is ...
## 
## delta$ pick -version
## pick -- nmh-1.0.4 [compiled on fuchsia.cs.mu.OZ.AU at Sun Mar 17 14:55:56 ICT 2002]
## 
## And the relevant part of my .mh_profile ...
## 
## delta$ mhparam pick
## -seq sel -list
## 
## 
## Since the pick command works, the sequence (actually, both of them, the
## one that's explicit on the command line, from the search popup, and the
## one that comes from .mh_profile) do get created.
## 
## 
## been able to reach the cvs repository today (local routing issue I think).

Function to Separate Email Header and Body

separate_email <- function(email_text) {
  # Split email text into lines
  lines <- unlist(strsplit(email_text, "\n"))

  # Skip <DOCUMENT> tag if present
  if (grepl("^<DOCUMENT", lines[1])) {
    lines <- lines[-1]
  }

  # Attempt to split on first blank line between header and body
  blank_line_index <- which(trimws(lines) == "")[1]
  header <- character()
  body <- character()

  if (!is.na(blank_line_index) && blank_line_index > 1) {
    header <- lines[1:(blank_line_index - 1)]
    body <- lines[(blank_line_index + 1):length(lines)]
  } else {
    # If no blank line, fall back to pattern-based header detection
    header_pattern <- "^[A-Za-z-]+:.*$"
    in_header <- TRUE
    for (line in lines) {
      if (in_header) {
        if (grepl(header_pattern, line) || grepl("^\\s", line)) {
          header <- c(header, line)
        } else {
          in_header <- FALSE
          body <- c(body, line)
        }
      } else {
        body <- c(body, line)
      }
    }
  }

  # Clean the body: Remove quoted headers, signatures, mailing list footers
  cleaned_body <- character()
  in_quoted_header <- TRUE
  signature_start <- FALSE
  skip_footer <- FALSE

  for (i in seq_along(body)) {
    line <- body[i]

    # Skip quoted header lines
    if (in_quoted_header && (grepl("^\\s*[A-Za-z-]+:.*$", line) || trimws(line) == "")) {
      next
    } else {
      in_quoted_header <- FALSE
    }

    # Detect mailing list footers
    if (i < length(body)) {
      lookahead <- body[(i + 1):min(i + 3, length(body))]
      if (any(grepl("mailing list|https://listman|_______________________________________________|Exmh-workers@redhat.com", c(line, lookahead)))) {
        skip_footer <- TRUE
      }
    }
    if (skip_footer) next

    # Skip signature lines
    if (grepl("^--\\s*$", line)) {
      signature_start <- TRUE
      next
    }
    if (signature_start || grepl("^ps:.*$|^\\w{1,15}$", line)) {
      next
    }

    cleaned_body <- c(cleaned_body, line)
  }

  # Collapse header and body to single strings
  header_text <- paste(header, collapse = "\n")
  body_text <- paste(cleaned_body, collapse = "\n")

  # Print preview for debugging
  message("Header (preview): ", paste(head(strsplit(header_text, "\n")[[1]], 3), collapse = "; "))
  message("Body (preview): ", paste(head(strsplit(body_text, "\n")[[1]], 3), collapse = "; "))

  # Return cleaned header and body
  return(list(header = header_text, body = body_text))
}

Process email folder 1:

# Load required packages
library(tidyverse)
library(stringr)

# Define file paths (adjust if your professor runs on a different system)
ham_folder <- "C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham"
spam_folder <- "C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam"

# Get list of all email files
ham_files <- list.files(ham_folder, full.names = TRUE)
spam_files <- list.files(spam_folder, full.names = TRUE)

# Validate files exist
if (length(ham_files) == 0 && length(spam_files) == 0) {
  stop("❌ No files found in ham or spam folders. Please check the folder paths.")
}
message("📂 Found ", length(ham_files), " ham files and ", length(spam_files), " spam files.")
## 📂 Found 2530 ham files and 1220 spam files.
# Function to process a single email file and extract metadata
process_email_file <- function(file_path, label) {
  tryCatch({
    email_text <- paste(readLines(file_path, warn = FALSE), collapse = "\n")
    result <- separate_email(email_text)

    tibble(
      filename = basename(file_path),
      label = factor(label, levels = c("ham", "spam")),
      header = result$header,
      body = result$body,
      word_count = str_count(result$body, "\\w+")
    )
  }, error = function(e) {
    message("⚠️ Error reading file: ", file_path, " - ", e$message)
    return(NULL)
  })
}

# Process emails using purrr::map and bind into one dataset
ham_data <- map(ham_files, ~process_email_file(.x, "ham")) %>% compact() %>% bind_rows()
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 12:36:23 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):   | I can't reproduce this error.; ; For me it is very repeatable... (like every time, without fail).
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From Steve_Burt@cursor-system.com  Thu Aug 22 12:46:39 2002; Return-Path: <Steve_Burt@cursor-system.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Martin A posted:; Tassos Papadopoulos, the Greek sculptor behind the plan, judged that the;  limestone of Mount Kerdylio, 70 miles east of Salonika and not far from the
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From timc@2ubh.com  Thu Aug 22 13:52:59 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Man Threatens Explosion In Moscow ; ; Thursday August 22, 2002 1:40 PM
## Header (preview): From irregulars-admin@tb.tf  Thu Aug 22 14:23:39 2002; Return-Path: <irregulars-admin@tb.tf>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Already the most prolific virus ever, Klez continues to wreak havoc.; ; Andrew Brandt
## Header (preview): From Stewart.Smith@ee.ed.ac.uk  Thu Aug 22 14:44:26 2002; Return-Path: <Stewart.Smith@ee.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >  in adding cream to spaghetti carbonara, which has the same effect on pasta as; >  making a pizza a deep-pie; ;
## Header (preview): From martin@srv0.ems.ed.ac.uk  Thu Aug 22 14:54:39 2002; Return-Path: <martin@srv0.ems.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > I just had to jump in here as Carbonara is one of my favourites to make and ; > ask ; > what the hell are you supposed to use instead of cream?
## Warning in strsplit(email_text, "\n"): unable to translate 'From martin@srv0.ems.ed.ac.uk  Thu Aug 22 14:54:40 2002
## Return-Path: <martin@srv0.ems.ed.ac.uk>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id E3D7B47C...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00007.37a8af848caae585af4fe35779656d55 - missing value where TRUE/FALSE needed
## Header (preview): From Stewart.Smith@ee.ed.ac.uk  Thu Aug 22 15:05:07 2002; Return-Path: <Stewart.Smith@ee.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Martin Adamson wrote:; > ; > Isn't it just basically a mixture of beaten egg and bacon (or pancetta,
## Warning in strsplit(email_text, "\n"): unable to translate 'From martin@srv0.ems.ed.ac.uk  Thu Aug 22 15:05:07 2002
## Return-Path: <martin@srv0.ems.ed.ac.uk>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 7A0C347C...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00009.371eca25b0169ce5cb4f71d3e07b9e2d - missing value where TRUE/FALSE needed
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 15:25:29 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I have been trying to research via SA mirrors and search engines if a canned; script exists giving clients access to their user_prefs options via a; web-based CGI interface. Numerous ISPs provide this feature to clients, but
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 15:25:29 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hello, have you seen and discussed this article and his approach?; ; Thank you
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 16:27:25 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Yes - great minds think alike. But even withput eval rules it would be very ; useful. It would allow us to respond quickly to spammer's tricks.;
## Header (preview): From ilug-admin@linux.ie  Thu Aug 22 16:27:21 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Mon, Aug 19, 2002 at 03:08:16PM +0100, John P. Looney mentioned:; >  This is likely because to get it to boot, like the cobalt, I'm actually; > passing root=/dev/hda5 to the kernel, not /dev/md0.
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 16:37:36 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-1317289252P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From fork-admin@xent.com  Thu Aug 22 16:37:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): SpamAssassin is hurting democracy!; ---------------------------------------------------------------------------------------------------------------------;
## Header (preview): From iiu-admin@taint.org  Thu Aug 22 17:08:44 2002; Return-Path: <iiu-admin@taint.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi all,; ; apologies for the possible silly question (i don't think it is, but),
## Header (preview): From robert.chambers@baesystems.com  Thu Aug 22 17:19:36 2002; Return-Path: <robert.chambers@baesystems.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): --- In forteana@y..., "D.McMann" <dmcmann@b...> wrote:; > Robert Moaby, 33, who sent death threats to staff, was also jailed; > for hoarding indecent pictures of children on his home computer.
## Header (preview): From ilug-admin@linux.ie  Thu Aug 22 17:19:31 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): In a nutshell - Solaris is Suns own flavour of UNIX.; ; > -----Original Message-----
## Header (preview): From robert.chambers@baesystems.com  Thu Aug 22 17:19:36 2002; Return-Path: <robert.chambers@baesystems.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Apols if this has been posted before:; ; http://www.pinkpaperclips.net/subs/quiz2.html
## Header (preview): From ilug-admin@linux.ie  Thu Aug 22 17:19:25 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Can someone explain what type of operating system Solaris is... as ive never; seen or used it i dont know wheather to get a server from Sun or from DELL i; would prefer a linux based server and Sun seems to be the one for that but
## Header (preview): From timc@2ubh.com  Thu Aug 22 17:31:00 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > Apols if this has been posted before:; > ; > http://www.pinkpaperclips.net/subs/quiz2.html
## Header (preview): From ilug-admin@linux.ie  Thu Aug 22 17:45:53 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Thu, Aug 22, 2002 at 05:13:01PM +0100, Fergal Moran mentioned:; > In a nutshell - Solaris is Suns own flavour of UNIX.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Thu Aug 22 17:45:54 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id E8B1343F9B
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00023.e0e815ea1d7fd40e7e70b4c0035bef0c - missing value where TRUE/FALSE needed
## Header (preview): From lejones@ucla.edu  Thu Aug 22 18:29:58 2002; Return-Path: <lejones@ucla.edu>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hey, it's not easy being green.; ;
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:47 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > On Thu, 22 Aug 2002, John P. Looney wrote:; > >  Sun's hardware in general is more reliable,; > ROFL. not in our experience.
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >                                 You have multiple generations of; > peasants/squatters that cultivate and live on the lands almost as a; > human parts of the property package.
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:42 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Folks,;  ; my first time posting - have a bit of Unix experience, but am new to Linux.
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Thu, 22 Aug 2002, Joseph S. Barrera III wrote:; --]Why wait until you're dead? I'm sure there's enough carbon in; --]the fat from your typical liposuction job to make a decent diamond.
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Joseph S. Barrera III wrote:; ; > Chris Haun wrote:
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:51 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Update on this for anyone that's interested, and because I like closed ; threads... nothing worse than an infinite while loop, is there?;
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): An apparent quote from Dubya, from the Times (sent to me by my Dad):; ; http://www.timesonline.co.uk/printFriendly/0,,1-43-351083,00.html
## Header (preview): From hauns_froehlingsdorf@infinetivity.com  Fri Aug 23 11:05:35 2002; Return-Path: <hauns_froehlingsdorf@infinetivity.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): This is an automated response to a message you have sent to hauns_froehlingsdorf@infinetivity.com.; ; I will be out of the office until Monday, August 26 2002.
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:52 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Al white wrote:; ;  >erm... it runs Solaris x86 as standard...
## Header (preview): From neugens@libero.it  Fri Aug 23 11:06:09 2002; Return-Path: <neugens@libero.it>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi,; ; Thank you for the useful replies, I have found some interesting
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:57 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Mark Twomey joked:; >  >erm... it runs Solaris x86 as standard...; >
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Thu, Aug 22, 2002 at 10:58:34PM +0200, Robert Harley wrote:; > An apparent quote from Dubya, from the Times (sent to me by my Dad):; >
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:07:57 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): hehe sorry but if you hit caps lock twice the computer crashes?  theres one; ive never heard before... have you tryed Dell support yet? I think dell; computers prefer RedHat... (dell provide some computers pre-loaded with red
## Header (preview): From iiu-admin@taint.org  Fri Aug 23 11:06:32 2002; Return-Path: <iiu-admin@taint.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): At 17:10 22/08/2002 +0100, Nick Hilliard wrote:; > > apologies for the possible silly question (i don't think it is, but),; > > but is Eircom's aDSL service NAT'ed?
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Manoj Kasichainula wrote;; >http://www.snopes.com/quotes/bush.htm; >
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On 23 Aug 2002 at 2:57, Robert Harley wrote:; ; > It's an amusing anecdote, I don't know if it's true or not,
## Header (preview): From ilug-admin@linux.ie  Fri Aug 23 11:08:03 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): < >; > I downloaded a driver from the nVidia website and installed it using RPM.; > Then I ran Sax2 (as was recommended in some postings I found on the net),
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:09:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): According to my son, it was actually Homer Simpson, who claimed the ; French had no word for victory.;
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:09:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Whore eructed:; >--]It's an amusing anecdote, I don't know if it's true or not, but; >--]certainly nothing here supports the authoritative sounding conclusion
## Header (preview): From quinlan@pathname.com  Fri Aug 23 11:33:57 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I won't be reading email until Sunday night or so.  Good luck with; 2.40 and don't do anything I wouldn't do.  ;-);
## Header (preview): From ilug-admin@linux.ie  Thu Aug 29 16:42:34 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): It will function as a router if that is what you wish.; ; It even looks like the modem's embedded OS is some kind of linux, being that
## Header (preview): From fork-admin@xent.com  Thu Aug 29 16:52:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >>>>> "E" == Eirikur Hallgrimsson <eh@mad.scientist.com> writes:; ;     E> Gary's news service at teledyn.com has an article on Internet
## Header (preview): From fork-admin@xent.com  Thu Aug 29 16:32:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Monday, August 26, 2002, at 09:59  AM, Tom wrote:; ; > Post MG in the 80's there were the colums by A K Dewdney that I dug a
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 16:42:46 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On 28 Aug 2002, Daniel Quinlan wrote:; ; > Dan Kohn <dan@dankohn.com> writes:
## Header (preview): From ilug-admin@linux.ie  Thu Aug 29 16:42:35 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Is there a way to look for a particular file or directory in 100's of zip; files??; Something like zgrep but for the filename instead of a word
## Header (preview): From ilug-admin@linux.ie  Thu Aug 29 16:52:52 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; ; Justin MacCarthy wrote:
## Header (preview): From ilug-admin@linux.ie  Thu Aug 29 16:52:52 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): John P. Looney stated the following on Thu, Aug 29, 2002 at 03:31:11PM +0100 :; >  I'm not sure what exactly is wrong with this, but I can't get a redhat; > 7.1 box to use ttyS0 as a console.
## Header (preview): From ilug-admin@linux.ie  Thu Aug 29 17:03:22 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Not true on the choice part.; ; After three weeks of me telling eircom that I did not in fact need nor want
## Header (preview): From crackmice-admin@crackmice.com  Thu Aug 29 17:13:43 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From gordon@rutter.freeserve.co.uk  Thu Aug 29 18:06:18 2002; Return-Path: <gordon@rutter.freeserve.co.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Gordon Rutter; gordon@rutter.freeserve.co.uk; Join the Fortean Book Reviews list at
## Warning in strsplit(email_text, "\n"): unable to translate 'From iiu-admin@taint.org  Thu Aug 29 18:06:13 2002
## Return-Path: <iiu-admin@taint.org>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id A7D3543F9B
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00057.7c3a836baaa732cd915546442c0fef1a - missing value where TRUE/FALSE needed
## Header (preview): From sitescooper-talk-admin@lists.sourceforge.net  Mon Sep  2 12:22:41 2002; Return-Path: <sitescooper-talk-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I am wondering whether there's a way that I can use sitescooper and/or plucker; or some other free utility to convert word documents into something a bit; more palmos friendly?
## Header (preview): From sitescooper-talk-admin@lists.sourceforge.net  Mon Sep  2 12:23:07 2002; Return-Path: <sitescooper-talk-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Good Day!; ; On Thu, Aug 29, 2002 at 05:10:47PM -0400, Larry W. Virden wrote:
## Header (preview): From pudge@perl.org  Mon Sep  2 12:23:11 2002; Return-Path: <pudge@perl.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; Installing Perl 5.8.0 on Mac OS X 10.2
## Header (preview): From sitescooper-talk-admin@lists.sourceforge.net  Mon Sep  2 12:28:11 2002; Return-Path: <sitescooper-talk-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Thu, 2002-08-29 at 19:27, Barry Dexter A. Gonzaga wrote:; > On Thu, Aug 29, 2002 at 05:10:47PM -0400, Larry W. Virden wrote:; > > I am wondering whether there's a way that I can use sitescooper and/or plucker
## Header (preview): From DNS-swap@lists.ironclad.net.au  Mon Sep  2 12:28:53 2002; Return-Path: <DNS-swap@lists.ironclad.net.au>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): (This list is sponsored by Ironclad Networks http://www.ironclad.net.au/); ; This is a multi-part message in MIME format.
## Header (preview): From DNS-swap@lists.ironclad.net.au  Mon Sep  2 12:29:02 2002; Return-Path: <DNS-swap@lists.ironclad.net.au>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): (This list is sponsored by Ironclad Networks http://www.ironclad.net.au/); ;
## Header (preview): From tips@spesh.com  Mon Sep  2 12:29:16 2002; Return-Path: <tips@spesh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):  _   _ _____ _  __ <*the* weekly high-tech sarcastic update for the uk>; | \ | |_   _| |/ / _ __   __2002-08-30_ o join! mail an empty message to; |  \| | | | | ' / | '_ \ / _ \ \ /\ / / o ntknow-subscribe@lists.ntk.net
## Header (preview): From justin.armstrong@acm.org  Mon Sep  2 12:29:05 2002; Return-Path: <justin.armstrong@acm.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): //this function should print all numbers up to 100...; ; void print_nums()
## Header (preview): From DNS-swap@lists.ironclad.net.au  Mon Sep  2 12:29:06 2002; Return-Path: <DNS-swap@lists.ironclad.net.au>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): (This list is sponsored by Ironclad Networks http://www.ironclad.net.au/); ; Hello!
## Header (preview): From webster@ryanairmail.com  Mon Sep  2 12:30:45 2002; Return-Path: <webster@ryanairmail.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): This is a multi part message in MIME format.; ; --_NextPart_1_bvfoDiTVghtoCXFdvJNKcuWblFV
## Header (preview): From updates-admin@ximian.com  Mon Sep  2 12:29:39 2002; Return-Path: <updates-admin@ximian.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):   CAN-2002-0989 ;     http://cve.mitre.org/cgi-bin/cvename.cgi?name=CAN-2002-0989;   Gaim Changelog
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:32:39 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I am trying to rebuild the recently posted ALSA driver package for my ; kernel.  Although I run Red Hat 7.3, I am not using a Red Hat kernel ; package: my kernel is lovingly downloaded, configured, and built by
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --------------080808010909060409040405; Content-Type: text/plain; charset=us-ascii; format=flowed; Content-Transfer-Encoding: 7bit
## Header (preview): From fork-admin@xent.com  Fri Aug 23 16:44:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Fri, 23 Aug 2002, Robert Harley wrote:; ; --]Next time I hear a joke, I promise not to laugh until I have checked
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dan Brickley wrote:; > Except that thanks to the magic of spam, it's usually some else's locale;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:30:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): XviD [1] is a project to make GPL divx codecs. Sigma Designs [1] is a; company  looking to put out hardware to playback, amongst other things,; divx files. Problem is Sigma is using XviDs gpled code in ways not very
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > Russell Turpin:; > > That depends on how the list is collected, or; > > even on what the senders say about how the list
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Fri, 23 Aug 2002, Tom wrote:; ; --]
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): from http://www.arstechnica.com/; ; "There has mostly been talk thus far and little action, but the Department
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Fri, 23 Aug 2002, Tom wrote:; ; > from http://www.arstechnica.com/
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Reza B'Far (eBuilt) wrote:; > problems.... Why do most computer scientists insist on solving the same; > problems over and over again when there are some many more important and
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 13:12:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): If I have any RPMS in; ; http://www.dudex.net/rpms/
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Sun, 1 Sep 2002, Reza B'Far (eBuilt) wrote:; ; > 2.  C and C++ forces the developer to solve problems such as memory
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >; > 6.  Hardware is getting so fast that I'm not sure if the performance; > difference between Java and C/C++ are relevant any more.
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Adam Beberg:; >Considering 90% of the fake job posting I see are for embedded systems or ; >device drivers - C still rules the world.
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:14:12 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Sun, Sep 01, 2002 at 04:14:17PM +0100, Paul Jakma mentioned:; > On Sun, 1 Sep 2002, kevin lyda wrote:; >
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Mon, 2 Sep 2002, Russell Turpin wrote:; ; > Adam Beberg:
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:14:35 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Dell Quinn; Account Executive; Fleishman-Hillard Saunders
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Reza B'Far wrote:; >This thread kind of surprises me... I started coding with C, then C++, and; >moved on to Java... And, I think that:
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:14:40 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I need to setup a VPN between a few sites. From what I've read, the the; choices come down (on the Linux side) to IPsec (using FreeSWAN) or CIPE.; It seems that FreeSWAN is 'better', being an implementation of IPsec which
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:12:59 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I am trying to manage the email for a domain which I have hosted with; hosting365, and am trying to get the whole email send and receive thing; working nice and easily.
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:13:12 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi All,; I'm trying to set up the following:;
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:13:50 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi Dermot, if have a look at one of the dists. like www.smoothwall.org, it; will save you lots of time and effort, and should do eveything you want.;
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:13:28 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I think I'll ask this question again, as I sent on friday afternoon.  :-) ; ; Justin
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:12:41 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Ray Dermody's [DERMODYR@ITCARLOW.IE] 20 lines of wisdom included:; > Hi All,; > The serial number in our hosts files on our DNS server has gone
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:12:53 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; ; Vincent Cunniffe wrote:
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:15:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Justin MacCarthy wrote:; > I think I'll ask this question again, as I sent on friday afternoon.  :-)
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 13:13:46 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 16:21:48 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi All,; ; Damian Conway is in Belfast this week. He will be giving two talks:
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 16:21:52 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):          |::::::::::::::::::::::::::::::::::::::::::::::::::|; ;                 IT's Monday 520      02 September 2002
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 16:22:04 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I just saw the ISOs on an internal server here and was tempted....; ;    D.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 16:22:06 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): ok, so if i was in the uk for a wekk, how might i configure my laptop to; dial in to a freebie isp?  redhat's internet connection wizard actually; has settings for uk isp's, but freeserve is the only one i recognize
## Header (preview): From craig@deersoft.com  Mon Sep  2 23:00:06 2002; Return-Path: <craig@deersoft.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Vernon,; ; I'm changing the instructions in the SpamAssassin INSTALL file
## Header (preview): From ilug-admin@linux.ie  Mon Sep  2 23:01:03 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On September 2, kialllists@redpie.com said:; > OS-X is linux; >
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:28 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > From: Paul Linehan [mailto:plinehan@yahoo.com] ; >; > There are two open alternatives that I can think of
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:30 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Here's a weird and wacky problem:; ; I'm currently out of the country with my trusty Evo N600c laptop. When I
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:33 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Sat, Oct 05, 2002 at 06:06:14PM +0100, Padraig Brady mentioned:; > OK I'm upgrading vorbis on my machine and I'm getting; > the following:
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): John P. Looney wrote:; >  The only way you can resolve this, to my knowledge is to download the; > original libvorbis rpm and the new one. Remove the old one, then do:
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): David Neary said:; >; > For the francophones among you, this article is a summary of the
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:37 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Is there a way to get my read email downloaded off webmail.eircom.net.; ; I've been reading the emails using the web based interface. But I've
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:06:41 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Seems fetchmail has a -a switch to get it all.; ; Just need to install fetchmail now :)
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:07:12 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): It seems to only support PPPoA and not PPPoE. You need one that supports; PPPoE, if you want torun it in routed IP mode. If you are using it as a; bridge, it'll probably work, but you'd be left leaving the computer on,
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:07:10 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Mon, Oct 07, 2002 at 09:43:11AM +0100, Ciaran Johnston wrote:; ; > > Also there's some stuff about French consumer law forbidding sale
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:07:13 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): having great fun trying to find a dumb ADSL modem with Ethernet; presentation, everybody wants to sell routers but I intend on doing pppoe; from another device, something with more than one Ethernet port would be
## Header (preview): From ilug-admin@linux.ie  Mon Oct  7 12:07:14 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Sun, Oct 06, 2002 at 11:10:05PM +0100, Declan de Lacy Murphy wrote:; > I am planning to get i-stream solo and share it across a small network; > (wireless), but I don't want to have to pay eircom for a router and having a
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-55912-1033991494-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:14:04 2002
## Return-Path: <sentto-2242572-55912-1033991494-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00114.240461056916c0cdd555ba9d2bc9e63e - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-55913-1033991654-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:14:24 2002; Return-Path: <sentto-2242572-55913-1033991654-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Scott Wood" <skitster@hotmail.com>; To: <zzzzteana@yahoogroups.com>
## Header (preview): From sentto-2242572-55914-1033992044-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:14:39 2002; Return-Path: <sentto-2242572-55914-1033992044-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): So, I've been letting the little .exe of SETI@Home run endlessly on my PC .  Last total for this upgrade approx.; 420 hours of scanning time.  And still no ET.  I'm so disappointed.; Does anyone else on the list let Berkeley use their computer for research in this manner?
## Header (preview): From sentto-2242572-55916-1033992125-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:15:12 2002; Return-Path: <sentto-2242572-55916-1033992125-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): A New Theory on Mapping the New World; ; By Guy Gugliotta
## Header (preview): From sentto-2242572-55915-1033992114-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:14:57 2002; Return-Path: <sentto-2242572-55915-1033992114-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Understand, not enough caffeine absorbed yet this morning. (7:00AM here for; me);
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-55918-1033993378-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 13:35:13 2002
## Return-Path: <sentto-2242572-55918-1033993378-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00119.0f469afee6aef0a05d9850f7021bd629 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-55941-1034006157-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 18:29:14 2002; Return-Path: <sentto-2242572-55941-1034006157-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > That always amazes me about 'regular' dreams - how often they come true.; >; In 1993 or so, when I was a student in Edinburgh, I had a bad dream about
## Header (preview): From sentto-2242572-55948-1034007295-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Mon Oct  7 18:29:14 2002; Return-Path: <sentto-2242572-55948-1034007295-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > Anyone know what Quaoar means or stands for? Can't find it in the; > dictionary. Scrabble players should be happy!; >
## Header (preview): From sentto-2242572-55978-1034026967-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 00:10:48 2002; Return-Path: <sentto-2242572-55978-1034026967-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >  > Ok, but you'll still let me leave that black and white one there too,; >>  right? I like that one!!!; >>  --
## Header (preview): From sentto-2242572-55980-1034027115-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:56:48 2002; Return-Path: <sentto-2242572-55980-1034027115-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > Or you could let me write one for you? Mind you ...... I know an; > awful lot about you! ;-));
## Header (preview): From sentto-2242572-55981-1034027969-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 00:10:53 2002; Return-Path: <sentto-2242572-55981-1034027969-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Just the headlines and URLs so I don't bore y'all too much....; ; http://www.guardian.co.uk/Iraq/Story/0,2763,805900,00.html
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Oct  8 00:10:07 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Using Razor2 via SpamAssasin.; ; System is Solaris 2.7, with qmail. Spamassassin run via user's procmail.
## Header (preview): From sentto-2242572-55982-1034029763-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 00:10:56 2002; Return-Path: <sentto-2242572-55982-1034029763-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Even better:; ; http://www.ridiculopathy.com/news_detail.php?id=668
## Header (preview): From sentto-2242572-55983-1034030545-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 00:10:59 2002; Return-Path: <sentto-2242572-55983-1034030545-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Tom R:; > http://www.cliktrik.com/people/family/me/0419.jpg; >
## Header (preview): From fork-admin@xent.com  Tue Oct  8 10:56:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): what takes time and money: noting the amounts of each correction and basing; the refund delivery method on the amount.  yesh, it's silly to spend $.37 (+; labor and materials) for a $.02 refund, but maybe the only alternative right
## Header (preview): From pudge@perl.org  Tue Oct  8 10:54:15 2002; Return-Path: <pudge@perl.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (30 September / 6 October 2002)
## Header (preview): From pudge@perl.org  Tue Oct  8 10:54:18 2002; Return-Path: <pudge@perl.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From sentto-2242572-55999-1034047414-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:57:58 2002; Return-Path: <sentto-2242572-55999-1034047414-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >Benoit claimed the prize for his size 14 feet. In the female division of the; >competition, three women tied for first place with size 10 feet.; >Winners took home a $100 gift certificate to either Footlocker or Barrie
## Header (preview): From sentto-2242572-56000-1034048852-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:58:11 2002; Return-Path: <sentto-2242572-56000-1034048852-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >Helen & Mike wrote:; >; >>  Chat tends to be on irc.quakenet #forteana most nights. I think this was
## Header (preview): From sentto-2242572-56001-1034049352-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:58:30 2002; Return-Path: <sentto-2242572-56001-1034049352-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >I managed to get myself an iMac yesterday (just a G3 but a good'un) and was; >wondering if any of the Apple people on here could recommend a good ISP (for; >narrow band at the moment) for getting online under OS X.
## Header (preview): From sentto-2242572-56003-1034050291-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:58:44 2002; Return-Path: <sentto-2242572-56003-1034050291-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >  >Tom R:; >>>  ; >>><http://www.cliktrik.com/people/family/me/0419.jpg>http://www.cliktrik.com/people/family/me/0419.jpg
## Header (preview): From sentto-2242572-56004-1034050340-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 10:58:43 2002; Return-Path: <sentto-2242572-56004-1034050340-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >That Goddess Chick wrote:; >>; >>  >Thanks Fel.  Got no scanner.  My photo is in that group of 100 obsessive
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:55:22 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): ; I try to rebuild xine from src package and I get these errors:;
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): _Kevin Hemenway_: Finding More Channels[1]. &#8220;In simple terms, there are ; thousands of web sites that are actively providing their news and headlines in ; a format AmphetaDesk can understand [RSS]. And while AmphetaDesk knows about a
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview):     Khatami asked the U.N. to set a deadline for Bush to step down in favor of ;     president-in-exile Al Gore the legitimate winner of the 2000 election, the ;     results of which were subverted through widespread voting irregularities
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:40 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Steve sez: "It's tragic when life imitates Wile E. Coyote cartoons. Guy ; boobytraps his house to get his family if they try to break in, and seemingly ; is killed himself by his own traps." Link[1] Discuss[2] (_Thanks, Steve[3]!_)
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Curcumin, the chemical that makes curry yellow, turns out to be a good compound ; for treating radiation burns resulting from cancer therapy. Link[1] Discuss[2] ; (_Thanks, Cheryl!_)
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): A Nintendo newsletter from 1987 is going for ober $700 on eBay. Link[1] Discuss; [2] _(Thanks, Billy Hayes!)_;
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): The new Neiman Marcus Christmas catalog is out (in October!), including ; you-as-an-action-figure ($7,500), a bamboo hut ($15,000) and a leather frisbee ; ($30). Link[1] Discuss[2]
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): BBC reporter Donal MacIntyre wins high profile libel case against police.
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:56:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): *World latest: *Hundreds of Palestinians vent their anger as dozens of Israeli ; tanks withdrew after a gruelling three-hour raid on the Gaza strip.
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:56:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): *Afghanistan: *In his final report one year from the beginning of the US ; campaign *Rory McCarthy* finds mounting anger at the military presence.
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:55:49 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): The largest object found since 1930 is half the size of Pluto, and calls that ; object's planetary status into question
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:56:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): World chess champion Vladimir Kramnik takes the lead over the computer Deep ; Fritz, after the machine makes a peculiar mistake
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:56:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): A new Japanese system allows palmtop computers to swap large amounts of data ; when their owners shake hands
## Header (preview): From rssfeeds@spamassassin.taint.org  Tue Oct  8 10:56:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): The medicine prize goes to research that revealed how cell suicide sculpts the ; body and - when disrupted - causes disease
## Header (preview): From ilug-admin@linux.ie  Tue Oct  8 11:13:35 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Quoting Brendan Kehoe (brendan@zen.org):; ; > As a workaround, the various distributions could use a GPG singature
## Header (preview): From ilug-admin@linux.ie  Tue Oct  8 12:26:48 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Brendan Kehoe wrote:; > As a workaround, the various distributions could use a GPG singature to verify ; > correctness of the file.  Since the distributor's secret key is required to
## Header (preview): From webdev-admin@linux.ie  Tue Oct  8 12:26:53 2002; Return-Path: <webdev-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Thanks for the info AJ, I found "weblog" at ; http://awsd.com/scripts/weblog/index.shtml which has some click-path ; reporting. It's simple, but works. Report generation takes a bit though, even
## Header (preview): From sentto-2242572-56009-1034075149-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:16 2002; Return-Path: <sentto-2242572-56009-1034075149-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >>From the BBC website - www.bbc.co.uk; ;  Tuesday, 8 October, 2002, 09:43 GMT 10:43 UK
## Header (preview): From sentto-2242572-56010-1034075461-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:19 2002; Return-Path: <sentto-2242572-56010-1034075461-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Tuesday, 8 October, 2002, 07:55 GMT 08:55 UK; Lennon killer seeks parole again;
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Tue Oct  8 12:27:06 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESMTP id B489C16F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00155.22281cddbc29a93d630798e0aa97f725 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-56011-1034075737-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:25 2002; Return-Path: <sentto-2242572-56011-1034075737-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Evangelicals' threat to new archbishop; ; Direct action threat over liberal views on sexuality
## Header (preview): From sentto-2242572-56012-1034075806-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:29 2002; Return-Path: <sentto-2242572-56012-1034075806-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Weevil pest warms to life in south-west London; ; James Meek, science correspondent
## Header (preview): From sentto-2242572-56013-1034075904-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:27 2002; Return-Path: <sentto-2242572-56013-1034075904-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Nobel Honors 3 for Astrophysics Work ; ; Tuesday October 8, 2002 12:00 PM
## Header (preview): From sentto-2242572-56014-1034075987-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 12:27:48 2002; Return-Path: <sentto-2242572-56014-1034075987-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Lioness adopts fifth antelope; ; Rory Carroll, Africa correspondent
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-56019-1034080193-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 14:40:49 2002
## Return-Path: <sentto-2242572-56019-1034080193-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00160.eb0db8e14a3308c08db1cc38c4c7d66a - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-56020-1034080299-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 14:40:31 2002
## Return-Path: <sentto-2242572-56020-1034080299-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00161.e75ee4467e41dd1d5f5156f2b9ca5bd8 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-56021-1034080421-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 14:40:28 2002; Return-Path: <sentto-2242572-56021-1034080421-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): HUBBLE SPOTS AN ICY WORLD FAR BEYOND PLUTO; ------------------------------------------; Astronomers have discovered a distant body that appears to be the
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Tue Oct  8 14:39:45 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESMTP id 895BC16F1B
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00163.550a6ef7fd451fba494cc3128aaf3c7c - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Oct  8 14:40:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Rohit Khare wrote:; > ; > Why am I so passionate about decentralization? Because I believe some of
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-56022-1034083283-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 14:40:51 2002
## Return-Path: <sentto-2242572-56022-1034083283-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00165.a626a87fa5b56f724e6a00e7c1ec163a - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From guterman@mediaunspun.imakenews.net  Tue Oct  8 14:39:42 2002
## Return-Path: <guterman@mediaunspun.imakenews.net>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix)...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00166.8feace9f17d092d9532e62c35c37ce95 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-56023-1034083490-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 14:40:54 2002; Return-Path: <sentto-2242572-56023-1034083490-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): [not sure what the rules for crossposting between the two groups is...;   my reasoning is that it's a major newspaper reporting evidence of;   alien life so.... /t]
## Header (preview): From ilug-admin@linux.ie  Tue Oct  8 14:39:48 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview):  I seem to be having a little trouble with it. My printers.conf is:; ; <DefaultPrinter lp>
## Header (preview): From ilug-admin@linux.ie  Tue Oct  8 14:40:20 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-10-08 at 14:13, John Moylan wrote:; > Hmm, speaking of cheap machines etc, has anyone tried this sort of ; > thing: http://www.mini-itx.com/projects/humidor64/ ? or more importantly
## Header (preview): From solarion@1starnet.com  Wed Aug 28 10:53:15 2002; Return-Path: <solarion@1starnet.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): ------------------------ Yahoo! Groups Sponsor ---------------------~-->; 4 DVDs Free +s&p Join Now; http://us.click.yahoo.com/pt6YBB/NXiEAA/MVfIAA/7gSolB/TM
## Header (preview): From wt046@victoria.tc.ca  Wed Aug 28 10:53:27 2002; Return-Path: <wt046@victoria.tc.ca>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002 MICGRANGER@aol.com wrote:; ; > Concerning this mail, what is your intention?
## Header (preview): From billjac@earthlink.net  Wed Aug 28 10:53:21 2002; Return-Path: <billjac@earthlink.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): David asked:; > My wife noticed something odd.  The nearly-full moon was about 30; > degrees above the horizon.  There was a notable glow on the horizon,
## Header (preview): From felinda@frogstone.net  Wed Aug 28 10:53:37 2002; Return-Path: <felinda@frogstone.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >peter fwded:; >>Finally, Constable Evans hurled a thong at the animal, hitting it on the; >>head.
## Header (preview): From jkahila@world.std.com  Wed Aug 28 10:53:34 2002; Return-Path: <jkahila@world.std.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >David asked:; >> My wife noticed something odd.  The nearly-full moon was about 30; >> degrees above the horizon.  There was a notable glow on the horizon,
## Header (preview): From Stewart.Smith@ee.ed.ac.uk  Wed Aug 28 10:53:44 2002; Return-Path: <Stewart.Smith@ee.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > An illusionist has emerged after 24 hours underwater in a case in New York's; > Times Square.;
## Header (preview): From Stewart.Smith@ee.ed.ac.uk  Wed Aug 28 10:53:47 2002; Return-Path: <Stewart.Smith@ee.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > So now Osama bin Laden is Hitler. And Saddam Hussein is Hitler. And; > George Bush is fighting the Nazis. ;
## Header (preview): From robin.hill@baesystems.com  Wed Aug 28 10:53:58 2002; Return-Path: <robin.hill@baesystems.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002 10:15:36 -0500 (EST); Jay Lake <jlake@jlake.com> wrote:;
## Header (preview): From timc@2ubh.com  Wed Aug 28 10:54:08 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Tuesday, 27 August, 2002, 21:35 GMT 22:35 UK; Cambodia temple ruins yield treasure;
## Header (preview): From timc@2ubh.com  Wed Aug 28 10:54:30 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Britons stand tall, if slightly heavy, in Europe; ; John Carvel, social affairs editor
## Warning in strsplit(email_text, "\n"): unable to translate 'From martin@srv0.ems.ed.ac.uk  Wed Aug 28 10:54:40 2002
## Return-Path: <martin@srv0.ems.ed.ac.uk>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 54F97441...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00180.1d7edb742cfbd5d48881c99a8e03cccd - missing value where TRUE/FALSE needed
## Header (preview): From martin@srv0.ems.ed.ac.uk  Wed Aug 28 10:54:46 2002; Return-Path: <martin@srv0.ems.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): The Electronic Telegraph; ;  Six arrested for attacking Palio jockey who defected
## Header (preview): From timc@2ubh.com  Wed Aug 28 10:54:56 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hamza's horrid - but we must tolerate him; ; Rod Liddle
## Warning in strsplit(email_text, "\n"): unable to translate 'From timc@2ubh.com  Wed Aug 28 10:55:08 2002
## Return-Path: <timc@2ubh.com>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 31D4F43F99
##  for <zzzz@localhos...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00183.54d98788fca5892267d8dfe4d09b2bbf - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From mephistopheles29@hotmail.com  Wed Aug 28 10:55:16 2002
## Return-Path: <mephistopheles29@hotmail.com>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00184.4534b61b19d6102fe241eecf0a436a35 - missing value where TRUE/FALSE needed
## Header (preview): From martin@srv0.ems.ed.ac.uk  Wed Aug 28 10:55:21 2002; Return-Path: <martin@srv0.ems.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > Sheikh Abu Hamza al-Masri, our maddest of mad mullahs and a cartoon bogeyman; > to scare the kiddies, spent a quiet and contemplative bank holiday playing; > with his own children in Victoria Park, Hackney.
## Warning in strsplit(email_text, "\n"): unable to translate 'From martin@srv0.ems.ed.ac.uk  Wed Aug 28 10:55:27 2002
## Return-Path: <martin@srv0.ems.ed.ac.uk>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 506A0441...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00186.7fb6108d51b6cf37e682b16713376f98 - missing value where TRUE/FALSE needed
## Header (preview): From skitster@hotmail.com  Wed Aug 28 10:55:28 2002; Return-Path: <skitster@hotmail.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): The hunting community showing, yet again, how utterly out of touch they ; are....(though the anti-Esso sign on the Long Man made me smirk last week);
## Header (preview): From Steve_Burt@cursor-system.com  Wed Aug 28 10:55:32 2002; Return-Path: <Steve_Burt@cursor-system.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >JUST as the pyramids of Egypt were built in honour of great kings, it was; >fitting that sandy replicas were created on Weymouth beach in memory of the; >king of the castle. Fred Darrington, who became the world's most famous
## Header (preview): From tony@svanstrom.com  Wed Aug 28 11:02:33 2002; Return-Path: <tony@svanstrom.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002 the voices made Robin Lynn Frank write:; ; > > Tony Svanstrom, on SpamAssassin-talk, noted this US patent:
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:50:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >>>>> "M" == Mike Masnick <mike@techdirt.com> writes:; ;     M> In which world are we talking about?  That may be true for the
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:50:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > Ultimately, there was a big; > disagreement about how to sell the product (sales guys wanted to sell; > the thing for a gazillion dollars to megaclients, but we thought it
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:50:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): >>>>> "A" == Adam L Beberg <beberg@mithral.com> writes:; ;     A> I'm not displeased you're trying to help, just frustrated that
## Header (preview): From fork-admin@xent.com  Wed Aug 28 11:30:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview):  From the local paper this morning.; "Canadians eat about seven times as many doughnuts per capita"... (as ; Americans) . D'oh!
## Header (preview): From barbarabarrett@orchidserve.com  Wed Aug 28 11:19:29 2002; Return-Path: <barbarabarrett@orchidserve.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > > Barbara Blithered;; > > Others indicators this was a late invention are the use of the f rune; > > not only for "f", but inverted to mean "ff" (the welsh "v" phoneme) -
## Header (preview): From barbarabarrett@orchidserve.com  Wed Aug 28 11:19:35 2002; Return-Path: <barbarabarrett@orchidserve.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > Martin Mentioned:; > >I've used this a few times and can thoroughly recommend it. It really ; > >doeswork. Frankly, the only drawback is finding too much stuff.
## Header (preview): From timc@2ubh.com  Wed Aug 28 11:30:48 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): CAM'RON  associate  JUELZ SANTANA  has vehemently defended a lyric on the; forthcoming album by the pair's  DIPLOMATS  crew that pays tribute to; September 11 hijacker  OMAR ATTA
## Header (preview): From martin@srv0.ems.ed.ac.uk  Wed Aug 28 11:30:56 2002; Return-Path: <martin@srv0.ems.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > CAM'RON associate JUELZ SANTANA has vehemently defended a lyric on the; > forthcoming album by the pair's DIPLOMATS crew that pays tribute to; > September 11 hijacker OMAR ATTA
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:47:27 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hey,; I has just been given an old Toshiba CS100 with earliest pentium and 400mb; of HD but only a floppy drive on it, its got Win3.1 which is funny to see
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:47:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi,all:; ; Does anyone know how to list the biggest file in my
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:47:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002, Jon wrote:; ; > I has just been given an old Toshiba CS100 with earliest pentium and 400mb
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:47:51 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): If you're not in Doolin, beg, borrow, or steal your way there before; the LBW folk depart. It's far too much fun.;
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:47:49 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Inn Share's [shareinnn@yahoo.com] 22 lines of wisdom included:; > ; > Hi,all:
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:00 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Philip Reynolds wrote:; >>Does anyone know how to list the biggest file in my; >>root directory?or the second biggest ..etc...
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:11 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002, David Neary wrote:; ; > > Actually the following would be in some way sensible:
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:15 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Might just take a trip over there later tomorrow, it is after all only; on my backdoor-step...;
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:25 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi,; ; I've got an normal 3.5" CD-RW IDE drive that I'd like to be able to use with a
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:30 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Darren Kenny wrote:; > Hi,; >
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:39 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Philip Reynolds wrote:; > Inn Share's [shareinnn@yahoo.com] 22 lines of wisdom included:; > >
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:43 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Tue, Aug 27, 2002 at 11:38:00PM +0100, Vincent Cunniffe mentioned:; > There is absolutely no way to use a conventional 3.5" drive with a; > laptop directly. However, you can get an external firewire or USB
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:51 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Ok, Iknow this is blatantly OT but I'm beginning to go insane.; Had an old Dell Dimension XPS sitting in the corner and decided to; put it to use, I know it was working pre being stuck in the
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:48:59 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): John P. Looney wrote:; >>There is absolutely no way to use a conventional 3.5" drive with a; >>laptop directly.
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:04 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I vote usb 1.1 as the chances are the cdr drive is not over 8x write and; thus fireware is of no real use...; but i cant see how you are going to get it working without a cradle. I cant
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:13 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > -----Original Message-----; > From: Aherne Peter-pahern02 [mailto:peter.aherne@motorola.com]; > Sent: 28 August 2002 09:29
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:20 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): > > Ok, Iknow this is blatantly OT but I'm beginning to go insane.; > > Had an old Dell Dimension XPS sitting in the corner and decided to; > > put it to use, I know it was working pre being stuck in the
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Aug 28 10:49:25 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 684BD44158
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00215.d09b3f3c0df56258c17c3de4dfbfc6c6 - missing value where TRUE/FALSE needed
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:27 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hello folks!; I'm new to Linux, so here goes...; I've been trying to get connected to the outside world through my modem.
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:32 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Paul Jakma wrote:; > On Tue, 27 Aug 2002, David Neary wrote:; >
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Aug 28 10:49:36 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id AAE4B44155
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00218.17547ce08d682678c539484cf094982d - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Aug 28 10:49:36 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 968644415F
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00219.642f44312e1eaf0fbecf90d6b39876d9 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Aug 28 10:49:47 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 022664415B
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00220.7c18420ed3257e8630e67dd0045f6563 - missing value where TRUE/FALSE needed
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:49:48 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): I'm not familiar with Dell Dimension XPS, and, to be honest, not familiar; with any brand-name computers. Most of my experience is China; motherboards, but I've seen same behavior once. Changing the battery helps
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 10:50:01 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): On Fri, Aug 23, 2002 at 09:26:47AM +0100, Padraig Brady wrote:; [...]; > probably a bit old, 7.3 and 8.0 are out.
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Aug 28 10:45:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi all,; ; I've decided at last to test the ALSA sound drivers. As usual the result is
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 11:51:59 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): While I was playing with the past issues, it annoyed me that there was; no easy way to make the log stop growing (I don't mean to truncate it,; I mean to just freeze it for a while).
## Header (preview): From mcardier@hotmail.com  Wed Aug 28 11:52:09 2002; Return-Path: <mcardier@hotmail.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): LIMA, Peru (Reuters) -- Lina Medina's parents thought their 5-year-old daughter had a huge abdominal tumor and when shamans in their remote village in Peru's Andes could find no cure, her father carried her to hospital. ; ; Just over a month later, she gave birth to a boy.
## Header (preview): From Steve_Burt@cursor-system.com  Wed Aug 28 12:02:23 2002; Return-Path: <Steve_Burt@cursor-system.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Barbara wrote:; Pictish pictograms (still undeciphered); -----------------------
## Header (preview): From robert.chambers@baesystems.com  Wed Aug 28 12:22:43 2002; Return-Path: <robert.chambers@baesystems.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): --- In forteana@y..., "Martin Adamson" <martin@s...> wrote:; > For an alternative, and rather more factually based, rundown on ; Hamza's
## Header (preview): From timc@2ubh.com  Wed Aug 28 13:03:48 2002; Return-Path: <timc@2ubh.com>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): 2.5ft lizard 'abandoned' at resort; ; Holidaymakers at a seaside resort were stunned to find a 2.5ft lizard
## Warning in strsplit(email_text, "\n"): unable to translate 'From timc@2ubh.com  Wed Aug 28 13:03:49 2002
## Return-Path: <timc@2ubh.com>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 9686143F9B
##  for <zzzz@localhos...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00229.5ee5fd3867d69cd25a5fde771fda0094 - missing value where TRUE/FALSE needed
## Header (preview): From martin@srv0.ems.ed.ac.uk  Wed Aug 28 13:34:43 2002; Return-Path: <martin@srv0.ems.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Evening Standard - 28 August 2002; ; [Deft use of Fortean Unit of Measurement in 2nd para - MA]
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Aug 28 13:45:01 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Hi,; ; some time now the following messages were haunting me:
## Header (preview): From andy@r2-dvd.org  Wed Aug 28 13:55:25 2002; Return-Path: <andy@r2-dvd.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Big cats are on the loose in Britain and breeding their way towards record; numbers, a monitoring group has claimed. ; The British Big Cats Society said it has received more than 800 reports of
## Header (preview): From andy@r2-dvd.org  Wed Aug 28 13:55:26 2002; Return-Path: <andy@r2-dvd.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): US soldiers on peacekeeping duties in the future could find that a portable; translation device will be an essential part of their equipment. ; Scientists at Carnegie Mellon University have developed a prototype of a
## Warning in strsplit(email_text, "\n"): unable to translate 'From timc@2ubh.com  Wed Aug 28 13:55:30 2002
## Return-Path: <timc@2ubh.com>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id ECE7343F9B
##  for <zzzz@localhos...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00234.335356ba4b116d347be3199b40cdaed2 - missing value where TRUE/FALSE needed
## Header (preview): From andy@r2-dvd.org  Wed Aug 28 13:55:31 2002; Return-Path: <andy@r2-dvd.org>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Not fortean, but a moment in time all the same...; ; http://news.bbc.co.uk/1/hi/entertainment/film/2220972.stm
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Aug 28 13:55:22 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id EE8BC43F9B
##  for <z...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00236.0d42e8e99de86aae42a4f3e3cdc2465b - missing value where TRUE/FALSE needed
## Header (preview): From ilug-admin@linux.ie  Wed Aug 28 14:05:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): ive just gotton myself a modem (no its not a winmodem, yes im sure) it dials; the internet grant using the RedHat PPP Dialer... and i can ping the server; i dial into but i cant get any furthur than that server? any ideas?
## Header (preview): From Stewart.Smith@ee.ed.ac.uk  Wed Aug 28 14:15:58 2002; Return-Path: <Stewart.Smith@ee.ed.ac.uk>; Delivered-To: zzzz@localhost.netnoteinc.com
## Body (preview): Martin Adamson wrote:>>And we know how unbiased MEMRI is, don't we....; >>; >
## Header (preview): From sentto-2242572-53752-1031262644-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:46 2002; Return-Path: <sentto-2242572-53752-1031262644-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): >; >>  (CNSNews.com) - A pro-family group in Cincinnati that has pressured; >>  two area hotels to stop showing adult pay-per-view movies has vowed
## Header (preview): From sentto-2242572-53806-1031307758-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:22 2002; Return-Path: <sentto-2242572-53806-1031307758-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): the latest -; http://news.bbc.co.uk/1/hi/world/africa/2240487.stm;
## Header (preview): From sentto-2242572-53767-1031270245-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:49 2002; Return-Path: <sentto-2242572-53767-1031270245-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Near the end of his *Memoirs of Extraordinary Popular Delusions and the; Madness of Crowds* (1851), Charles Mackay discusses various catch phrases; briefly popular in mid-19th-century London. One of them, he observes,
## Header (preview): From sentto-2242572-53755-1031262956-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:54 2002; Return-Path: <sentto-2242572-53755-1031262956-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > I've decided that I ought to put some of my writing samples on-line for; > potential employers to mock. And I don't want to pay for it. There are still; > a couple dozen places to do this, do any of you have preferences?
## Header (preview): From sentto-2242572-53763-1031265221-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:55 2002; Return-Path: <sentto-2242572-53763-1031265221-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Of course, everyone knows that Owlman is a work of fuggin` genius; ;
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-53808-1031308225-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:49:00 2002
## Return-Path: <sentto-2242572-53808-1031308225-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00244.d6a35c3356b3796b5ddc77ed1b1995e2 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-53807-1031307957-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:48:58 2002; Return-Path: <sentto-2242572-53807-1031307957-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > Zimbabwe has dropped objections to accepting genetically modified (GM) grain; > so that urgently-needed food aid can be delivered, says the UN food agency.;
## Header (preview): From sentto-2242572-53810-1031308774-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:49:30 2002; Return-Path: <sentto-2242572-53810-1031308774-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > Yes, confirming what I said in my last message. Ah! I see where the problem; > lies! You seem to be labouring under the misapprehension that Zimbabwe and; > Zambia are the same country.
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-53809-1031308404-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Fri Sep  6 11:49:03 2002
## Return-Path: <sentto-2242572-53809-1031308404-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: zzzz@localhost.spamass...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00247.e14fcbf137267399278507b469811f0a - missing value where TRUE/FALSE needed
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:04 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hi all,; ; Saw this on the register this morning,
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:08 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Quoting Waider (waider@waider.ie):; ; > Niall Sheridan wrote:
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:17 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On 0020 +0100 %{!Thu, Sep 05, 2002 at 11:53:32PM +0100}, Darragh wrote:; > the help that I received today.  Then though I tried to build them.  I; > started by trying the w3 program.  I used the following lines which produced
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:27 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hello all,; Firstly I'd like to thank all of you for the fast and very helpful feedback; that I got to my question today.  I have one more question though.  I
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:19 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Quoting kevin lyda (kevin+dated+1031593647.e87527@ie.suberic.net):; ; > anyone here have experience with windows cvs clients accessing a cvs
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:51 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hello again. I tried all the suggestions for the PCTel driver and at the end of it, everything still goes smoothly until I type "make" after I get the output from the ./configure. ; ; However, there were a couple of things I noticed along the way. After typing
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:30 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On 0020 -0700 %{!Thu, Sep 05, 2002 at  3:17:36PM -0700}, eric nichols wrote:; > Hello again. I tried all the suggestions for the PCTel driver and at; > the end of it, everything still goes smoothly until I type "make"
## Header (preview): From ilug-admin@linux.ie  Fri Sep  6 11:40:54 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hi All,; ; I have a question which is a bit tricky and was
## Header (preview): From secprog-return-484-zzzz=spamassassin.taint.org@securityfocus.com  Fri Sep  6 15:24:57 2002; Return-Path: <secprog-return-484-zzzz=spamassassin.taint.org@securityfocus.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): take a look at http://www.pcworld.com/news/article/0,aid,102881,00.asp; ;  Andrey                            mailto:andr@sandy.ru
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:09 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, Oct 08, 2002 at 11:51:54AM -0700, Elias wrote:; > So, given the apparent commonality of these occurances, companies appear ; > to be losing a large amount of money by mailing these tiny checks out.
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Working this loose knit fashion is what keeps the Mekons so exciting, ; Langford said. "When the Mekons was our whole day job, it became a ; drudgery," he said. " Sometimes we get bogged down and trapped. But we're
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): The academic discipline of Software Engineering was launched at a conference; sponsored by NATO, at Garmisch, Germany, in October, 1968. Intriguingly, the; term Software Engineering was chosen to be deliberately provocative -- why
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): The Disappearing Alliance; By Dale Franks 10/08/2002;
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): OK, lets break this down into the Kevin Smith worldview taht equate; everything with Star Wars...;
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): So, given the apparent commonality of these occurances, companies appear ; to be losing a large amount of money by mailing these tiny checks out. ; Why can't they simply credit the account in question on the next bill?
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): > From: fork-admin@xent.com [mailto:fork-admin@xent.com] On Behalf Of R.; A.; > Hettinga
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Oct  9 10:55:52 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESMTP id 4D30016F6A
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00265.d0ebd6ba8f3e2b8d71e9cdaa2ec6fd91 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Oct  9 10:55:35 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESMTP id A033516F69
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00266.edda19cbe2bb12d6aca8f9550b870824 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:56:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): At 12:05 PM 10/4/28 -0400, Stephen D. Williams wrote:; ; >Date: Wed, 04 Oct 2028 12:05:01 -0400
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:53:55 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hi All,; ; Anyone ever try connecting at 1200bps in Linux? I've got a USR 56K
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:53:57 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Colin Nevin wrote:; > ; > Hi All,
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:53:55 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): zzzz@spamassassin.taint.org (Justin Mason) writes:; ; > /dev/fd/0 is STDIN -- filedescriptor 0.  Looks like the PS file wants
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Oct  9 10:54:27 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESMTP id 1ECDE16F22
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00271.b67b5b37ce874d5ccea3391922f14506 - missing value where TRUE/FALSE needed
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:53:59 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Quoting Breathnach, Proinnsias (Dublin) (breatpro@exchange.ie.ml.com):; ; > Is there any reliable way to calculate your connection speed if you don't
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:54:31 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 8 Oct 2002, John Moylan wrote:; > Hmm, speaking of cheap machines etc, has anyone tried this sort of; > thing: http://www.mini-itx.com/projects/humidor64/ ? or more importantly
## Header (preview): From ilug-admin@linux.ie  Wed Oct  9 10:54:29 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Quoting Paul Linehan (plinehan@yahoo.com):; ; > The point here is that (under French law) the author can change the
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:37 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Matthias Haase wrote:; > The bytecode-interpreter *is* disabled on RH8, defined at line 3 in; > the Specfile of the SRPM.
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:43 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Any one out their have any RPMs for the new KVim that was just released ; that'd be suitable for RH7.3?;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:47 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Laurent Papier wrote:; ; >On Tue, 8 Oct 2002 16:24:06 +0200
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:49 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, Oct 08, 2002 at 04:36:13PM +0200, Matthias Saou wrote:; > Two new things today :; >
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Matthias Haase wrote:; > The recompile of the SPRM failed for me with:; > #----
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:49:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Mon, Oct 07, 2002 at 11:05:21PM +0200, Matthias Saou wrote:; > I've put up a new Red Hat Linux 8.0 build of nessus here :; > http://ftp.freshrpms.net/pub/freshrpms/testing/nessus/
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:50:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Since libdvdcss-1.2.0, I have been unable to play DVDs using ogle, xine,; vlc, or mplayer.  They all show a scrambled picture with (VERY) choppy; audio.  When I run xine I see tons of these in the console:
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:51:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): I posted about this last week, and I'm still stumped.  apt-get is just; not working for me, and I can't figure out what the problem is.;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:51:41 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-10-07 at 13:28, Matthias Saou wrote:; ; > I've never heard of any CD-ROM or DVD-ROM drive having problems with DMA...
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:51:43 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-10-08 at 04:48, Panu Matilainen wrote:; > On Mon, 7 Oct 2002, Jesse Keating wrote:; >
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:51:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-10-08 at 10:36, Matthias Saou wrote:; > Hi there,; >
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:51:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 08 Oct 2002 13:05:53 -0700; Ben Liblit <liblit@eecs.berkeley.edu> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:52:30 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): I wrote:; > [The bytecode interpreter] may improve non-antialiased rendering, but; > only at the expense of making a mess of antialiased rendering.
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:52:31 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Chris wrote :; ; > On Tue, 2002-10-08 at 10:36, Matthias Saou wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:52:07 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): On Tue, 08 Oct 2002 23:15:07 -0700; Ben Liblit <liblit@eecs.berkeley.edu> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:53:11 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Hi.; ; Brian Fahrlander <kilroy@kamakiriad.com> wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 10:53:15 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Brian wrote :; ; >      OK, it's now time to work out the PGP securing of apt repository
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Wed Oct  9 10:53:22 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: zzzz@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by spamassassin.taint.org (Postfix) with ESM...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00292.d70b6d753352d01060579b1c34df4e4d - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-56027-1034088329-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 17:02:17 2002; Return-Path: <sentto-2242572-56027-1034088329-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Looks and sounds a hell of a lot like Clare's cat, Violence...; ; A tall tail or is it a prowling panther?
## Header (preview): From sentto-2242572-56029-1034088748-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 17:02:22 2002; Return-Path: <sentto-2242572-56029-1034088748-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): Tuesday, 8 October, 2002, 13:53 GMT 14:53 UK; Quiz: Know your Cockney Rhyming Slang?;
## Header (preview): From sentto-2242572-56028-1034088521-zzzz=spamassassin.taint.org@returns.groups.yahoo.com  Tue Oct  8 17:02:19 2002; Return-Path: <sentto-2242572-56028-1034088521-zzzz=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: zzzz@localhost.spamassassin.taint.org
## Body (preview): An investigation has been launched after punch bags on sale in Greenwich ; were found to be stuffed with incontinence pads and bandages.;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sat, 24 Aug 2002, Adam L. Beberg wrote:; ; --]And yet STILL noone is out there creating _public domain_ content. Is there
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:31:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > If the creator didnt say you could have it without paying, it's theft, so; > simple, hell that's even in all the major holy books.;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Lucas Gonze:; >Senders should vary the recipient list to include non-targets, like party ; >officials, and to exclude targets enough to give them plausible
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Russell Turpin wrote:; > On the receiving side,; > my email client distinguishes between messages
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > From: fork-admin@xent.com [mailto:fork-admin@xent.com] On Behalf Of; > L. Beberg;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Aug 26 15:32:24 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B7AB64416F
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00302.9aa28800eefcb167ac80f4b6b1e939d6 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Remember I didn't say it was necessarily a good source, just that it; looked good.;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sat, 24 Aug 2002 11:07:00 -0700, "John Hall" <johnhall@evergo.net>; said:; > Ran across a site which claimed to explain the original meaning of the
## Header (preview): From fork-admin@xent.com  Mon Aug 26 15:32:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 16:02:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>From what I read, the rest of it looked quite good so it does seem odd; they would make the seemingly incorrect blanket statement about the; Hebrew for "steal". One possibility is that the page is a summary of
## Header (preview): From fork-admin@xent.com  Mon Aug 26 16:46:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Does anyone here know if the Computational Recreations columns from ; Scientific American in the 70's/80's were compiled into a book or two? I ; think I remember Martin Gardner publishing the earlier Mathematical
## Header (preview): From fork-admin@xent.com  Mon Aug 26 16:57:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hire a really talented skywriter to doodle nudie pics in the sky and see; if they figure out what to charge you with. Exactly how far into the sky; does the border of your local district reach?
## Header (preview): From fork-admin@xent.com  Mon Aug 26 18:01:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On 26 Aug 2002, RossO wrote:; ; --]Does anyone here know if the Computational Recreations columns from
## Header (preview): From fork-admin@xent.com  Mon Aug 26 18:01:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): R. A. Hettinga wrote:; > And then there was the one from Prairie Home Companion:; >
## Header (preview): From fork-admin@xent.com  Mon Aug 26 19:34:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Adam L. Beberg wrote:; > Fair use needs to be clarified a bit;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 19:34:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): So, last night around 5:30AM I'm woken up by a loud *craaack*, followed by; one of the most dreaded sounds a homeowner ever hears: vast quantities of; water spilling onto the floor. The water is coming from the bathroom, the
## Header (preview): From fork-admin@xent.com  Mon Aug 26 19:44:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002, Jim Whitehead wrote:; --]a sledgehammer)? We hadn't done anything unusual to the toilet in the recent; --]past -- just normal use. I've *never* heard of this happening to anyone I
## Header (preview): From fork-admin@xent.com  Mon Aug 26 19:54:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): At 01:12 AM 8/24/02 -0700, Adam L. Beberg wrote:; ; >If the creator didnt say you could have it without paying, it's theft, so
## Header (preview): From fork-admin@xent.com  Mon Aug 26 20:25:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 2002-08-26 at 11:41, Mike Masnick wrote:; > ; > In which world are we talking about?  That may be true for the first sale,
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:16:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Actually, this is common. I've known a couple of; people who have suffered this. Believe it or not,; you were lucky. You were home, rather than on
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:47:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I think that this and other articles confuse Socialism with ; Bureaucracy.  Libertarianism as implemented in North America is not ; exactly the shining pinnacle of economic efficiency.
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:47:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I think that this and other articles confuse Socialism with ; Bureaucracy.  Libertarianism as implemented in North America is not ; exactly the shining pinnacle of economic efficiency.
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:47:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I think that this and other articles confuse Socialism with ; Bureaucracy.  Libertarianism as implemented in North America is not ; exactly the shining pinnacle of economic efficiency.
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:57:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): thx for the thoughts gentlemen (yes as someone said i use terms loosely) -; ; more than cool --->
## Header (preview): From fork-admin@xent.com  Mon Aug 26 21:57:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): right Mike,; ; i will agree to disagree but i take your comments to heart.  my opinion is
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:08:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Justin Mason writes:; >So IMO it's the corruption that's the problem; and corruption !=; >regulation, and corruption != socialism.   Also, over-population is really
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:08:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --------------------------------------------------------------------------; ; What is MIME?
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:18:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, 22 Aug 2002, Lucas Gonze wrote:; ; >
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:18:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi Kragen,; ;    This is an interesting analysis.  I think that there are a couple
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Aug 26 22:28:35 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B33CC43F9B
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00326.e77a07ed3bc9f0e54bc12c3ea32e25fa - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:28:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): There's been well documented articles, studies of the; French tax laws, corporate governance, and financial; oversight that 1) dont' easily allow for ISOs, the root
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:38:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Doom 3 will be based on a peer to peer architecture says; CmdrTaco quoting Ant quoting Carmack.  ;
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:38:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I finally let go of my Irix Magic desktop and window manager; and evaluated several other window managers. Having lost my 10 years; of customization with my X10 and then X11 desktop at one point
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:38:56 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): More articles that support my fantasy that Irvine is the; center of the universe.  We've got the corner on electric; cars, fuel cells, two types of Nobel winning physics,
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:49:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This message was sent to you from http://www.idg.net; ; Geege would like you to read the story below:
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:49:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 2002-08-20 at 15:01, Ian Andrew Bell wrote:; > ; > Yet, despite all of this intense regulation and paper pushing, as
## Header (preview): From fork-admin@xent.com  Mon Aug 26 22:59:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sat, 2002-08-24 at 08:04, Gregory Alan Bolcer wrote:; > There's been well documented articles, studies of the; > French tax laws, corporate governance, and financial
## Header (preview): From fork-admin@xent.com  Tue Aug 27 00:33:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Jim Whitehead wrote:; > So, after shutting off the water and mopping up, I was left to ponder what; > are the odds of having mechanical failure of a large rectangular porcelain
## Header (preview): From fork-admin@xent.com  Tue Aug 27 00:53:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): John Hall:; >Ran across a site which claimed to explain the original meaning of the; >Ten Commandments.  It seems some of those meanings have evolved a bit, too.
## Header (preview): From fork-admin@xent.com  Tue Aug 27 02:14:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002, Joseph S. Barrera III wrote:; ; > Adam L. Beberg wrote:
## Header (preview): From fork-admin@xent.com  Tue Aug 27 02:35:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Adam L. Beberg wrote:;  > Forwarding me stuff from a list is hardly handing me a job.;
## Header (preview): From fork-admin@xent.com  Tue Aug 27 03:46:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002, Geege wrote:; ; > Latest Rambus memory plus fast bus appear to give Intel's newest P4 the jolt it needs.
## Header (preview): From fork-admin@xent.com  Tue Aug 27 04:17:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002, Geege wrote:; ; > Summary:
## Header (preview): From fork-admin@xent.com  Tue Aug 27 05:18:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): What are you trying to sell???? What is the Value???; ; Example...Does Pratchett sell paper bound by glue or does he sell stories?
## Header (preview): From fork-admin@xent.com  Tue Aug 27 06:29:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): (Via Robot Wisdom)   Maybe you UC folk know these people?; ; http://www.eurekalert.org/pub_releases/2002-08/lcc-sph082202.php
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Aug 27 10:35:49 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B96A943F9B
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00342.e6c781df2ebba44a429b49b86b376559 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Aug 27 11:06:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): UW Email Robot said:; ; > What is MIME?
## Header (preview): From fork-admin@xent.com  Tue Aug 27 17:34:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Justin Mason writes:; > Has anyone figured out what's up with this?  Does someone out there; > think that FoRK needs some MIME tutoring?
## Header (preview): From fork-admin@xent.com  Wed Aug 28 14:47:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > Now, to do this, we all know they have to be cracking the strong crypto used; > on all transaction in order to process them... So this has some preaty heavy; > implications, unless it's just BS.
## Header (preview): From fork-admin@xent.com  Wed Aug 28 17:15:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> "O" == Owen Byrne <owen@permafrost.net> writes:; ;     O> From the local paper this morning.  "Canadians eat about seven
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Aug 28 17:25:50 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id BA87E44156
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00347.f133df7e59af41ba1c596e60dde9dc48 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Aug 28 17:56:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): JoeBar wrote:; >C is more reliable than Java??;
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:07:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> "R" == Russell Turpin <deafbox@hotmail.com> writes:; ;     R> Things aren't all that bad. I remember Vancouver as having a
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:07:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> "R" == Robert Harley <harley@argote.ch> writes:; ;     R> Depends who writes it.  One guy will write a bug every 5 lines,
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:07:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Mike Masnick wrote:; >Why is it that people don't understand that giving stuff away is a ; >perfectly acceptable tactic in capitalist businesses?  In many places, it's
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:17:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): GLM wrote:; >And a Java program, due to the extensive class libraries, will weigh; >in at 10% the number of lines of the equivalent C program.  QED.
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:28:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 2002-08-27 at 08:58, Joseph S. Barrera III wrote:; >; > C is more reliable than Java??
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:38:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Great, this is half of what I'd need to become Spider Man! Now all I need to; figure out is how to do that spider web shooting thing.;
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:49:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wed, 2002-08-28 at 09:58, Gary Lawrence Murphy wrote:; > ; > And a Java program, due to the extensive class libraries, will weigh
## Header (preview): From fork-admin@xent.com  Wed Aug 28 18:49:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): So, a new family moved in down the street, with two kids, making us very; excited that there might be a child around the same age (20 months) as our; daughter Tatum. While we're talking to the family, we discover that their
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:03:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): At 10:34 AM -0700 on 8/28/02, Jim Whitehead wrote:; ;
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:03:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> "R" == Robert Harley <harley@argote.ch> writes:; ;     R> GLM wrote:
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:03:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): First seen on Dave Winer's Scrpiting News (www.scripting.com) Details here:; ; http://www.digichapman.com/index.php?permalink=67
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): It's official, the holidays are here.  I got HTML mail from one of the ; little catalogs I've been known to purchase from....basically the front ; page of their first holiday catalog.
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > For example, take the recent CBC Olympics site: I needed to roll; > together a telnet client with a tokenizer, perl-regex preprocessing a; > stream to produce parseable XML, project that XML into relational
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:08 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We met a family in our parent-baby group with a son born a few minutes; before our daughter - not unlikely as all members were from the same; hospital. But, this family happened to have lived in the exact same
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> "J" == Jim Whitehead <ejw@cse.ucsc.edu> writes:; ;     J> You open sourced the new components you developed for this
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Eirikur Hallgrimsson wrote:; > It's official, the holidays are here.;
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:04:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Gary's news service at teledyn.com has an article on Internet Saturation.; ; Let me ask you....If you were on a rock in the middle of the Atlantic,
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:27:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Gary Lawrence Murphy said:; ; > I envy some of those posting to this list.  I've been in business for
## Header (preview): From fork-admin@xent.com  Thu Aug 29 11:37:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Eirikur Hallgrimsson said:; ; > Let me ask you....If you were on a rock in the middle of the Atlantic,
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Aug 29 16:12:04 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B817843F9B
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00368.f86324a03e7ae7070cc40f302385f5d3 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep  2 13:13:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sun, 1 Sep 2002, Bill Stoddard wrote:; ; > >
## Header (preview): From fork-admin@xent.com  Mon Sep  2 13:15:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Well Beberg, unless you're really into Anime and actually hold true; that dead people can send email, I think Geege's subject is just dandy.; Especially since she removed herself from the hive that is aol (and
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): beberg, would you rather mrsrobinson@bellsouth.net?; ; into plastics too,
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Reza B'Far (eBuilt) wrote:;  > problems.... Why do most computer scientists insist on solving the;  > same problems over and over again when there are some many more
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): "Once we thought of the Internet as this thing with infinite capabilities.; It was basically just a fad that came along.";
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sun, 1 Sep 2002, Joseph S. Barrera III wrote:; ; > Reza B'Far (eBuilt) wrote:
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sun, 1 Sep 2002, Mr. FoRK wrote:; ; > > 6.  Hardware is getting so fast that I'm not sure if the performance
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sunday 01 September 2002 08:43 pm, Reza B'Far (eBuilt) wrote:; > 3.  Java is not just a programming language!;
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use this address instead, please.; ; prerogatively,
## Header (preview): From fork-admin@xent.com  Mon Sep  2 16:22:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, Sep 02, 2002 at 03:19:13AM -0400, Eirikur Hallgrimsson wrote:; > My opinion is biased because of the disgraceful state of non-Windoze ; > browser java implementations.
## Header (preview): From fork-admin@xent.com  Mon Sep  2 23:01:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): With the increasing prevalence of web services (not that they are always a; good thing), I doubt that parsing XML will be something that will remain at; the Java application layer for long... Recent threads here on Fork
## Header (preview): From fork-admin@xent.com  Mon Sep  2 23:01:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Of course they had to do this AFTER we purcahsed these all on vhs, and yes; it is now run by the great evil empire known as disney...but we got the; new School House Rocks DVD anyway and man is it an amazing item.
## Header (preview): From fork-admin@xent.com  Mon Sep  2 23:01:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >; > Microsoft has announced that they plan to remove Java from Windows.; > They took it out of XP already and it has to be installed with a
## Header (preview): From fork-admin@xent.com  Mon Sep  2 23:01:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----Original Message-----; From: fork-admin@xent.com [mailto:fork-admin@xent.com]On Behalf Of; Robert Harley
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2 Sep 2002, Reza B'Far (eBuilt) wrote:; ; > Hmmm again.... You're telling me that you've never had a nasty bug that took
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2 Sep 2002, Reza B'Far (eBuilt) wrote:; ; > With the increasing prevalence of web services (not that they are always a
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:09 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sunday I drove from Portland down to the Woodburn Dragstrip to check out ; the NEDRA Nationals. <http://www.nedra.com/>;
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 16:06:46 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-403670396P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 16:17:02 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-398538836P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 17:45:49 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-763629846P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:03:38 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-451422450P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-users-admin@redhat.com  Fri Aug 23 11:03:42 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Thanks Tony, but I think doing it using component files will get a .signature ; by default, but I have many diferent signatures and I want to insert one of ; that signatures using a keyboard command. So for a message I will insert a
## Header (preview): From exmh-users-admin@redhat.com  Mon Aug 26 15:19:42 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): What's the trick again to have it default to showing text/plain instead of; html?;
## Header (preview): From exmh-users-admin@redhat.com  Mon Aug 26 15:24:35 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> On Sat, 24 Aug 2002, "Harlan" == Harlan Feinstein wrote:; ;   Harlan> What's the trick again to have it default to showing
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 15:25:08 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | hmmm, I assume you're going to report this to the nmh folks?; ; Yes, I will, sometime, after I look at the nmh sources and see what
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 15:25:09 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | Interesting...I don't think this was my bug.;   | It appears that Msg_Change was asked to change to message "-".;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Aug 23 11:06:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Today an apt-get upgrade holds back php (and submodules, like php-imap). ;   Running an apt-get install php to see what's up, I get:;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Aug 23 11:06:29 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, 2002-08-22 at 19:10, Troy Engel wrote:; > Today an apt-get upgrade holds back php (and submodules, like php-imap). ; >   Running an apt-get install php to see what's up, I get:
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Aug 23 11:07:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, 2002-08-22 at 19:10, Troy Engel wrote:; ; > Anyone have an idea what the heck RedHat did here, and why we're now
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Aug 26 15:21:07 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi everybody !; ; My name is Gilles, I'm 19 and I'm french. My english is very bad and I'm sorry
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Aug 26 15:21:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Thanks for this information.  I gave Alsa a try, couldn't figure out how; to enable digital out, although I'm sure if I put enough time into it,; could have gotten it working.  Also when playing mp3s in analog mode,
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Aug 26 15:25:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, ""Angles" wrote :; ; > FYI, This is how I make my ALSA rpms ... some people on the (null) list
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Aug 26 19:44:37 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, Aug 26, 2002 at 07:14:54PM +0200, Matthias Saou wrote:; > I've repackaged the new gkrellm 2.0.0 which is now ported to gtk2; > (woohoo!). Unfortunately, the plugins are incompatible with the
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Aug 26 20:15:19 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00402.8e937401f8a8a7a1c7661e076f96cd55 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Aug 27 00:43:09 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > made. Other than that, I bet you could do non-root. The following can; be scripted; > easily.
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:08 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Adam L. Beberg" <beberg@mithral.com>; >
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep  3 14:24:41 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 04D8916F3D
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00405.c838c0717624d85d5a53371fdbce5955 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 2 Sep 2002, RossO wrote:; ; > John Waylan (who was interviewed in Wired a few years back) pulled out a
## Header (preview): From fork-admin@xent.com  Tue Sep  3 14:24:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2 Sep 2002, Adam L. Beberg wrote:; ; > Battery pack, huh what???
## Header (preview): From fork-admin@xent.com  Tue Sep  3 18:04:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I stand corrected --- I'd thought I'd seen a display there listing in; the Ben Franklin museum which showed them as ranging in age from 19 to; just over 30 for the oldest, most in their early twenties.
## Header (preview): From fork-admin@xent.com  Tue Sep  3 22:20:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Another thing to note about Australia is that, while the highest income; > tax bracket (47%) isn't *that* high, it kicks in at around USD33,000.;
## Header (preview): From fork-admin@xent.com  Tue Sep  3 22:20:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 3 Sep 2002, Russell Turpin wrote:; ; > For the most part, these were angry, middle-aged men. A column in this
## Header (preview): From fork-admin@xent.com  Tue Sep  3 22:20:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I used Async IO on System V in the '87, '88 time frame.  I did it that; way cause I thought it was cool to see if I could keep the tape; spinning.
## Header (preview): From fork-admin@xent.com  Tue Sep  3 22:20:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-09-03 at 16:31, Adam L. Beberg wrote:; ; > It was a great many years before their were federal taxes in the US.
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Sep  4 11:41:40 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D9B4916F7A
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00413.e637d3bed73c6df691dc86dd61d46192 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:41:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Of course we've had select() since BSD 4.2 and poll() since System V; or so, and they work reasonably well for asynchronous I/O up to a; hundred or so channels, but suck after that; /dev/poll (available in
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:41:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ah, THIS is the car i've seen on discovery channel, but url via a lurker.; ; http://arivettracing.com/battery.html
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:42:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Adam L. Beberg wrote:; > On Tue, 3 Sep 2002, Kragen Sitaker wrote:; > [entire post included]
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:41:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 3 Sep 2002, Kragen Sitaker wrote:; ; > Of course we've had select() since BSD 4.2 and poll() since System V
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:42:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Wed Sep  4 11:42:09 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 4:12 PM +0000 on 9/3/02, Russell Turpin wrote:; ;
## Header (preview): From fork-admin@xent.com  Wed Sep  4 16:52:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Glad they finally figured this one out... Note the very careful wording, so; exhaust may be beneficial to ones health as long as you have a glass a day; with some cheese.
## Header (preview): From fork-admin@xent.com  Wed Sep  4 19:01:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hindus mourn 'monkey god'; ;
## Header (preview): From fork-admin@xent.com  Wed Sep  4 19:01:08 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hindus got 3 billion gods..... So, losing one is no; big deal, really....;
## Header (preview): From fork-admin@xent.com  Wed Sep  4 19:11:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So, like many young children, my daughter Tatum (age 21 months) *really*; likes music. She also likes to have control over her environment, and this; means she wants to be the one putting CDs into the CD player, and getting
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:30:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Our preschoolers (2 and 4) use Winamp with a Pokemon skin.  It's the; 2-yr-old who figured out he could put it into a sidebar menu so all; he need do is click there to launch their favourite MP3 playlist.
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:30:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This just blew my mind:; http://www.earthviewer.com/;
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:30:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Shouldn't a politician know not to tell the truth? Odds he's impeached by; next Monday? [ob: no-clue-how-they-remove-mayors-in-italy];
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:30:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jim Whitehead wrote:; ; >Great, this is half of what I'd need to become Spider Man! Now all I need to
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <snip>; Misc rants about finding jobs, java vs C, what makes a good programmer, etc.; </snip>
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Someone needs to tell the mayor about this:; http://www.cb-2000.com/; kinkily yours,
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SL> <snip>; SL> Misc rants about finding jobs, java vs C, what makes a good programmer, etc.; SL> </snip>
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A groys gesheft zol er hobn mit shroyre vus er hot, zol men bay im nit; fregn, un vos men fregt zol er nisht hobn, and if that aint the truth; nutin is.
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Jim Whitehead" <ejw@cse.ucsc.edu>;
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "E" == Elias Sinderson <elias@cse.ucsc.edu> writes:; ;     E> ... The strength to weight ratio of a spider is so high
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mr Fork writes:;   Jim Whitehead writes:; > > For toddlers, pressing play must cause the music to start immediately,
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 4 Sep 2002, Gordon Mohr wrote:; ; --]Hmm. Seems like every CD player should include the
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 4 Sep 2002, Mr. FoRK wrote:; --]It'd be an MP3 player with solid state storage... instant on.;
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Jim Whitehead" <ejw@cse.ucsc.edu> writes:; ; > The CD player we have combines play and pause in a single button, but
## Header (preview): From fork-admin@xent.com  Thu Sep  5 11:31:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 4 Sep 2002, Tom wrote:;  ; > A groys gesheft zol er hobn mit shroyre vus er hot, zol men bay im nit
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Sep  5 11:31:43 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 02A0716F21
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00439.982a2ff6189badfe70c2fe3c972466a2 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Sep  5 17:23:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Now for Benjamin, yea id love to have something like the amazingly cool; > Fisher Price My First (cd, casset, vasectomy, dirtybomb) products. Perhaps; > the My First Cd might work...time to let ebay do the walking.
## Header (preview): From fork-admin@xent.com  Thu Sep  5 17:23:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Eirikur said:; > This incident is an interesting microcosm of how society and law develop.; > The women of this town are attempting to regulate competition.  The social
## Header (preview): From fork-admin@xent.com  Thu Sep  5 17:23:07 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > -----Original Message-----; > From: fork-admin@xent.com [mailto:fork-admin@xent.com]On Behalf Of Karl; > Anderson
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I dunno, BB.  Women who like to be thought of this way should have the ; right to choose to be treated this way.  Men too...  ahem.  (:  My boy ; cleans, washes clothes, cooks, fixes stuff, etc, and works the same number
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's a fair trade, IMO.  Same for some mid-east bloke who's dying to marry ; American so he can start his own business.  But BB is right.  When the ; thrill is gone, she should take his shit.  LOL
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Someone has taken it.  Mostly newtel users.  I think we can take the.
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Adam Beberg writes:; > Shouldn't a politician know not to tell the truth? Odds he's impeached by;
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 5 Sep 2002 bitbitch@magnesium.net wrote:; ; > Again, these situations are great, provided everyone is aware that the
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Adam Beberg writes:; > On Tue, 3 Sep 2002, Kragen Sitaker wrote:; > > Unix acquired nonblocking I/O in the form of select() about 23 years
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 5 Sep 2002 bitbitch@magnesium.net wrote:; ; > Yet another case where 'marriage' is actually an inappropriate word
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Adam,; ; Thursday, September 05, 2002, 11:33:18 PM, you wrote:
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ah yes..; ; Yet another case where 'marriage' is actually an inappropriate word
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ouch.... hooooo....; ; Cheers,
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:41:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ...an alternative to the "kind of de-feminized, over-sized, self-centered,; mercenary-minded lady available on the British singles scene,";
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 5 Sep 2002 bitbitch@magnesium.net wrote:; ; > If guys still have silly antequated ideas about 'women's role' then
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): i agree with rob. i think if the phones (and mms is building traction in europe in handsets), this might be interesting. bottom line is will it a) help sell phones and b) bill enough time on the wcarriers networks?; ; anyone remember the polariod photo sticker fad? low quality, small in size. but kids totally dug that stuff. seems like every adolescent girl had that stuff at one point. and it never replaced or aimed to replace digital cameras or normal photographs. i don't think mms photos will be a substitute for other photography - developed at the local 1 hour joint or digital photos on your pc. i think it expands the market and forms a new category. the extent of the category size is the big question (will it be a fad or will it a sustained market). that's consumer behavior and marketing. but i don't think the technology adoption will follow a substitution of another product on the market (in this case, digital photos or normal photos). europe's the one to watch - more teenagers have wireless phones and if the pricing and marketing is right, they'll figure out what to do with it once the carriers how to figure out how to market it to them.
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): LOL!  They're not doomed at all.  Thousands of men wear cb2000s to work ; every day (along with other chastity devices).    They are not just ; decorations.  You will not get a woody or have an orgasm until your
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wednesday 04 September 2002 10:59 pm, CDale wrote:; > Someone needs to tell the mayor about this:; > http://www.cb-2000.com/
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Eugen Leitl wrote:; ; > On Thu, 5 Sep 2002 bitbitch@magnesium.net wrote:
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is preaty neat.; ; - Adam L. "Duncan" Beberg
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Kragen Sitaker wrote:; ; > Adam Beberg writes:
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): i agree with rob. i think if the phones (and mms is building traction in europe in handsets), this might be interesting. bottom line is will it a) help sell phones and b) bill enough time on the wcarriers networks?; ; anyone remember the polariod photo sticker fad? low quality, small in size. but kids totally dug that stuff. seems like every adolescent girl had that stuff at one point. and it never replaced or aimed to replace digital cameras or normal photographs. i don't think mms photos will be a substitute for other photography - developed at the local 1 hour joint or digital photos on your pc. i think it expands the market and forms a new category. the extent of the category size is the big question (will it be a fad or will it a sustained market). that's consumer behavior and marketing. but i don't think the technology adoption will follow a substitution of another product on the market (in this case, digital photos or normal photos). europe's the one to watch - more teenagers have wireless phones and if the pricing and marketing is right, they'll figure out what to do with it once the carriers how to figure out how to market it to them.
## Header (preview): From fork-admin@xent.com  Fri Sep  6 11:42:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, CDale wrote:; ; > It also depends on what the fad is or what is in style.  (:
## Header (preview): From fork-admin@xent.com  Fri Sep  6 15:28:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): these are being advertised all over the UK/ Chief come-on seems to be to the ; same people who use phones for text messaging--i.e. teenagers. "Hi, we're at ; the beach and I met this awesome guy--here's his pic"
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Fri Sep  6 15:28:09 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B5D3C16F6C
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00464.5a7f552394a07524c4aa23b06c9e5915 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Fri Sep  6 15:28:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Russell Turpin wrote:; ; > Don't swallow too quickly what you have read about
## Header (preview): From fork-admin@xent.com  Fri Sep  6 15:28:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi all,; ; We're looking for an experienced IT support person in the School of
## Header (preview): From fork-admin@xent.com  Fri Sep  6 15:28:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Related anecdote:; ; I was eating in a restaurant in chinatown in Boston.  The place was empty.
## Header (preview): From fork-admin@xent.com  Fri Sep  6 15:28:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>From the Hoax or Hack Dept:; Digital Needle - A Virtual Gramophone , a reported method to scan yourr; old LPs on a flat bed scanner and then use the resulting images to make
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Fri Sep  6 18:24:16 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 45BAE16F1A
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00469.b1d31cab7c1b3b5897393f46ce62b3e9 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Fri Sep  6 18:35:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Russell Turpin wrote:; ; > You seem not to know what a "poor man's divorce" is.
## Header (preview): From fork-admin@xent.com  Fri Sep  6 18:46:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Originally linked by Dave's Scripting News:; ; http://www.megnut.com/archive.asp?which=2002_09_01_archive.inc#000194
## Header (preview): From fork-admin@xent.com  Fri Sep  6 18:46:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Shows a picture of a wheel within a wheel galaxy).; ; The universe is a strange and wonderful place.
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Russell Turpin wrote:; --]want more kids, we have to convince people who are; --]in their twenties to become parents.
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Clearly our non-silly non-antiquated ideas about relationships have; > resulted in mostly short-duration relationships and single-parented,; > dysfunctional kids (not enough of them too boot, so to keep our
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a slightly old news story, it turns out the Chinese government has banned; all access to the Google and AltaVista search engines.;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Jim Whitehead wrote:; --]We've got Googlewhacking, Googlebombing and now we can add Googlecooking to; --]our lexicon. My mother types whatever ingredients she has on hand into
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Wrong, [VMS-like async io] makes a huge difference in even what I; > consider small programs.;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 6 Sep 2002, Eugen Leitl wrote:; ; > On Fri, 6 Sep 2002, CDale wrote:
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == Jim Whitehead <ejw@CSE.UCSC.EDU> writes:; ;     J> Seems that governments do have some power over the
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): quitcherbraggin.; ; :-)
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:52:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I recently stumbled across the contents of the journal, "Electronic; Publishing", which was published from January, 1988 through December, 1995.; All papers are available online in PDF (this was apparently one of the first
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Why should I?  (:; ; On Fri, 6 Sep 2002, Geege Schuman wrote:
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Friday 06 September 2002 06:16 am, Eugen Leitl wrote:; > I don't know what exactly is wrong, but something is definitely wrong.  ; > This is way too important to be left to just our intuition of what is
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If it's unwritten, how'm I supposed to know unless someone CALLS me up and ; tells me/  hint hint.  LOL  (:  Well, I reckon it's a written rule now, ; since it's on the internet in text format w/ your name attached, but then
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): CDale URLed thusly:; >http://www.news.harvard.edu/gazette/2000/10.19/01_monogamy.html;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert Harley:; >It is perfectly obvious that (heterosexual) promiscuity is exactly, ; >precisely identical between males and females.
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): unwritten rule.  8-); ;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): cdale is a double chocolate chip macadamia to my vanilla wafer.  wait, maybe; i'm a ginger snap.;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:54:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hah.  I guess she doesn't want everyone to know about all the kinky sex ; she and I have had.  LOL;
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:53:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Oh, well, uh, thank you, Russell.  LOL@#!  (I think?); ; On Sat, 7 Sep 2002, Russell Turpin wrote:
## Header (preview): From fork-admin@xent.com  Sat Sep  7 21:54:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Definitional nit to pick:; ; Robert Harley writes:
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Sat Sep  7 21:54:04 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 3236B16F56
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00492.3ffb38f175e41790b1f05096dbe339d8 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Sat Sep  7 22:08:12 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 0271B16EFC
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00493.29a23aaa27a825c8cfb67264b9d7aeb3 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Sun Sep  8 23:50:34 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 234FF16F18
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00494.ba6ae1d625f2a4e039f6822868ee48ad - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Sun Sep  8 23:50:35 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B841116F19
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00495.3bba63110f3a2a97ae71ce53268766cf - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Sun Sep  8 23:50:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 9/8/02 7:38 AM, "Gary Lawrence Murphy" <garym@canada.com> wrote:; >   J> ...  If you want a region of the globe mapped out to a very; >   J> high resolution (e.g. 1-meter), they can scan the area with
## Header (preview): From fork-admin@xent.com  Sun Sep  8 23:50:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert Harley:; > Gordon Mohr wrote:; > >Definitional nit to pick:
## Header (preview): From fork-admin@xent.com  Sun Sep  8 23:50:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 8 Sep 2002, Gordon Mohr wrote:; ; > OK, then. Consider a population of 1,000,000. 500,000 men each
## Header (preview): From fork-admin@xent.com  Sun Sep  8 23:51:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == James Rogers <jamesr@best.com> writes:; ;     J> An example: Being able to model RF propagation in three
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 9/8/02 7:38 AM, "Gary Lawrence Murphy" <garym@canada.com> wrote:; >   J> ...  If you want a region of the globe mapped out to a very; >   J> high resolution (e.g. 1-meter), they can scan the area with
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 9/8/02 3:16 PM, "Gary Lawrence Murphy" <garym@canada.com> wrote:; >>>>>> "J" == James Rogers <jamesr@best.com> writes:; >
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 8 Sep 2002, Eugen Leitl wrote:; ; --]doesn't look particularly difficult to do.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): who watched Lathe of Heaven?  (A&E, 8 pm EDT)  who has seen the original?; ; if it's airing now on the west coast, do catch it.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "K" == Kragen Sitaker <kragen@pobox.com> writes:; ;     K> Planning battle tactics; for this reason, the intelligence
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:21 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == James Rogers <jamesr@best.com> writes:; ;     J> ...  They aren't selling the software, which is pretty pricy as
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 9/8/02 8:09 PM, "Gary Lawrence Murphy" <garym@canada.com> wrote:; > My car is only just over 1.5 meters across and maybe 3 meters long, so; > that means roughly six pixels total surface area.  You might find a
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I agree w/ ya Tom.  That kind of thinking is SO idiotic.  Sure, gays are ; promiscuous, and so are hets, but I betcha gays are more AIDSphobic than ; hets, generally speaking....
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy cynicizes:; > Hmmm, just as I thought.  In other words, it has no practical uses; > whatsoever ;)
## Header (preview): From fork-admin@xent.com  Mon Sep  9 10:46:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == James Rogers <jamesr@best.com> writes:; ;     J> ...  The part that makes the app killer is that you can map all
## Header (preview): From fork-admin@xent.com  Mon Sep  9 14:34:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 8 Sep 2002 at 22:15, Geege Schuman wrote:; ; > who watched Lathe of Heaven?  (A&E, 8 pm EDT)  who has seen
## Header (preview): From fork-admin@xent.com  Mon Sep  9 14:34:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 8 Sep 2002, CDale wrote:; ; > I agree w/ ya Tom.  That kind of thinking is SO idiotic.  Sure, gays
## Header (preview): From fork-admin@xent.com  Mon Sep  9 14:34:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Agreed, completely.  I totally grokked the notion of unintened consequence; with the original.;
## Header (preview): From fork-admin@xent.com  Mon Sep  9 14:34:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ok i read back, thats not a typo, you mean three thousand lovers.; where do you get your data? It seems very unlikely, but if you have ; supporting evidence i'd like to see it.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 14:34:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Chris Haun wrote:; ; > ok i read back, thats not a typo, you mean three thousand lovers.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): EL> On Sun, 8 Sep 2002, CDale wrote:; ; >> I agree w/ ya Tom.  That kind of thinking is SO idiotic.  Sure, gays
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In addition, one bit of anecdotal evidence from a conversation in; 1984! in San Fransisco is hardly enough to extrapolate 500 to 3k.;
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > So Eugen, how many of your homo friends have -had- 3k lovers?; > ; > In fact, thats a general question for FoRK proper.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 8 Sep 2002, Gordon Mohr wrote:; ; --]Gary Lawrence Murphy cynicizes:
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002 bitbitch@magnesium.net wrote:; ; > So Eugen, how many of your homo friends have -had- 3k lovers?
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Lucas Gonze wrote:; ; --]3K is utter shite.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Lucas Gonze wrote:; ; > a linearly greater number of sexual partners on the order of 1.5-2X.  But
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tom wrote:; > 3k is a number that probably sounds good to some closted  homophobe with; > secret desires to be "belle of the balls". Twinks dinks and dorks, this
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): EL> On Mon, 9 Sep 2002 bitbitch@magnesium.net wrote:; ; >> So Eugen, how many of your homo friends have -had- 3k lovers?
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Eugen Leitl wrote:; ; > On Sun, 8 Sep 2002, CDale wrote:
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > This is getting better and better. You know 3K is utter shite how? ; ; I'm not going to be your spokesman, Eugen.  Figure it out yourself.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bitbitch writes:; > Listen.  If you pull numbers like that without a fact, the automagic; > assumption is yes, they were extracted out of your neither orifice.
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Just thought i'd pass this on, my favorite radio station in raleigh is ; going off the internet due to the new fees and restrictions associated ; with remaining online.  this is from the station manager and describes the
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:27:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Here are numbers that come from a study of a couple of thousand swedes, with ; no reference to sexual preference that I could find. The point would seem to ; be that (1) sexual activity follows a power curve, with a few people, a la
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:28:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Chris Haun wrote:; > ; > We would need someone to sit in the studio 24/7 writing down all this info -
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:28:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 8:16 AM -0700 on 9/9/02, Gordon Mohr wrote:; ; <Calculations elided...>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep  9 19:28:09 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 7C8DA16EFC
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00532.81180d4d1d632bb50c189b51f83921e0 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep  9 19:28:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Isn't this the story where someone's "Dream" has the ability to change; reality -- then you find the whole world is their dream?;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep  9 19:28:15 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id DAE4016F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00534.6db349fcd98d25f61e5bcc4552b45f57 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, Sep 09, 2002 at 11:01:22AM -0700, John Hall wrote:; > Why so fast?  Normal terminal velocity is much slower.;
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): more accurately: someone's dream changes reality for everyone, and; everyone's memory adjusts to perceive the new realities as a continuum,; replete with new pasts and new memories.
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Monday 09 September 2002 09:51 pm, Geege Schuman wrote; > ever notice how the feelings evoked in some dreams stick with you all; > day?i'm sure it's some neurochemical process initiated during the dream
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Any of your writing online anywhere?  Would love to take a look.  I was ; plagued with night terrors for years and tried to capture that feeling ; after waking up (if you want to call that waking up), but was never able
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "G" == Geege Schuman <geege@barrera.org> writes:; ;     G> ...  i'm sure it's some neurochemical process initiated during
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "E" == Eirikur Hallgrimsson <eh@mad.scientist.com> writes:; ;     E> Absolutely, and I've wanted to recapture it.
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Well, for one, it would free up the similar laptop I already got to; just run Amithlon (or if that wasn't so fun, bsd) to run just OpenBSD!;
## Header (preview): From fork-admin@xent.com  Tue Sep 10 11:07:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Ned Jackson Lovely wrote:; ; > In '87 a guy named Gregory Robertson noticed a fellow parachutist Debbie
## Header (preview): From fork-admin@xent.com  Tue Sep 10 18:15:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): you meant "SURPRISINGLY perceptive," didn't you?  :-); ; recent exceptionally vivid and strange dreams lead me to believe i'm
## Header (preview): From fork-admin@xent.com  Tue Sep 10 18:15:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gordon Mohr:; >It was clear you were talking about averages. But it should ; >be equally clear that that isn't what people mean when they
## Header (preview): From fork-admin@xent.com  Tue Sep 10 18:15:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "G" == Geege Schuman <geege@barrera.org> writes:; ;     G> you meant "SURPRISINGLY perceptive," didn't you?  :-)
## Header (preview): From fork-admin@xent.com  Tue Sep 10 18:15:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 10 Sep 2002, Gary Lawrence Murphy wrote:; ; --]It's a myth that we don't use parts of our brain.  We use it all,
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm not sure which way to make; the old bits call on this:;
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This article from NYTimes.com ; has been sent to you by khare@alumni.caltech.edu.;
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert Harley writes:; > >OK, then. Consider a population of 1,000,000. 500,000 men each; > >pair off with 500,000 women. Then, 1 man, let's call him "Wilt",
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): dreams-are-like-radio analogy: i program my Jetta Monsoon for Planet 93.3,; 80's 102.9, and NPR 89.9 but when i leave my local broadcast range i have to; scan for new stations. dreaming is outside my local broadcast range.
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ==; http://siliconvalley.internet.com/news/article.php/10862_1460701;
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I like this part - sounds like httpd on the client...; ; http://www.openp2p.com/pub/a/p2p/2001/04/27/xdegrees.html
## Header (preview): From fork-admin@xent.com  Wed Sep 11 13:49:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mr. FoRK writes:; > "Files can be cached on multiple systems randomly scattered around the; > Internet, as with Napster or Freenet. In fact, the caching in XDegrees is
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Sep 11 13:49:40 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1C45016F17
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00554.a01a74aee9653a7ae8d1d558c75f0a5d - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Sep 11 14:10:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "U" == Udhay Shankar N <Udhay> writes:; ;     U> At 12:32 PM 12/28/00 -0600, Adam Rifkin wrote:
## Header (preview): From fork-admin@xent.com  Wed Sep 11 14:21:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): September Haiku; ; Freezing my ass off
## Header (preview): From fork-admin@xent.com  Wed Sep 11 19:42:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): XDegrees was at the WebDAV Interoperability Testing Event last year, so; there may be some DAV under the hood there someplace.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Sep 11 19:42:14 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D5BE316F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00558.95b8c2677759a2f569a5dc0bd70b8cc0 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Sep 11 19:42:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From fork-admin@xent.com  Wed Sep 11 19:42:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dear Garrison,; ; There are at least six plans about what to do with
## Header (preview): From fork-admin@xent.com  Wed Sep 11 19:42:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 11 Sep 2002, Gary Lawrence Murphy wrote:; ; > So then why does my webhost _still_ only give me 200MB?
## Header (preview): From fork-admin@xent.com  Wed Sep 11 19:42:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hanson is always good.; ; One of my sci-fi authors is planning on slipping the following line into
## Header (preview): From fork-admin@xent.com  Wed Sep 11 20:16:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): i though this was all rather interesting, first bit of 9/11 coverage that ; i've liked.;
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Is this old bits? It should be.; ; I was browsing the local zine store here in Portland OR and found the
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gays, gay sex, gay marriage.....wooohooo its been a mano e mano week and; thursady will be the mass market consumer period on it.;
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "MIAMI, Sept. 10 -- A two-gram rock of crack; cocaine was found inside the shoe of Florida; Gov. Jeb Bush's 25-year-old daughter by workers
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): yeshterday we f*cked up our gubernatorial election, too.  results to be; contested by reno.  same six districts that were sued in 2000 still came up; gimpy.
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): meant "gubernatorial PRIMARY."; ; -----Original Message-----
## Header (preview): From fork-admin@xent.com  Thu Sep 12 13:39:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Interesting ebay item......(and no it wasnt me even though the spellingis; oddly familar);
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Sep 12 13:39:57 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1551816F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00570.d98ca90ac201b5d881f2397c95838eb2 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > (and no it wasnt me even though the spellingis; > oddly familar);
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dave Long writes:; > > (and no it wasnt me even though the spellingis; > > oddly familar)
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 2002-09-12 at 12:22, Dave Long wrote:; > <http://www.j-bradford-delong.net/movable_type/archives/000393.html>; >
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So much for carnivore ;)
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 12 Sep 2002, Gary Lawrence Murphy wrote:; ; --]
## Header (preview): From fork-admin@xent.com  Thu Sep 12 21:21:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 12 Sep 2002, Tom wrote:; ; > Yep, that ws the plan all alng with my typos, I am the only one to be
## Header (preview): From fork-admin@xent.com  Fri Sep 13 13:37:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > If the text recognition algorithm/architecture humans use is anything; > like the algorithm/structure we've been working with, the reason the; > first letter (and to a lesser extent, the last letter) is important is
## Header (preview): From fork-admin@xent.com  Fri Sep 13 13:37:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --0-1051763016-1031874793=:3397; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From fork-admin@xent.com  Fri Sep 13 20:45:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): When we were discussing Kuhn, I wrote:; ; <http://www.xent.com/pipermail/fork/2001-July/001854.html>
## Header (preview): From fork-admin@xent.com  Fri Sep 13 20:45:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I think keeping the number of middle letters consistent with the correct; > spelling is important.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Fri Sep 13 20:45:07 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 944DB16F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00581.9922b0f34aa8f51fb4adf4bf4ecf1464 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Sat Sep 14 16:17:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): As I've had to resubscribe to fork and fork-noarchive,; I guess I have to reintroduce myself.  I'm formerly; known as gbolcer at endtech dot com to the FoRK
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 16 10:42:56 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id A99B116F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00583.7db5166f3ec5a8bcf81bf1b639b48361 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep 16 10:42:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): What I understood was that the activists on the train refused to pay for; the food and other items they acquired from the Muslim vendors -- then; taunted them.
## Header (preview): From fork-admin@xent.com  Mon Sep 16 15:33:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The usual crud.  Why do morons ranting and beating their chests in the; National Review (or similar rags) merit FoRKing?
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:29:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): First, it was my understanding that they had the food before they; refused to pay.  I often have the goods in my possession before I settle; the paycheck.
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:29:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 16 Sep 2002, Stephen D. Williams wrote:; ; > It's efficient-end, not low end.  At 1Million hour MTBF, 133MB/sec,
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:29:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): the doctor wears many hats, including but not limited to a rubber skullcap; for playing water polo, a beret for making sparkling wines, and an oversized; fedora to deflect his own cigar smoke, which he regularly blows up my ...
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:29:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: Stephen D. Williams [mailto:swilliams@hpti.com]; ; >
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:30:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): John Hall wrote:; ; >>From: Stephen D. Williams [mailto:swilliams@hpti.com]
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 17 11:30:05 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id E9F7216F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00591.3bca4fff29ae5e89e2e2948401a24ab8 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:30:07 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Tue Sep 17 11:30:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 16 Sep 2002, Stephen D. Williams wrote:; ; > To make what work?  I already pointed out that a single drive is
## Header (preview): From fork-admin@xent.com  Tue Sep 17 15:09:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'd like to claim the parenthood of desktop web services,; but then there's a ton of people doing it now.  ;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 17 15:09:19 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 87A8516F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00595.7182665eb052808e2061bacbc75ed5ee - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 17 15:09:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From fork-admin@xent.com  Tue Sep 17 17:22:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "S" == Stephen D Williams <sdw@lig.net> writes:; ;     S> A) Which religion is it that can claim no foul actions in its
## Header (preview): From fork-admin@xent.com  Tue Sep 17 17:57:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy said:; > >>>>> "S" == Stephen D Williams <sdw@lig.net> writes:; >     S> A) Which religion is it that can claim no foul actions in its
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 17 18:42:38 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id E307E16F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00599.94c013ab7037d45045aafbac3389bef0 - missing value where TRUE/FALSE needed
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Tue Sep 17 18:42:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-09-17 at 12:50, Justin Mason wrote:; > What about Tibetan Buddhism BTW?  They seem like an awfully nice bunch; > of chaps (and chapesses).
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have been told to take anything read in Pravda with a grain of salt...; this article certainly looks impressive when paired together with this other; one from the associated press...
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, Sep 17, 2002 at 10:19:13AM -0700, Chuck Murcko wrote:; > Probably because we have this pesky 1st Amendment thing here. Still, ; > lots of us in the States have developed a disturbing tendency to shout
## Header (preview): From garym@canada.com  Tue Sep 17 23:29:41 2002; Return-Path: <garym@canada.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == Justin Mason <jm@jmason.org> writes:; ;     J> What about Tibetan Buddhism BTW?  They seem like an awfully
## Header (preview): From fork-admin@xent.com  Tue Sep 17 18:42:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Probably because we have this pesky 1st Amendment thing here. Still, ; lots of us in the States have developed a disturbing tendency to shout ; down or (in recent years) shackle in legal BS opinions, thoughts, and
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-09-17 at 11:16, Gary Lawrence Murphy wrote:; > >>>>> "J" == Justin Mason <jm@jmason.org> writes:; >
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > All else being equal, the terminal velocity is inversely proportional to the; > square root of air density. Air density drops off pretty quickly, and I ; > really should be doing something other than digging up the math for that. I
## Header (preview): From johnhall@evergo.net  Tue Sep 17 23:29:48 2002; Return-Path: <johnhall@evergo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: yyyy@spamassassin.taint.org [mailto:yyyy@spamassassin.taint.org]; > Sent: Tuesday, September 17, 2002 9:50 AM; > > ... we've been fighting the War on Terrorism for as long
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Luis Villa" <louie@ximian.com>;
## Header (preview): From fork-admin@xent.com  Tue Sep 17 23:29:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 12:01 PM -0700 on 9/17/02, James Rogers wrote:; ;
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:21 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Because of this:; http://hrw.org/press/2002/08/yahoo080902.htm; there are several of us who are in the BDSM lifestyle who are trying to
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At Fermi (yes I'm back there; long story), we're buying 4U systems like ; the fiscal year is ending.  We have ~20 ASA IR4US1 systems (not pushing ; them, there are some other similar units available), with 60 more on
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yes, it's nice to be back in America's flaccid state ...; ; Seems like only yesterday we were suffering electile dysfunction ...
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm a bit confused about this boycott thing.  How is what China is; doing any different than having Scientology and who ever else; state-side who takes the whim evoking the DMCA to close down foreign
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Sep 18 11:52:29 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 5CDB816F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00614.2487f80400eb954b7c3ab257771ed393 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Adam L. Beberg" wrote:; > So, who has done RSA implementation before?;
## Header (preview): From fork-admin@xent.com  Wed Sep 18 11:52:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Pity.  Reading that woman's ad and knowing Rohit for years, they sound; like a match made in heaven.  But why, oh, why, keep that shaved-head; photo on prominent display???  There are lots of photos of Rohit
## Header (preview): From fork-admin@xent.com  Wed Sep 18 14:06:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): CDale wrote:; > ; > I was wondering if anyone knows of an alternative that allows
## Header (preview): From fork-admin@xent.com  Wed Sep 18 14:06:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, Sep 17, 2002 at 09:11:01PM -0700, Paul Prescod wrote:; > Owen Byrne wrote:; > >...
## Header (preview): From fork-admin@xent.com  Wed Sep 18 14:06:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Well I don't think China could force Yahoo! to give up info.  So if they ; are so willing to give it, why wouldn't they be willing to give info to ; some silly group who may one day decide to get a hair up their ass about
## Header (preview): From fork-admin@xent.com  Wed Sep 18 17:43:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 7:13 AM -0400 on 9/18/02, Rodent of Unusual Size wrote:; ;
## Header (preview): From fork-admin@xent.com  Wed Sep 18 17:43:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "E" == Eirikur Hallgrimsson <eh@mad.scientist.com> writes:; ;     E> You just can't tell important things from a picture and a few
## Header (preview): From fork-admin@xent.com  Wed Sep 18 17:43:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wednesday 18 September 2002 06:47 am, Robert Harley wrote:; > ....and with the crucial hair feature enabled!;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gordon Mohr quoted:; ># French Writer Tried As Anti-Islam, Protest Erupts; ># By Caroline Brothers
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hear hear, Gary.  I'm living with a guy right now who I met at a party, ; emailed with for 2 weeks, then powie!  We were both looking at similar ; goals in life in general, had some attraction for each other, and decided
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Perhaps we should start a grass roots movement here on FoRK and send the ; nice lady a few emails on his behalf? Better yet, why don't we see on ; who can write the best personals ad for Rohit? I'll post the best one to
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:56 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:04:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 18 Sep 2002, R. A. Hettinga wrote:; --]I know it's not the popular choice for a lot of people, but I'd; --]suggest, um, church. :-). Like Woody Allen said, 90% of life is
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Church, AA, same diff?; ; ;-).
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 18 Sep 2002, R. A. Hettinga wrote:; ; --]Church, AA, same diff?
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 18 Sep 2002, R. A. Hettinga wrote:; --]AA Meetings the Hottest Place to Meet Women With Big Bucks;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:08 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): advice to the lovelorn haiku; ; pilots synchronicity:
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 11:06 AM 9/18/02 -0400, R. A. Hettinga wrote:; ; >Dave Farber's Interesting People list just went over to
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): less obscure haiku ; ; buy a puppy, ro!
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): And the ever popular...; ;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tom wrote:; ; >On Wed, 18 Sep 2002, R. A. Hettinga wrote:
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This sort of thing is, in my (limited?) experience, increasingly a thing ; of the past. Not one person I know has found it worth the risk to pursue ; a relationship with someone in the workplace. It's terrible to think we
## Header (preview): From irregulars-admin@tb.tf  Thu Sep 19 11:05:24 2002; Return-Path: <irregulars-admin@tb.tf>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is for those that have interacted with D Winer; ; "Dave's idea of love is fucking everyone else without so much as a reach
## Header (preview): From fork-admin@xent.com  Thu Sep 19 11:05:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >It seems good Ol' Uncle Dave is once again trying to savage anyone that; >dares to disagree with him.  It seems Ben, Kevin and Bill are making too; >strong a case.  So here we Dave's attempt to fool you into thinking they're
## Header (preview): From fork-admin@xent.com  Thu Sep 19 13:03:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Heh, ten years ago saying the exact same words was most definitely not ; "parroting the party line".;
## Header (preview): From fork-admin@xent.com  Thu Sep 19 13:14:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Chuck Murcko wrote:; ; > Heh, ten years ago saying the exact same words was most definitely not
## Header (preview): From fork-admin@xent.com  Thu Sep 19 13:26:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Chuck Murcko wrote:; >[...stuff...];
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Sep 19 16:25:51 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id C0BA816F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00644.47e9eaa5c1cac5f991f30201ae7fda6e - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:25:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Owne Byrne:; >Sure if you're willing to risk firing, lawsuits, etc. The last full time ; >job I had the sexual harassement seminar was pretty clear - yes you can
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:25:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a message dated 9/19/2002 7:46:37 AM, chuck@topsail.org writes:; ; >That means *you* can't say anything may not be FoRKed or printed or
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert Harley:; >>BTW, I wasn't aware that the 1st Amendment mandated that crap must be ; >>FoRKed.
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): We have a partnership with Webex.  We use their serivce; for cross-firewall app sharing--something that Netmeeting/Messenger; and Sametime require a lot of configuration of firewalls,
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thursday, Sep 19, 2002, at 14:51 Europe/London, Bill Kearney wrote:; ; >> From the completely unrelated but funny department...
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ben Hammersley wrote:; ; >
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Geege Schuman wrote:; > less obscure haiku ; >
## Header (preview): From fork-admin@xent.com  Thu Sep 19 16:26:21 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ahhhh Dave Winer..Seems like only yesterday fork was knee deep in; winerrants..hes gone away though...so sad (insert real honest to goshness; tears)
## Header (preview): From fork-admin@xent.com  Thu Sep 19 17:50:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Chuck Murcko wrote:; >; > > Heh, ten years ago saying the exact same words was most definitely not
## Header (preview): From fork-admin@xent.com  Thu Sep 19 17:50:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bill Stoddard wrote:; ; >>Chuck Murcko wrote:
## Header (preview): From fork-admin@xent.com  Thu Sep 19 17:50:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 19 Sep 2002, Bill Stoddard wrote:; --]How likely are you to change someone's mind by being; --]rude and disrespectful to them? Is this how to win friends and influence
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Owen Byrne writes:; > [quoting http://www.quinion.com/words/qa/qa-shi2.htm]; > *SHIVER MY TIMBERS*
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > On Thu, 19 Sep 2002, Bill Stoddard wrote:; > --]How likely are you to change someone's mind by being; > --]rude and disrespectful to them? Is this how to win friends and
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): What I meant was that neither he nor anyone else has any *authority* to ; say something can or can't be published, and make that stick, at least ; in the US, and from some descriptions, France. Of course he can say
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 19 Sep 2002, Bill Stoddard wrote:; ; --]Good points all but they don't apply in this case.  Someone is speaking and
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > For my part, I'd rather people didn't use FoRK as a place in which to dump an ; > expression of their political beliefs.;
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Kragen Sitaker" <kragen@pobox.com>;
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Just tried smartgroups: The layout of pages is pretty challenging to; use quickly, but the most interesting aspect is that once you are in,; there is no way to get out.  You can unsubscribe yourself as the sole
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, 19 Sep 2002, Mr. FoRK wrote:; --]I think it went like this: "I won't thrash you Tom, if you shiver my; --]timber..."
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 19, 2002 at 11:11:47AM -0400, Bill Stoddard wrote:; > people? Either these folks are social misfits who have no understanding of; > human interactions (else they would try more constructive means to get their
## Header (preview): From fork-admin@xent.com  Fri Sep 20 11:32:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ---------- Forwarded message ----------; Date: 19 Sep 2002 22:18:46 -0400; From: Perry E. Metzger <perry@piermont.com>
## Header (preview): From fork-admin@xent.com  Fri Sep 20 16:15:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a message dated 9/19/2002 3:45:45 PM, dl@silcom.com writes:; ; >I don't mind if people advocate nuking
## Header (preview): From fork-admin@xent.com  Fri Sep 20 16:15:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Well, it looks like Sun are going ahead with; their ubiquitous computing plans without Mithril. ;
## Header (preview): From fork-admin@xent.com  Fri Sep 20 16:16:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > On Thu, Sep 19, 2002 at 11:11:47AM -0400, Bill Stoddard wrote:; > > people? Either these folks are social misfits who have no; > understanding of
## Header (preview): From fork-admin@xent.com  Fri Sep 20 21:47:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm sure Patton used it.; ; I'm all for using it in the coming war with Iraq.
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:42:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > A world where some live in comfort and plenty, while half of the human ; > race lives on less than $2 a day, is neither just nor stable.;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:42:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "G" == Geege Schuman <geege@barrera.org> writes:; ;     G> SURELY you meant political extremes and not politics?  baisley?
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:42:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): GLM> whereas political brochures are not; the statistics clearly show; GLM> which is the greater, more senseless, and more preventable killer.;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:42:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): And of course I forget the link that I did find.; ; http://www.constitutioncenter.org/sections/news/8b4.asp
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:42:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy:; >OK, but only if you also meant religious and alcoholic extremes ;);
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You around?
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):  > help me out here.;  > You around?;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Free trade and free markets have proven their ability to lift whole; societies out of poverty"; I'm not a socio-political/history buff - does anybody have some clear
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Weird... I never thought the govmint would get into funding this. You know; 'weapons of mass destruction'. etc. etc.;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Related to the MS acquisition of XDegrees?; ; ==
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:21 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Im feeling a bit farklempt having spent the night at Todais with the; family so talk amongst yourself..here Ill give you a topic;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The pay's not good (9,300 a year), but there is insurance, a 4,700 (I ; think) off a student loan, or for future education, and non-compete status ; for any govt. job after a year's service.  I moved to New Orleans
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 9:34 PM -0700 on 9/20/02, Mr. FoRK wrote:; ;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 10:43:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It was the best of times, it was the worst of times,; it was the age of wisdom, it was the age of foolishness,; it was the epoch of belief, it was the epoch of incredulity,
## Header (preview): From fork-admin@xent.com  Sat Sep 21 15:19:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello fork,; ;   So they have Aaron Schwartz on NPR's Weekend Edition talking
## Header (preview): From fork-admin@xent.com  Sat Sep 21 15:19:03 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Chris,; ; Oh I don't know, Time-lag synchrocity?
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "f" == fork list <Mr.> writes:; ;     f> "Free trade and free markets have proven their ability to lift
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "R" == R A Hettinga <rah@shipwright.com> writes:; ;     R> At 9:34 PM -0700 on 9/20/02, Mr. FoRK wrote:
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:07 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:09 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "John Hall" <johnhall@evergo.net>;
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "R. A. Hettinga" <rah@shipwright.com>; >
## Header (preview): From fork-admin@xent.com  Sat Sep 21 20:22:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "R. A. Hettinga" <rah@shipwright.com>;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 00:25:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I went out and drew some chalk circles on my; sidewalk just so I wouldn't miss out on the experience.; I've collected half a dozen passwords &
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > As I've said before, American; > Indian Reservations are quite ; > possibly the only place on the
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "Gregory Alan Bolcer" <gbolcer@endeavors.com>;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "James Rogers" <jamesr@best.com>;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "James Rogers" <jamesr@best.com>;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Cool - I wonder what you'd look like standing in front of a bunch of; corporate executives...;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Can anyone stop talking politics long enough to let me know that,; yes, indeed, they do remember the Suburban Lawns?;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy wrote:; ; >>>>>>"R" == R A Hettinga <rah@shipwright.com> writes:
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anarchist 'Scavenger Hunt' Raises D.C. Police Ire; Sat Sep 21, 3:37 PM ET;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Some interesting quotes...; ; http://www.postfun.com/pfp/worbois.html
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): LOL you rool  (:; ; On Sat, 21 Sep 2002, Gregory Alan Bolcer wrote:
## Header (preview): From fork-admin@xent.com  Sun Sep 22 14:11:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == Joseph S Barrera, <Joseph> writes:; ;     J> Better yet, tell me where I should be listening for new music
## Header (preview): From fork-admin@xent.com  Sun Sep 22 21:57:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --------------090600030109070305070809; Content-Type: text/plain; charset=ISO-8859-1; format=flowed; Content-Transfer-Encoding: 7bit
## Header (preview): From fork-admin@xent.com  Sun Sep 22 21:57:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Oh my Janitor, boom, boom, boom."; ; The best place for new music is right where it's
## Header (preview): From fork-admin@xent.com  Sun Sep 22 21:57:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): reminds me of Cheney during the VP debates, when he declared his wealth was; not the product of government favors.;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 21:57:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A worthy study procrastination tool: ); ; A few choice phrases from ol dubya himself:
## Header (preview): From fork-admin@xent.com  Sun Sep 22 21:57:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Saturday, September 21, 2002, at 10:59 PM, Joseph S. Barrera III ; wrote:;
## Header (preview): From fork-admin@xent.com  Sun Sep 22 23:59:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Oh, they were plenty upset about the tea taxes.; ; But the crack down on colonial script certainly screwed over the
## Header (preview): From fork-admin@xent.com  Sun Sep 22 23:59:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: fork-admin@xent.com [mailto:fork-admin@xent.com] On Behalf Of; Mr.; > FoRK
## Header (preview): From fork-admin@xent.com  Mon Sep 23 12:09:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Clearly, it is US/NATO = Sun/IBM/OSS, USSR = MS; ; "Where we want you to go in our 5 year plan?"
## Header (preview): From fork-admin@xent.com  Mon Sep 23 12:09:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 23 12:09:40 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 0C92116F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00713.7b4a3ad6c8b6bbcf358ee5ee23dcdc12 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep 23 12:09:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy wrote:; >and say hello to the cool:  Oooo ... /this/ is going to cause some stir ...;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 15:00:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a message dated 9/22/2002 11:38:01 PM, rah@shipwright.com writes:; ; >the *best* way to
## Header (preview): From fork-admin@xent.com  Mon Sep 23 18:32:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):  The New York Times; September 23, 2002; High-Altitude Rambos
## Header (preview): From fork-admin@xent.com  Mon Sep 23 18:32:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Wall Street Journal; ; September 23, 2002
## Header (preview): From fork-admin@xent.com  Mon Sep 23 18:32:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [Destined to be a new reality TV Show?]; ;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 18:32:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): R. A. Hettinga wrote:; ; >-----BEGIN PGP SIGNED MESSAGE-----
## Header (preview): From fork-admin@xent.com  Mon Sep 23 18:48:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hmm, if the shoe fits... I think these five attributes could more or ; less describe various actions of the US over the past decade or so...;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > *  Too much information?; ; The saying, as I recall, is along
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >; > Sorry, Shrub, your political newspeak is falling on deaf ears. Oh, ; > sorry, maybe I should self-censor my thoughts to avoid being put in a
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Gary Lawrence Murphy wrote:; > >and say hello to the cool:  Oooo ... /this/ is going to cause; > some stir ...
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "J" == Jim Whitehead <ejw@cse.ucsc.edu> writes:; ;     J> For anyone to fully bury global warming, they would need to
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "the historical record", by which you mean *human* historical record, is; highly overrated (nigh worthless) when you are talking about geological; timescales, even on topics with as short a timescale as climate.
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): For anyone to fully bury global warming, they would have to bury the; Greens.  A Green once said that if the Spotted Owl hadn't existed they; would have had to invent it.  So it is with global warming.  Their
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >     J> For anyone to fully bury global warming, they would need to; >     J> explain why the dramatic increase in CO2 concentrations are not; >     J> increasing the global temperature.
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > "the historical record", by which you mean *human* historical record, is; > highly overrated (nigh worthless) when you are talking about geological; > timescales, even on topics with as short a timescale as climate.
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "James Rogers" <jamesr@best.com>;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "John Hall" <johnhall@evergo.net>;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:47:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --]> A Green once said that if the Spotted Owl hadn't existed they; --]> would have had to invent it.; --]A Republican once said "I am not a crook".
## Header (preview): From fork-admin@xent.com  Mon Sep 23 22:48:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "I did not have sex with that woman."; ; > -----Original Message-----
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 23 22:48:14 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 30C7916F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00733.8cd99b24ae020e6028d85ad0c4f06186 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 23 22:48:30 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1AAAD16F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00734.e37922bdfd9e3246c18322e4b07a4b23 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:01:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): How about this:   A bored FoRKer said:  "YAWN"; ; I believe Tom had it right.   Signal not noise.
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:01:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sorry... I just had a run-in with a neighbor whom I've never met before who; pigeonholed me within one minute after I asked a question - he said 'Are you; one of them environmentalists?' For some reason that narrowminded attitude
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:34:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: bitbitch@magnesium.net [mailto:bitbitch@magnesium.net]; ; >
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 23 23:34:29 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1841616F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00738.5c6ce770da4cc06ebea777b8be30abaa - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:45:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The further googlization of my screentimes....News...No not just; news...google news. I love the line that tells me how fresh/stale the news; item is....phreaking cewl.
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:56:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The damn Federalists are at it again, another bumsrush on Oregons states; rights..;
## Header (preview): From fork-admin@xent.com  Mon Sep 23 23:56:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SF Weekly:; >Nothing's more enticing than an evening cruise around San Francisco Bay, ; >and the islands, bridges, and lights of the city are especially entrancing
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:48:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 23 Sep 2002, Russell Turpin wrote:; ; --]Here's the better idea. Invite her for an afternoon
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:48:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rare Virgin Shark Births Reported in Detroit; Voice of America - 5 hours ago; A female shark has become a single mother - in the strictest sense of the
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:48:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): First, misattribution.  I did not write the blurb below.  I made one; statement about VP Cheney only, to wit, that he has a short memory.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 24 10:48:41 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id C982D16F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00745.d2df6fc9d5de220dc9b34cf04addf9e2 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:48:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anyone who doesn't appreciate both PLUCK and LUCK is only looking at; part of the equation.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 24 10:48:50 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 132EF16F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00747.39967f26d6c1cba3713e2b9f318d0531 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:48:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Of the three lying politicians, which liar would you take?; ; ----- Original Message -----
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 5:22 PM -0400 on 9/23/02, Tom wrote:; ;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 2:57 PM -0700 on 9/23/02, Mr. FoRK wrote:; ;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 23 Sep 2002, Gordon Mohr wrote:; --]; --]The best we can hope is that technological cleverness, by raising the
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Monday, September 23, 2002, at 03:25 PM, R. A. Hettinga wrote:; ; >          Green = Red.
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mr. FoRK:; >Of the three lying politicians, which liar would you take?;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Monday, September 23, 2002, at 06:51 PM, Tom wrote:; ; > Bascialy give china no choise but to shoot its own head off to stop the
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): funny. i read it as green = red, as in accounting, as in fiscally; irresponsible.  which do you think is the worse indictment - overregulation; or overspending?  there are many (dickheads) who buy into the
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 5:29 PM -0700 on 9/23/02, John Hall wrote:; ;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 7:44 PM -0400 on 9/23/02, Geege Schuman wrote:; ;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Depends on how much over spending vs. how much (and what type) over; regulation.;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 10:49:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's only 64kbps, but http://noise.ktru.org/ can be tasty.  Presently ; playing Fille Qui Mousse, Collage in Progress, and other happy nibbles.; Sounds a bit like The Avalanches, but that will change soon.
## Header (preview): From fork-admin@xent.com  Tue Sep 24 15:52:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): per john hall:; "The opinion that EITHER we are spending too much OR we have too much; regulation is pretty
## Header (preview): From fork-admin@xent.com  Tue Sep 24 15:52:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): from slate's "today's papers":  ; The New York Times and Los Angeles Times both lead with word that; a federal judge ruled yesterday that the nation's largest
## Header (preview): From fork-admin@xent.com  Tue Sep 24 15:52:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a message dated 9/23/2002 6:30:31 PM, khare@alumni.caltech.edu writes:; ; > why you're writing with a double of scotch :-)
## Header (preview): From fork-admin@xent.com  Tue Sep 24 15:52:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 24 Sep 2002 ThosStew@aol.com wrote:; ; --]Klez, most likely. It'll pick up your address and send mail to all your
## Header (preview): From fork-admin@xent.com  Tue Sep 24 15:52:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This was just *too* funny.. rotflma.; ; http://www.ozyandmillie.org/comics/om20020924.gif
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Sep 24 15:52:41 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B212716F03
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00765.ea01c46568902b1338c9685b55d77f6c - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Sep 24 17:55:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This situation wouldn't have happened in the first place if California; didn't have economically insane regulations.  They created a regulatory; climate that facilitated this.  So yes, it is the product of
## Header (preview): From fork-admin@xent.com  Tue Sep 24 17:55:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ---------- Forwarded message ----------; Date: Mon, 23 Sep 2002 09:52:44 -0700; From: mis@seiden.com
## Header (preview): From fork-admin@xent.com  Tue Sep 24 17:55:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yes, it is.  You just want to be called a liberal when you really; aren't.;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 17:55:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In a message dated 9/24/2002 11:24:58 AM, jamesr@best.com writes:; ; >This situation wouldn't have happened in the first place if California
## Header (preview): From fork-admin@xent.com  Tue Sep 24 17:55:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-09-23 at 13:53, Jim Whitehead wrote:; > ; > You have not explained why the increase in CO2 concentrations is not
## Header (preview): From fork-admin@xent.com  Tue Sep 24 23:31:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Read the article.  I'm afraid I don't understand how the transmission; prices could have hit $50/tcf.;
## Header (preview): From fork-admin@xent.com  Tue Sep 24 23:31:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Proving, once again, that aviators get all the chicks...; ; Just as long as they have the wherewithal
## Header (preview): From fork-admin@xent.com  Tue Sep 24 23:55:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): O utensils of the world --; ; I wonder if it is possible to reverse-engineer the Reed-Solomon
## Header (preview): From fork-admin@xent.com  Wed Sep 25 10:24:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 24 Sep 2002, Rohit Khare wrote:; ; > I suppose this is a modern equivalent to line-printer artwork; I was
## Header (preview): From fork-admin@xent.com  Wed Sep 25 10:24:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0005_01C26412.7545C1D0
## Header (preview): From fork-admin@xent.com  Wed Sep 25 10:24:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Righ, somebody. Reminds me of the old Divorced Man's exposition of what; happened to him.;
## Header (preview): From fork-admin@xent.com  Wed Sep 25 10:24:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anyone heard of this law before?; ; > Q. Can I get a playlist?
## Header (preview): From fork-admin@xent.com  Wed Sep 25 10:24:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Russell Turpin wrote:; >Invite her for an afternoon cruise under the Golden Gate bridge in; >your Stonehorse day sailor.
## Header (preview): From fork-admin@xent.com  Wed Sep 25 21:33:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > The only circumstances in which a business will not be ready--indeed,; > eager--to do an additional volume of business is if it is physically unable; > to do so because it lacks the necessary physical means of doing so, or
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): OK, let's bring some data into the discussion:; http://www.grida.no/climate/vital/02.htm; (A graph, derived from Vostok ice core samples, of CO2 and temperature
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [can't think of how I'd be running; afoul of the spam filters with this; post, so here's the second try...]
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --]; --] Anyone heard of this law before?;
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 25 Sep 2002, Gordon Mohr wrote:; > In contrast, take a look at this article by Simon J. Wilkie of; > Caltech:
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 2002-09-25 at 13:34, bitbitch@magnesium.net wrote:; > ; > This, kiddies was apparently the legislative beginnings of the whole
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Let's say you're behind a firewall and have a NAT address.; Is there any way to telnet to a linux box out there in the world; and set your DISPLAY in some way that you can create
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A friend in Dublin is mailing me the CD which was in the UK Sunday ; Times. I've just been advised that running it in a Win32 machine is ; dangerous as all get out.
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A friend in Dublin is mailing me the CD which was in the UK Sunday ; Times. I've just been advised that running it in a Win32 machine is ; dangerous as all get out.
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Joseph S. Barrera III" <joe@barrera.org> writes:; ; > Let's say you're behind a firewall and have a NAT address.
## Header (preview): From fork-admin@xent.com  Thu Sep 26 11:04:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wow, three replies already, all recommending ssh. Thanks!; ; - Joe
## Header (preview): From fork-admin@xent.com  Thu Sep 26 16:35:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Subject: Re: Digital radio playlists are prohibited?!; > From: James Rogers <jamesr@best.com>; > To: fork@spamassassin.taint.org
## Header (preview): From fork-admin@xent.com  Thu Sep 26 16:35:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 25 Sep 2002, Joseph S. Barrera III wrote:; ; > Let's say you're behind a firewall and have a NAT address.
## Header (preview): From fork-admin@xent.com  Fri Sep 27 10:43:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I wanted to get back to this but didn't have the time.  I actually lived on; a couple different Indian reservations growing up in the Pacific Northwest; and also spent a fair amount time in Lakota/Sioux country as well.  And my
## Header (preview): From fork-admin@xent.com  Fri Sep 27 10:43:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In essence, hindsight justification.  The progressives weren't in the; middle, they were in a society at one end and they wanted a society at; the other end.  The middle is more or less where they got stopped.
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Friday, September 27, 2002, at 11:17 AM, Jim Whitehead wrote:; ; > I attended the OSCOM Open Source Content Management workshop at
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Sep 30 13:52:45 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 3BD6E16F7D
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00796.1c06b1656c17f8aa92a42a82ef0ad2e9 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I attended the same conference, and was impressed by a few systems that; Jim didn't mention. In terms of CMS, the following all had apparently; been used in some fairly large implementations and looked like some
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): What's wrong with doing business over the Web?  Web forms.  There's; promising replacements forms, but this is the current state of the; industry:
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:49 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'll agree that webforms are a pain in the ass, however it would seem to ; me that the problem with passport is the same one you noted with the ; autoform function, providing more info than you want to.  That and some
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "G" == Gregory Alan Bolcer <gbolcer@endeavors.com> writes:; ;     G> So, if crappy forms-based submission is the state of practice
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Saturday, September 28, 2002, at 12:54 PM, Gary Lawrence Murphy ; wrote:;
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:53:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 08:18 AM 9/28/02 -0700, Gregory Alan Bolcer wrote:; ; >IE6 and Netscape 6,7 have pre-forms sutff,
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:52:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "B" == Bill Humphries <bill@whump.com> writes:; ;     B> Yes, but this is what normally happened:
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:53:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dear flatware,; ; I'm about to undertake a massive project to index/catalog well over one
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:53:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy wrote:; > ; > Although it's like a total shock to 99.999% (5nines) of all the
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:53:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 09:02 AM 9/29/02 -0700, Elias wrote:; ; >I'm about to undertake a massive project to index/catalog well over one
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:53:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From fork-admin@xent.com  Mon Sep 30 13:54:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This article from NYTimes.com ; has been sent to you by khare@alumni.caltech.edu.;
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Michael wrote:; > ; > http://www.post-gazette.com/columnists/20020905brian5.asp
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:33 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Owen Byrne wrote:; ; > What a load of crap. Politics are somehow more muddy now?  I'd say that
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>; >> http://www.post-gazette.com/columnists/20020905brian5.asp;
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > The problem is that politics have gotten so muddied; > nowadays, that shouting down and unpeaceably disrupting; > political rallies that you don't agree with has become
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gregory Alan Bolcer wrote:; ; >at zones to most expediently keep order.
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Looks useful. Hopefully, they'll put up some more material soon.; ;  http://ocw.mit.edu/global/all-courses.html
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:56:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >; > GAB> The problem is that politics have gotten so muddied; > GAB> nowadays, that shouting down and unpeaceably disrupting
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:57:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bill Stoddard wrote:; > ; > Wishful thinking. People are just bigger dickheads now.
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:57:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>; >>Wishful thinking. People are just bigger dickheads now. Culture is changing; >>and it is becoming acceptable to get in peoples face and shout them down
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:57:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): bitbitch@magnesium.net wrote:; ; >>>Wishful thinking. People are just bigger dickheads now. Culture is changing
## Header (preview): From fork-admin@xent.com  Mon Sep 30 17:57:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bill Stoddard wrote:; ; >>GAB> The problem is that politics have gotten so muddied
## Header (preview): From fork-admin@xent.com  Mon Sep 30 19:58:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: <bitbitch@magnesium.net>;
## Header (preview): From fork-admin@xent.com  Mon Sep 30 19:58:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-09-30 at 09:20, Owen Byrne wrote:; > In my experience, this is classic "American" behaviour, and I don't ; > think its on the increase outside of the US of A.
## Header (preview): From fork-admin@xent.com  Mon Sep 30 19:59:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Mr.,; ; Monday, September 30, 2002, 1:19:12 PM, you wrote:
## Header (preview): From fork-admin@xent.com  Mon Sep 30 19:59:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: <bitbitch@magnesium.net>;
## Header (preview): From fork-admin@xent.com  Mon Sep 30 21:38:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > >                                                ... webforms /can/; > > accept "U.S. of A" as a country.  Incredible, but true.  Web forms can; > > also accept /multiple/ or even /free-form/ telephone numbers ...
## Header (preview): From fork-admin@xent.com  Mon Sep 30 21:38:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: Owen Byrne <owen@permafrost.net>; > A flippant remark that I will probably regret  -; > sure there's assholes everywhere. I just remember a lunch in Spain with
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 30 Sep 2002, Tom wrote:; ; > If the set passes around enough then more people have these works. the
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > MF> I don't think free speech is a license to speak directly at; > and be in the; > MF> physical presence of any particular individual of your
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Bill,; ; Monday, September 30, 2002, 5:46:11 PM, you wrote:
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Saturday 28 September 2002 04:37 pm, you struggled free to say:; &> > Although it's like a total shock to 99.999% (5nines) of all the; &> > employed website designers out there, the truth is webforms /can/
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Oct  1 10:41:45 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id C87C916F1F
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00830.3a2cadbd29e654a7cbbf64ba4bdc378d - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): One of the most bizarre pages I've seen on the Web. At first I thought it; might be some sort of back-story to a RPG, but, nope, it looks like somebody; believes this.
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wow, talk about a pheenomeenon; ; ==
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:41:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): act.DTL; ; Opening arguments are set to begin early next month in Eldred vs. Ashcroft,
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:42:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Numerous artists drawing characters on a cliff.
## Header (preview): From fork-admin@xent.com  Tue Oct  1 10:42:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Neat stuff. Seems to combine elements of Scientology/Xenu and; David Icke (http://www.davidicke.com/icke/temp/reptconn.html).;
## Header (preview): From fork-admin@xent.com  Tue Oct  1 15:30:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Russell Turpin wrote:; > ; > Gregory Alan Bolcer:
## Header (preview): From fork-admin@xent.com  Tue Oct  1 15:30:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 05:38 PM 9/30/2002 +0200, Eugen Leitl wrote:; ;
## Header (preview): From fork-admin@xent.com  Tue Oct  1 16:29:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Better late than never -- I received a grant from Project Athena, MIT's original courseware effort, and found at the end that they hadn't thought much about distribution of the courseware.  Instead, they had gotten wrapped up with X and various Unix tools, and other useful, but not strictly educational efforts.; ;
## Header (preview): From fork-admin@xent.com  Tue Oct  1 16:28:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tuesday 01 October 2002 01:27 am, Mr. FoRK wrote:; > http://www.rathergood.com/vikings/;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:47:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): bitbitch@magnesium.net wrote:; ; > Turns out the music industry settled ... quite a hefty
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:47:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Elias,; ; Tuesday, October 1, 2002, 9:54:02 PM, you wrote:
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:47:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 10:27 PM -0700 on 9/30/02, Mr. FoRK wrote:; ;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:48:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I think what you're looking at with the dual antenna mounts is a ; diversity antenna.  It won't work too well with one hooked up to the ; pringles can and the other hooked up to a regular rubber duck.
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:48:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Uh, WWII Enigma was cracked at Bletchly Park, based on the work of some ; Poles, who had been trying to figure out when they would be invaded.   ; Entirely mechanical!   Definitely not optical at all.    Enigma was
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:48:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): That's what the manual said - a diversity antenna.; ; Why wouldn't it work well with one omni and one directional antena?
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:47:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Funny as all hell.  So a group of 25 QUIT (Queers Undermining Israeli; Terrorism) marched into the local starbucks in Berkeley (Of course,; they pick a safe city like Berkeley, but hey, still funny) and
## Header (preview): From fork-admin@xent.com  Wed Oct  2 11:48:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Kind of interesting application of 'agent' technology.; A mix of telnet and Eliza?; (wonder if KnowNow needs this as a partner...)
## Header (preview): From fork-admin@xent.com  Wed Oct  2 16:02:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): MF> Here is a sample conversation on (MSN Messenger with 'SmarterChild'):; ; MF> Mike says:
## Header (preview): From fork-admin@xent.com  Thu Sep 26 18:11:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------=_NextPart_001_0004_01C2655A.4ABB3500; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: quoted-printable
## Header (preview): From fork-admin@xent.com  Wed Oct  2 17:51:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is something new, or at least new to me: ; ;     Politspam (n): Using a spam engine for political purposes.
## Header (preview): From fork-admin@xent.com  Wed Oct  2 17:51:37 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): How is this any different from attaching an Infobot or A.L.I.C.E; through licq's console-hook?  People have been doing that for years,; and for over a decade in IRC and the MUDs.
## Header (preview): From fork-admin@xent.com  Wed Oct  2 17:52:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wow, if they put a VRML front end on it it would be 100% worthless rather; than just 99%;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 17:52:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Gary Lawrence Murphy" <garym@canada.com>;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 17:51:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): let me put it /another/ way ...; ;     f> Mike says: how are you?
## Header (preview): From fork-admin@xent.com  Wed Oct  2 18:18:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 18:18:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Gary Lawrence Murphy" <garym@canada.com>;
## Header (preview): From fork-admin@xent.com  Wed Oct  2 21:16:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 802.11b - 11Mbps per channel over three channels in the 2.4GHz range ; (also shared with microwaves and cordless phones) at rages up to ~300 ft.; 802.11a runs on 12 channels in the 5GHz range and up to around five
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "Gary Lawrence Murphy" <garym@canada.com>;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "Mr. FoRK" <fork_list@hotmail.com>;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:54:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Elias Sinderson wrote:; > 802.11b - 11Mbps per channel over three channels in the 2.4GHz range ; > (also shared with microwaves and cordless phones)
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 2 Oct 2002, Gregory Alan Bolcer wrote:; --]Elias Sinderson wrote:; --]> 802.11b - 11Mbps per channel over three channels in the 2.4GHz range
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 4:34 PM -0400 on 10/2/02, R. A. Hettinga wrote:; ;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Over on Arstechnica (www.arstechnica.com) I saw mention of a Wired article; that goes into the many wonderfull ways Apple is showing its love and; respect for its users.
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This article from NYTimes.com ; has been sent to you by khare@alumni.caltech.edu.;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "E" == Eirikur Hallgrimsson <eh@mad.scientist.com> writes:; ;     E> ...  If my environment cannot be made beautiful, in
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Well it looks pretty much 99% sure that we will be moving in on Nov 1 to; the new house. I think the only thing that stops us now are acts of; dieties and total economic collapse..so no one mention the dow for the
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wednesday 02 October 2002 06:37 pm, Tom wrote: ; > But what actually happened in Jaguar was that Apple added code to; > exclude all non-Apple menu extras.
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:55:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 12:56:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 1:16 AM -0400 on 10/3/02, Gary Lawrence Murphy wrote:; ;
## Header (preview): From fork-admin@xent.com  Thu Oct  3 16:08:08 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "R" == R A Hettinga <rah@shipwright.com> writes:; ;     R> "When I'm working on a problem, I never think about beauty. I
## Header (preview): From fork-admin@xent.com  Thu Oct  3 19:30:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): people with too much time on their hands..; ; look at this first (8meg, so takes a loong time):
## Header (preview): From fork-admin@xent.com  Thu Oct  3 19:30:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Actually this is output from an old java program called jitter.; It's very useful for those of us with digital cameras who end up; taking 50+ pictures a day while on vacation ;)
## Header (preview): From fork-admin@xent.com  Thu Oct  3 20:13:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): egad ... you mean there's two of them???  I knew there was a reason; my jobs board had jumped to the top of my traffic list.
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:03:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- begin forwarded text; ;
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:03:56 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "S" == Stephen D Williams <sdw@lig.net> writes:; ;     S> The purpose of our lives is to be free of all addictive traps,
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:03:47 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Normally, I disdain any kind of mysticism, even when it is associated ; with fairly good ideas.  Just a big turnoff.  A good example would be ; the difference between Yoga/TM and the more scientifically pure, but
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:04:19 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): draw the pain; ; "Ken never wrote about this method, but he often demonstrated it in
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:04:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 10/2/02 12:00 PM, "Mr. FoRK" <fork_list@hotmail.com> wrote:; > What about a situation where you don't directly ask/talk to the bot, but; > they listen in and advise/correct/interject/etc?
## Header (preview): From fork-admin@xent.com  Fri Oct  4 11:03:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Fork,; ;   http://www.pimprig.com/sections.php?op=viewarticle&artid=72&page=2
## Header (preview): From fork-admin@xent.com  Fri Oct  4 18:19:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Not exactly new bits, but I enjoyed seeing The Economist; pick up on the similarity between computer and social; networks:
## Header (preview): From fork-admin@xent.com  Fri Oct  4 18:19:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --------------080209060700030309080805; Content-Type: text/plain; charset=US-ASCII; format=flowed; Content-Transfer-Encoding: 7bit
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:38:43 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Greetings,; ; Carey wants you to know about a story on www.theage.com.au
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:38:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ... nor what color your passport?; ; More American exceptionalism:
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:38:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Don't know much about eRoom - but there is the magic phrase 'collaborate in; real-time'... Groove really has people running scared. Wonder if any users; actually /benefit/ from collaborating in real-time.
## Header (preview): From irregulars-admin@tb.tf  Sat Oct  5 12:38:48 2002; Return-Path: <irregulars-admin@tb.tf>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 4/10/02 1:13 am, someone e-said:; ; > The guy messed up his own URL. It should be
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:38:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Groove really has people running scared"; ; ....oh shit here comes that Groove thingy, run for your life ;-)
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:39:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Does anyone know what happened to vCard support in Netscape 7.0/Mozilla ; 1.1?;  (Not there yet in Mozilla and therefore not in the new mail engine I
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:39:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "British scientists were honoured for research that found ostriches became; more amorous with each other when a human was around. In fact, ostriches; eventually started putting the moves on humans."
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:39:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Geege Schuman wrote:; ; >"British scientists were honoured for research that found ostriches became
## Header (preview): From fork-admin@xent.com  Sat Oct  5 12:39:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The structure of the Internet has never; been about where the ditches and ruts; are dug although the world needs
## Header (preview): From fork-admin@xent.com  Sat Oct  5 17:22:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gary Lawrence Murphy wrote:; > R. Buckminster Fuller; >
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:56:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hijacker High (8/30) ; Dalal Mughrabi was a Palestinian woman who participated in a 1978 bus; hijacking in which 36 Israelis and an American nature photographer, Gail
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:56:30 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): she read the links. what must it be like, she wondered, to devote ones life; to pointing out  neighbors' mistakes, mishaps, inconsistencies and; frailties?
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:56:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I propose they rename it "Charlie Heston High" and maybe the students  ; will learn to take AR-15s with extended military-spec scopes and .223  ; high-velocity ammo and start plinking innocent civilians at random in
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:56:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It wasn't gloating, it was one for the horror file.; ; And of course for the Palestinians it wasn't a mistake, which is a key
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:57:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message ----- ; From: "John Hall" <johnhall@evergo.net>; >
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:56:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): John Hall wrote:; ; >It wasn't gloating, it was one for the horror file.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:57:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): see my first line: I READ THE LINKS.  brickbats.  idiot.; ;
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:57:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): When a settler goes postal and kills some Palestinians they are treated; as a criminal, not celebrated in word and song.;
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:57:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): when brickbats or fox exposes the folly of government they do so to; accomplish a specific end; dumping truckload after truckload of bad acts; proves their point: stupidity and greed typify government, therefore any
## Header (preview): From fork-admin@xent.com  Sun Oct  6 22:57:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yes, you read the links.; ; Sorry, but exposing folly is not only humorous but also instructive.  It
## Header (preview): From fork-admin@xent.com  Mon Oct  7 20:37:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I call PacBell/SBC every two or three months about a recurring problem ; we have at my house:;
## Header (preview): From fork-admin@xent.com  Mon Oct  7 20:37:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It was a kick when an apt manager kept mailing me a notice that I owed ; them .08.  I just waited to see how many times they'd mail me a notice.  7 ; times by the time I left and paid them the .08.  Funny thing was, I lived
## Header (preview): From fork-admin@xent.com  Mon Oct  7 20:37:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 7 Oct 2002 bitbitch@magnesium.net wrote:; ; --]I'm truly stuck on this though.  I don't know whether to frame the
## Header (preview): From fork-admin@xent.com  Mon Oct  7 20:37:06 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I knew it'd be a day for insanity.; ; so anyway, news.com decided to write up two wonderful articles on the
## Header (preview): From fork-admin@xent.com  Mon Oct  7 21:56:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dave Long wrote:; ; >><http://www.iht.com/articles/72079.htm>
## Header (preview): From fork-admin@xent.com  Mon Oct  7 21:56:36 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I know I heard of this a few years back but Wired and Slashyrot are both; running stories on 10mbs data transfer via human touch.;
## Header (preview): From fork-admin@xent.com  Mon Oct  7 21:56:38 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello Tom,; ; Monday, October 7, 2002, 4:45:02 PM, you wrote:
## Header (preview): From fork-admin@xent.com  Mon Oct  7 22:40:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): They are legally required to do that.  I got a similar check because an; insurance company didn't pay a claim quickly enough.  It might have been; $.02.
## Header (preview): From fork-admin@xent.com  Mon Oct  7 22:40:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): JH> They are legally required to do that.  I got a similar check because an; JH> insurance company didn't pay a claim quickly enough.  It might have been; JH> $.02.
## Header (preview): From fork-admin@xent.com  Tue Oct  8 00:32:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-10-07 at 12:48, Owen Byrne wrote:; > I suppose Canada, which is supposed to be a "loose confederation" of 2 ; > founding nations (French and English) can be cited as a success. The
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Oct  8 10:56:42 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id CCC2316F16
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00914.a24840d53c5f49a00e66fa4425e4626d - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:25 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Chris Haun wrote:; > A LifeGem is a certified, high quality diamond created from the carbon of ; > your loved one as a memorial to their unique and wonderful life.
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:31 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > From: fork-admin@xent.com [mailto:fork-admin@xent.com] On Behalf Of; > Long; > Sent: Thursday, August 22, 2002 11:12 AM
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Political mail (the snail kind) doesn't bother me.  I like it a lot of the ; time, because as crap as it is at least it's not the kind of info you get ; on TV.  Particularly for small time local politics, it's the best way to
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:08:56 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Fri, 23 Aug 2002, Robert Harley wrote:; ;
## Header (preview): From fork-admin@xent.com  Fri Aug 23 11:09:07 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I wrote:; >I personally doubt it simply because I never heard of Bush and Chirac; >going to Brighton.
## Header (preview): From fork-admin@xent.com  Mon Sep  2 13:14:58 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): bitbitch@magnesium.net wrote:;  > Well Beberg, unless you're really into Anime and actually hold true;  > that dead people can send email, I think Geege's subject is just
## Header (preview): From fork-admin@xent.com  Mon Sep  2 13:12:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Sun, 1 Sep 2002 bitbitch@magnesium.net wrote:; ; > Well Beberg, unless you're really into Anime and actually hold true
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 15:46:36 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): At 8:43 PM -0700 8/21/02, Ed Greenberg wrote:; >At 11:19 PM 8/20/2002 -0700, dan@dankohn.com wrote:; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 16:17:10 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 20 Aug 2002, Matthew Cline wrote:; ; > On Tuesday 20 August 2002 07:57 pm, Harold Hallikainen wrote:
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 16:27:31 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Suppose I created a rule that was in this form:; ; body RULE_NAME /text to delete/d
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 16:27:30 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): At 3:59 PM +0100 8/22/02, Justin Mason wrote:; >Justin Shore said:; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 17:19:48 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I'm fairly confused here, with Procmail. ; I know this isn't a procmail list per-se; feel free to answer my questions in ; private email to r_gilmanhunt@hotp.com.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 18:41:28 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Interesting.  It's possible, of course, that the shitty economy ; is hurting the spammers as much as anyone else.  But if you've ; been aggressively reporting, then it could just be that.  Could
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 18:41:33 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Theo Van Dinter said:; ; > >         nonspam-theo.log
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 22 18:41:34 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): At 1:16 PM -0400 8/22/02, Theo Van Dinter wrote:; >On Thu, Aug 22, 2002 at 07:05:33PM +0200, Malte S. Stretz wrote:; >>  Ummm... has somebody noticed that spamassassin-sightings is the fourth most
## Header (preview): From tony@svanstrom.com  Fri Aug 23 11:05:51 2002; Return-Path: <tony@svanstrom.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, 22 Aug 2002 the voices made Justin Mason write:; ; > > The perl-module Mail::CheckUser implements a smtp-callback and I hope
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Aug 28 10:50:30 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B246644158
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00931.c27bf5c9bcb24c213aafe1b28fcbcc7a - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:50:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > From: fork-admin@xent.com [mailto:fork-admin@xent.com] On Behalf Of; > Rogers;
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:50:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On 27 Aug 2002 at 15:00, Rohit Khare wrote:; > ; > DATAPOWER TECHNOLOGY ON Monday unveiled its network device
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Aug 28 10:50:41 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 301BA43F99
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00934.f9ba910a655535304bf26a3e281cb324 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Aug 28 10:50:54 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 77A5C44155
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00935.8ecbeab3ef30caba2c29e25744a2265a - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Aug 28 10:51:12 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 27C9E43F9B
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00936.e8fd8c240b680e948f85f2326cc87250 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Aug 28 10:51:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002, Rohit Khare wrote:; ; > DATAPOWER TECHNOLOGY ON Monday unveiled its network device designed
## Header (preview): From fork-admin@xent.com  Wed Aug 28 12:02:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Politicians worldwide are discovering the internet - what a great tool ; for fascism, once you got the laws in place to solve that whole ; 'anonymity' thing. Also I notice this story shows the truth - the
## Header (preview): From fork-admin@xent.com  Wed Oct  9 10:55:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I'm not sure what you mean by "let's you and him fight", but it is ; > important to remember that England was in control of Ireland; > for 300 years ...
## Header (preview): From fork-admin@xent.com  Wed Oct  9 22:44:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is my Netscape 7.0 Review.; ; o They finally got the email search speed back up to
## Header (preview): From fork-admin@xent.com  Wed Oct  9 22:44:55 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 2002-10-09 at 06:48, Frank Bergmann wrote:; > ; > A more reasonable explication of the EU - US differences (according
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Oct 10 12:34:47 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 98D4616F1F
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/00942.727cb1619115cdee240fa418da19dd1f - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Oct 10 12:34:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Begin forwarded message:; ; > From: Ian Andrew Bell <hello@ianbell.com>
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 16:02:02 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-695163552P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 16:02:06 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-694865624P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 19:03:29 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): lately I've got the feeling that exmh is getting slower and slower. I ; just decided to check that vs. reality, and yes, speed has left the ; scene somewhere between the release of 2.5 and now.
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 19:24:02 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_1521948024P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 19:24:06 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-1913987426P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 19:44:41 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_1581673767P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 23:40:32 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): cwg-dated-1030817858.a49b7e@DeepEddy.Com said:; > From:  Anders Eriksson <aeriksson@fastmail.fm>; > Date:  Mon, 26 Aug 2002 20:00:36 +0200 >
## Header (preview): From exmh-workers-admin@redhat.com  Mon Aug 26 23:40:32 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Valdis.Kletnieks@vt.edu said:; > I checked on a number of small messages in a big folder (~10000 ; > msgs). The delay of the Next button has increased considerably:
## Header (preview): From exmh-workers-admin@redhat.com  Tue Aug 27 00:00:58 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-1977488590P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Tue Aug 27 02:35:11 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>Chris Garrigues said:; ;  > Done.  I also eliminated the msgs variable on the theory that simpler is
## Header (preview): From exmh-workers-admin@redhat.com  Tue Aug 27 10:04:58 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | Tell me what keystroke made it happen so I can reproduce it and I'll;   | see what I can do about it (or if I can't, I'll hand it off to Brent).;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 10:46:06 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): You can also duplicate thiswith; ; MsgChange - noshow
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 10:46:45 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I may be wrong but I think a single select entry field is used; for selecting messages and switching folders. Restricting the entries; to be numeric would break the folder switching functionality, wouldn't
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 10:46:48 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | If we are allowed to assume 8.2 or higher, which we can't really, then;   | we could add; [...]
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 10:46:53 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I have some patches that seem to fix/avoid this problem now.   (It is; amazing what one can achieve when mains power fails, long enough for; UPS's to run out, and all that is left operational is the laptop and
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 10:47:16 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | But, while I was playing there, I noticed something I never new before.; ; I also no the difference between new & knew, but I don't always type well...
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 15:08:10 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | hmmm, I assume you're going to report this to the nmh folks?; ; It turns out, when I did some investigation, that my memory of how MH
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 15:28:59 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-695600198P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 15:50:04 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | so I'll probably poke around at the sequences performance issues,; ; Well, there's this wonderful piece of code in MhSeqExpand ...
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 17:25:35 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_893671157P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 17:25:40 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_927886807P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Aug 28 18:49:09 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>Robert Elz said:;  >     Date:        Wed, 28 Aug 2002 09:22:34 -0500;  >     From:        Chris Garrigues <cwg-dated-1030976555.34ad5b@DeepEddy.Co
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 29 10:57:54 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_1089505257P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 29 11:03:28 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Well, I've used the check-the-modify-time cache trick for files in; many places (not just exmh) so some part of me certainly thinks it; is effective.  However, it occurred to me that if we do checkpoint
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 29 15:08:59 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_948625160P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep  2 12:33:34 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>Chris Garrigues said:;  > > From:  Brent Welch <welch@panasas.com>;  > > Date:  Wed, 28 Aug 2002 22:40:21 -0700
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  2 13:12:40 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > Hi,; > ; > On Sun, 01 Sep 2002 00:05:03 MDT Reg Clemens wrote:
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  2 13:12:51 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi,; ; On Sun, 01 Sep 2002 00:05:03 MDT Reg Clemens wrote:
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  2 23:27:14 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you haven't already, you should enable the debug log under; Hacking Support preferences and look for clues there.;
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep  3 14:20:18 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 2 things - first, the switch parser changed in a subtle way with 8.4 -; byte-code compilation was added, and it is slightly more strict in; its parsing than the original parser.  You can only have a comment where
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep  6 11:36:04 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I use exmh 2.5 with procmail for presorting incoming mail and move it to; the relevant folder using rcvstore.;
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep  6 11:38:53 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; It has been signed conforming to RFC2015.; You'll need PGP or GPG to check the signature.
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  9 20:33:38 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Is there a way to do a global Sort command? Here's the situation: I like to ; sort by date every folder. I'm cleaning up my inbox from most recent to oldest, ; since I find this direction most efficient (I guess because it helps me
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  9 20:33:42 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 09 Sep 2002 12:05:55 PDT,;   Rick Baartman <baartman@lin12.triumf.ca> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  9 20:33:50 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I don't understand.  How does sorting one folder add messages to; > other folders?  What do you use to sort?; >
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:22:35 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 09 Sep 2002 12:21:42 PDT,;   Rick Baartman <baartman@lin12.triumf.ca> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:22:37 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 9 Sep 2002, Rick Baartman wrote:; > Is there a way to do a global Sort command?;
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:22:40 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I am facing the fact that exmh has been left behind in some industry; > standards.  I use it for my personal mail.  My mail server runs unix,; > and I connect over ssh and tunnel my X traffic over ssh.  With a slow
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:22:51 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > On Mon, 9 Sep 2002, Rick Baartman wrote:; > > Is there a way to do a global Sort command?; >
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:15 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > On Mon, 9 Sep 2002, Rick Baartman wrote:; > Thanks Tom and Jacob. The above works, but without the double quotes: i.e. ; >
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:18 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > >  sh -c 'for f in "`folders -recurse -fast`" ; do sortm +"$f" ; done'; ; > Thanks Tom and Jacob. The above works, but without the double quotes: i.e.
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:22 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Mon, 9 Sep 2002, "Rick" == Rick Baartman wrote:; ;   Rick> This is dangerous; I have to remember to re-scan each
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:33 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multipart MIME message.; ; --==_Exmh_16073047980
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:35 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ; >>>Robert Elz said:;  > I suspect that as part of Chris' set of changes, he cleaned up the
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:37 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; It has been signed conforming to RFC2015.; You'll need PGP or GPG to check the signature.
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 11:23:42 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 09 Sep 2002 15:36:37 -0400 ; Tom Reingold <noglider@pobox.com> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 15:47:05 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 10 Sep 2002 01:20:56 PDT,;   J C Lawrence <claw@kanga.nu> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Tue Sep 10 15:47:06 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tom Reingold wrote:; ; > >
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:41:41 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 10 Sep 2002 10:29:26 -0400 ; Tom Reingold <noglider@pobox.com> wrote:; > On Tue, 10 Sep 2002 01:20:56 PDT, J C Lawrence <claw@kanga.nu> wrote:
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:42:07 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --Multipart_Tue_Sep_10_08:56:11_2002-1; Content-Type: text/plain; charset=US-ASCII;
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:42:12 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 10 Sep 2002 15:43:32 BST,;   James Gibbon <james.gibbon@virgin.net> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:42:15 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > You're probably running exmh on a local machine.  I'm running it on a; > > very remote machine.  In this scenario, the mime handling is weak.; >
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:43:12 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): There is an "Update all scan caches" menu entry that rescans your; folders similar to the short scripts folks have shared around.  It; runs in the background.
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:43:19 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; It has been signed conforming to RFC2015.; You'll need PGP or GPG to check the signature.
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:43:26 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thanks Brent: now it's clearer (to me) what's needed. I've used the global; sort and J C Lawrence's re-scan, but there is still a vulnerability there:; If I have an instance of exmh running, the folder I'm visiting will have
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 13:43:47 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 11 Sep 2002 01:24:46 +0200 ; Robert Waldner <waldner@waldner.priv.at> wrote:; > On Tue, 10 Sep 2002 09:27:12 PDT, J C Lawrence writes:
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From exmh-users-admin@redhat.com  Wed Sep 11 16:03:23 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >> I run exmh on my desktops at home and at work with the resulting exmh; >> windows being displayed on both my work and home desktops (gratis SSH; >> X11 forwarding).  In fact, your message was read and replied to (this
## Header (preview): From exmh-workers-admin@redhat.com  Wed Sep 11 20:26:51 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hmm - I'm cc'ing the exmh-workers list, because I really don't know; much about the various PGP interfaces.  I think there has been some; talk about "issues" with the latest version of gpg.
## Header (preview): From exmh-workers-admin@redhat.com  Wed Sep 11 21:29:14 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The way to debug something like this is to turn on the log (Preferences ; -> Hacking Support -> Debug log enabled) and track the gpg commands ; being issued and the responses.
## Header (preview): From exmh-workers-admin@redhat.com  Wed Sep 11 21:29:16 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_9304186P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Sep 11 21:29:20 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gotta wonder what the GPG config stuff in ~/.exmh/exmh-defaults looks ; like.  Also gotta wonder what the message headers in the offending ; message are saying to nmh/exmh.  My set-up works perfectly.  That is,
## Header (preview): From exmh-workers-admin@redhat.com  Wed Sep 11 21:52:08 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Here's a message that works fine for me:; ;
## Header (preview): From exmh-users-admin@redhat.com  Thu Sep 12 14:01:41 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I am a (tv)twm user. when I snarf text into my mouse cut buffer, and then; attempt to inject it into the exmh input windows for comp/repl, the 'point'; is often an apparently random place in the text pane, not where I think I
## Header (preview): From exmh-users-admin@redhat.com  Thu Sep 12 14:01:43 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): exmh has a funky cut/paste model that is essentially all my fault.; The middle click sets the insert point.  If you hate that, go to the; Bindings... Simple Edit preferences window and de-select
## Header (preview): From exmh-users-admin@redhat.com  Thu Sep 12 21:21:23 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | exmh has a funky cut/paste model that is essentially all my fault.;   | The middle click sets the insert point.  If you hate that, go to the;   | Bindings... Simple Edit preferences window and de-select
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:34:59 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri Sep 13 2002 at 02:03, Robert Elz wrote:; ; >     Date:        Wed, 11 Sep 2002 20:15:00 -0700
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:35:07 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue Sep 10 2002 at 12:52, Robert Elz wrote:; ; > Subject: Patch to complete a change...
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:35:11 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Fri, 13 Sep 2002, "Tony" == Tony Nugent wrote:; ;   Tony> (In essence: is there a way to mark a destination folder
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:35:55 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | 1) Right click on the folder label in the folder list; ; That (the way I have it configured, and it sounds as if the way Tony does
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:36:00 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | I can cut'n'paste from exmh's message display window into spawned;   | gvim processes, but not into anything else.;
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:36:09 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri Sep 13 2002 at 17:55, Robert Elz wrote:; ; >     Date:        Fri, 13 Sep 2002 11:26:30 +1000
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 13:36:16 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 2) In the main window, the "+" key puts you into a "change ;    folder" mode (the first time you use it after starting exmh),;    hit a second + and you go to "set a target" mode.  Type a few
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 16:49:59 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Fri, 13 Sep 2002, "Robert" == Robert Elz wrote:; ;   Robert> That (the way I have it configured, and it sounds as if
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 16:50:01 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Fri, 13 Sep 2002, "Tony" == Tony Nugent wrote:; ;   Tony> I can't even mark text in an exmh message window and then
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 16:50:06 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: Tony Nugent <tony@linuxworks.com.au>; > Sender: exmh-users-admin@spamassassin.taint.org; > Date: Fri, 13 Sep 2002 21:30:34 +1000
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 16:50:08 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In message <200209130231.g8D2VO021580@hobbit.linuxworks.com.au.nospam>, Tony Nu; gent writes:; >
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 13 18:40:35 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've never understood the mouse buffer operation with exmh either. Here's the ; behaviour I have. I have exmh and XEmacs windows up, and a terminal window. (I ; also have gnome1.4 running and enlightenment as wm.) I select text in the exmh
## Header (preview): From exmh-users-admin@redhat.com  Sat Sep 14 16:22:03 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi Folks,; ; I've been trying to set a button called which automatically
## Header (preview): From exmh-users-admin@redhat.com  Sat Sep 14 16:22:40 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri Sep 13 2002 at 07:46, "Kevin Oberman" wrote:; ; > > > What is an example of an "anything else" that it fails for for you?
## Header (preview): From exmh-users-admin@redhat.com  Sat Sep 14 16:22:57 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 13 Sep 2002, Dale Alspach wrote:; > My experience has been that if the item is showing in xclipboard; > and is highlighted that is what is pasted using the mouse.
## Header (preview): From exmh-users-admin@redhat.com  Sat Sep 14 16:22:59 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Fri, 13 Sep 2002, "Wendy" == Wendy P. Roberts wrote:; ;   Wendy> I've been trying to set a button called which
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 16 10:41:55 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > From: Tony Nugent <tony@linuxworks.com.au>; > Sender: exmh-users-admin@spamassassin.taint.org; > Date: Sat, 14 Sep 2002 13:20:58 +1000
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 16 15:30:56 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I recently transfered my exmh setup to a new system, and now; all my email ends up in Mail/MyIncErrors folder.  This is true for ; inbox or presort options.  I'm having difficulty finding this condition
## Header (preview): From exmh-users-admin@redhat.com  Thu Sep 19 13:00:19 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I guess the first question here should be does anyone have some; updates to the PGP code in EXMH that I should know about?;
## Header (preview): From exmh-users-admin@redhat.com  Thu Sep 19 13:01:41 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Is there any way to customise the folder table of contents for; specific folders?;
## Header (preview): From exmh-users-admin@redhat.com  Fri Sep 20 21:45:36 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_1920300774P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 12:06:12 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I just updated to the latest CVS - I had been running a build from June.  ; Hitting the Flist button gives the following traceback:;
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:06:18 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Both Move and Link are one-click actions.; ; <Button-3> on a folder label Move's the current message
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Aug 27 04:47:46 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Halloechen!; ; I have
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Aug 27 10:35:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Halloechen!; ; On Dienstag, 27. August 2002 05:41 schrieben Sie:
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Aug 29 10:57:58 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01034.6a298abdc5efe614a638c2b55582cdc6 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:02 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01035.1210cd8593aa0ed6eb21b86b9c97cc46 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Ville wrote :; ; > > Thanks a *lot* !  The RPMs seem to be fine, they worked for me out of
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:24 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01037.6b42b5f3d3d9e6293bf24af66b250655 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:30 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Ville wrote :; ; > Ok, some more nits: alsa-xmms doesn't work if I don't have
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:32 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01039.2b799ff9acbf233a7842eab00fcb848f - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 10:58:35 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Ville wrote :; ; > Ah!  The mixer stuff was what made me look for an init script in the
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 10:59:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Thanks for this, I'm going to give them another try.  One question: How; do I switch between digital out and analog out with ALSA?  With; emu10k1-tools it's easy enough (emu-config -d for digital, emu-config -a
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Aug 29 10:59:36 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01042.5379f7151fef6cce3e2638aee3b193fa - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 11:01:06 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Ok, I got ALSA installed and there is no static inbetween mp3s like; before which is great!  My setup is digital 4.1 but sound is only coming; from front 2 speakers and subwoofer, rear speakers there is no sound.
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 11:01:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Lance wrote :; ; > Ok, I got ALSA installed and there is no static inbetween mp3s like
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 11:03:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; --------------090303060407010605030507; Content-Type: text/plain; charset=us-ascii; format=flowed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 11:37:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Daniel wrote :; ; >  > And yes, I accept patches/comments/suggestions about all those spec
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 12:08:26 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Matthias Saou wrote:; > OK, I'll add this.;
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 13:31:44 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Axel wrote :; ; > I am now relaxed again ;), and pass this info on. Probably Matthias Saou
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  2 13:14:25 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01049.91539978b8a1bbef1b7eef0bb123b07c - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Sep  3 14:20:51 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I wish I could answer your question but my laptop does not have the digital stuff; hooked up :( so I so not know about it. I have an excellent ESS Maestro3 which OSS; supports pretty lame so I was forced to learn about ALSA.
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Sep  4 11:39:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello!; ; i have just found a small issue with the downloader 4 x update. the ftp search engines are missing something like:
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 11:26:19 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've noted that there are packaged versions of; Blackbox and hackedbox available from FreshRPMs.  What; about FluxBox? http://fluxbox.sf.net
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 11:26:46 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --------------Boundary-00=_OYOXHTVA0T2X8R5S233Y; Content-Type: text/plain;;   charset="iso-8859-1"
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 11:28:09 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Back when I had regular RH7.3 there was nothing better than "apt-get upgrade". But; now I'm running (null) beta and I have these questions:;
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 11:46:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 05, 2002 at 07:11:23AM +0000,  Angles  Puglisi wrote:; > If I can use apt, can I use it to get updates from these 3 different places:; > 1. the (null) up2date Redhat upgrades
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 12:50:13 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 05, 2002 at 12:32:58PM +0200, Axel Thimm wrote:; > On Thu, Sep 05, 2002 at 07:11:23AM +0000,  Angles  Puglisi wrote:; > > If I can use apt, can I use it to get updates from these 3 different
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep  5 13:04:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I spun another AlsaPlayer build, this time on my (null) box. I do not know what this; means but the Curl stuff compiled in this time.;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep  6 11:34:02 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi All Folks,; ; I have 'APT' installed and updated from 'freshmeat.net.  But I failed using it
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep  6 11:34:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Stephen wrote :; ; > # apt-get install
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep  6 11:37:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; this is my first problem with one of the freshrpms rpms ...; I just upgrade mplayer and now I get
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:57:43 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):  Hello,;    ;          I just installed redhat 7.2 and I think I have everything
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:57:57 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Make sure you rebuild as root and you're in the directory that you; downloaded the file.  Also it might complain of a few dependencies but; you can get these at freshrpms.net, except for gcc3, which you can find
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:58:05 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Lance wrote:; ; >Make sure you rebuild as root and you're in the directory that you
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:58:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, rob wrote :; ; >  I dl'd gcc3 and libgcc3, but I still get the same error message when I
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:00 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --6sX45UoQRIJXqkqR; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:10 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Harri wrote :; ; > Title page has a login screen and I can't seem to get the apt indexes
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:18 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --yLVHuoLXiP9kZBkt; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Harri wrote :; ; > > You can't get the file index from here either?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:35 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --J2SCkAp4GZ/dPZZf; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:44 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): hey i have a problem:; i have a rpms that i have installed that i want to uninstall, i do it; like so:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 17:59:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Brian wrote :; ; > hey i have a problem:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:01 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): oh ok, thanx alot!! i was puttin the entire rpm package name like; php-4.0.4pl1.i386.rpm; that's why it wasn't working.
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:12 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, Feb 01, 2002 at 12:42:02PM -0500, Brian French wrote:; > hey i have a problem:; > i have a rpms that i have installed that i want to uninstall, i do it
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hiya, I always seem to get errors when I do an "apt update", is this a ; problem on the repository itself, or on my end, or possibly a timeout in ; the connection due to my connection being a crappy modem?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:30 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have failed dependencies in RPM database to I am unable to use; apt-get.  I requests to run 'apt-get -f install' to fix these; dependencies, however, I get these errors when running 'apt-get -f
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Mark wrote :; ; > Hiya, I always seem to get errors when I do an "apt update", is this a
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:46 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Lance wrote :; ; > I have failed dependencies in RPM database to I am unable to use
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:00:54 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello,; ; Tried 'apt-get clean' with same results.
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:02 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi, I'm building an rpm for the resin webserver, and I basically want to ; install the entire tarball under a diretory, but, the tarball includes ; subdirectorys, in my spec i have:
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:10 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 567D71...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01080.b8d12c010e45434e95f67889e26ba456 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:18 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id F2E521...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01081.844461cf79fe409cdfed1c9456c064f0 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:26 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D0BD71...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01082.39917c590e0204c5de0142acd3fb3d08 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Peter Peltonen wrote:; > Sorry about that :) ; >
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:41 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id F2D1C1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01084.f085d737f5244ffe14e8743e9226fd30 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:49 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, Feb 04, 2002 at 05:04:08PM +0200, Peter Peltonen wrote:; > I started wondering how does apt react when it finds a newer kernel in the ; > bunch of "to be updated" files?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:01:56 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Peter wrote :; ; > I started wondering how does apt react when it finds a newer kernel in
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:04 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, Feb 04, 2002 at 04:53:14PM +0100, Matthias Saou wrote:; > It skips it. See the /etc/apt/apt.conf file for this.;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:11 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hiya, I just myself an rpm, and when I did -Uvh to upgrade the earlier ; version I had installed (also from my rpm) I got:;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:18 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mark Derricutt wrote:; > Hiya, I just myself an rpm, and when I did -Uvh to upgrade the earlier ; > version I had installed (also from my rpm) I got:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:26 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Do I need to do anything to recreate anything after deleting this?; ; I did notice an rpm I made the other day didn't work, and just sat there
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:34 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Never mind, there was some cron thing doing rpm -qf ???  seems fine now.; ; --On Wednesday, February 06, 2002 07:37:44 +1300 Mark Derricutt
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:41 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mark Derricutt wrote:; > Never mind, there was some cron thing doing rpm -qf ???  seems fine now.; >
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:48 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Two issues:; ; --<snip>--
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:02:57 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --bg08WKrSYDhXBjb5; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:03:05 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Harri wrote :; ; > On Wed, Feb 06, 2002 at 04:29:53PM +0200, Peter Peltonen wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:03:13 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --=-eAUUkMeF/tAqB1Bi49Ip; Content-Type: text/plain; Content-Transfer-Encoding: quoted-printable
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:03:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, Feb 06, 2002 at 04:30:18PM +0200, Harri Haataja wrote:; > install. I haven't met an openssh like that and in worst case I've had 3; > different openssl libraries (WTF can't they just bump a major version if
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:03:29 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, Feb 06, 2002 at 04:14:27PM +0100, Matthias Saou wrote:; > Strange... all my openssh packages don't explicitly requires a version of; > openssl. What version of openssh do you have? Is it an official Red Hat
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:03:36 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Peter wrote :; ; > On Wed, Feb 06, 2002 at 04:14:27PM +0100, Matthias Saou wrote:
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:04:22 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, Feb 06, 2002 at 04:30:18PM +0200, Harri Haataja wrote:; > I have a few such things (with jdk, imlib, kernel DRI version..; > something) and Ive just made dummy packages (with verbose warning
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:04:30 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): About apt.conf there are these lines:; ; --<snip>--
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  9 18:04:38 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B85561...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01102.d178bf64121423fea27fcbf754d5f984 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:04:46 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thanks for the great work Mathias but I would like to point out that this; list is fastly become the apt-rpm-list instead of the rpm-list. The; discussion concerning apt is overwhelming. Maybe another list is in order
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  9 18:04:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, dTd wrote :; ; >
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Sep 10 18:14:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi all,; ; I'll be leaving this evening until next Monday, with no access to
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Sep 10 18:14:49 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 2002-09-10 at 12:39, Matthias Saou wrote:; > Hi all,; >
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Sep 10 18:14:50 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 10 Sep 2002 18:39:07 +0200; Matthias Saou <matthias@egwn.net> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Sep 11 13:41:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Chris wrote :; ; > On Tue, 2002-09-10 at 12:39, Matthias Saou wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 16 00:09:13 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): There's a realy nasty shortage on sequencers :(; ; (Actually I'd like this running on my main box, which is Irix but that
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Sep 18 16:04:50 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; Just the kind of announce I make once in a while :
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Wed Sep 18 16:17:28 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 403811...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01111.2f7361f87bcf1782c2f7622d92c6bf7d - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep 19 13:02:12 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Greetings ...; ; > PS: Yup, I'm back from my holidays ;-)
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Sep 19 13:02:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, C.Lee wrote :; ; >  > I think I'll use this "--with <whatever>" switch more and more where
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 11:27:23 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou (matthias@rpmforge.net) wrote*:; >- I've rebuilt a new "alsaplayer" package based on Angle's one.;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 11:30:18 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Have you thought of bumping up sylpheed-claws?  I see sylpheed got a; bump... show some claws love?  (;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 11:30:29 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Angles Puglisi (angles@aminvestments.com) wrote*:; >Also, they are developing rapidly in their CVS and looks like their next version; >of alsaplaer will be pretty cool, but I have no idea when it will be ready.
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 11:30:48 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Jesse wrote :; ; > Have you thought of bumping up sylpheed-claws?  I see sylpheed got a
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 17:34:44 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; has anyone an answer for me? The mplayer documentation still suggests to use
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Sep 20 17:34:50 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Axel wrote :; ; > has anyone an answer for me? The mplayer documentation still suggests to
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 18:31:16 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): audio apps at; ; http://ccrma-www.stanford.edu/planetccrma/software/
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 18:31:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 20 Sep 2002 10:40:55 +0200; Matthias Saou <matthias@rpmforge.net> wrote:;
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:06:23 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I need to experiment with ripping out all my "sophisticated" cut/paste; code.  This is mostly historical accident from dealing with very early; versions of Tk, and the emacs "cutbuffer", and other wierd junk.
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:06:27 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's all here in these 10 lines, otherwise known as the; "I'll try my damnest to paste something" procedure:;
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:06:29 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>Hal DeVore said:;  >     "Brent said in his book";  >     This Paste function can be convenient, but it turns out that
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:06:34 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>"Kevin Oberman" said:;  > It did for me, but I am not willing to say it is not a tcl/tk issue as;  > other apps seemed to work OK for cut and paste and Tk does its
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 23 12:08:38 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | I would encourage folks to play with those 10 lines of code in;   | Text_Selection and report what works well for them.  We may come up;   | with 8 lines that work for everyone, or perhaps introduce yet another
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 18:31:06 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_1988991284P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 18:31:12 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Oops - turns out i wasn't careful installing it, so the exmh(library); variable was pointing at my old installation.  I'm surprised it worked; as well as it did.
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 18:31:22 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_2018282504P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 18:31:28 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_2112058634P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 23 23:22:46 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-1590407866P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Tue Sep 24 19:48:31 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-1249285507P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Tue Sep 24 19:48:43 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From exmh-workers-admin@redhat.com  Thu Sep 26 11:00:00 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): cwg-dated-1033065967.2dc492@DeepEddy.Com said:; > From:  Chris Garrigues <cwg-exmh@DeepEddy.Com>; > Date:  Wed, 28 Aug 2002 11:07:01 -0500 >
## Header (preview): From exmh-workers-admin@redhat.com  Thu Sep 26 11:00:03 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems that something changed during the last 3-4 weeks.; ; 1) In a folder, msgs 1-n is read, n=current, n upwards is unread.
## Header (preview): From exmh-workers-admin@redhat.com  Thu Sep 26 16:29:56 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-1577134449P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 30 10:45:20 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; It has been signed conforming to RFC3156.; You'll need GPG or PGP to check the signature.
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 30 10:55:22 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >; > I'll have to try it with another window manager and see if I can; >get exmh to put it back inside of sane boundaries. I don't have this
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 30 10:55:29 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Fri, 27 Sep 2002, "Paul" == Paul Menage wrote:; ;   Paul> so you don't really need the unseen window unless you're
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 30 10:55:04 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In article <E17tS0T-0001zD-00@rds059> you write:; >>>> Patrick Salsbury writes:; >
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep 30 13:36:20 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 30 21:43:56 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 30 21:44:31 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Mon, 30 Sep 2002, "Ted" == Ted Cabeen wrote:; ;   Ted> Here's the code for everybody and the list archives in
## Header (preview): From exmh-workers-admin@redhat.com  Mon Sep 30 21:44:41 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From exmh-workers-admin@redhat.com  Tue Oct  1 10:36:19 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | I vote for this being added to CVS, any objections?; ; No, but using PickMarkSeen (and pick(ids)) as an alternative to
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 11:43:17 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I apologize for not catching up to the current code in so long.; ; Now that I have I'm trying to resolve "breakage" and differences.
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 11:43:19 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've had this binding in my ~/.exmh/exmhbindings for years:; ; set {bindings(key,Flist_FindUnseen 1 ; Inc_PresortFinish)} <Key-f>
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:58:51 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-2120603942P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:58:53 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-2113882517P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:58:49 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have a couple of small issues, and I'm not sure if their exmh issues; or my setup issues.;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:59:24 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Wed, 2 Oct 2002, "Chris" == Chris Garrigues wrote:; ;   Chris> I'm not sure I'll get to it any time soon.
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:59:26 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_-1581861840P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 15:59:28 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Wed, 2 Oct 2002, "Chris" == Chris Garrigues wrote:; ;   Chris> Flist_FindUnseen has changed to Flist_FindSeqs.
## Header (preview): From exmh-workers-admin@redhat.com  Wed Oct  2 18:17:44 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):   | Restarting exmh was necessary.; ; Probably not.   Next time try clicking on the folder name in the
## Header (preview): From exmh-workers-admin@redhat.com  Thu Oct  3 12:22:09 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [I wrote this last night but it appears I never sent it... still ; haven't had time to dig in to it...];
## Warning in strsplit(email_text, "\n"): unable to translate 'From exmh-users-admin@redhat.com  Mon Oct  7 22:40:37 2002
## Return-Path: <exmh-users-admin@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01156.64602d74854cb26859c88c6f560fca27 - missing value where TRUE/FALSE needed
## Header (preview): From exmh-users-admin@redhat.com  Tue Oct  8 10:55:11 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > ; > ; > >>>>> On Tue, 8 Oct 2002, "Dag" == Dag Nygren wrote:
## Header (preview): From exmh-users-admin@redhat.com  Thu Aug 22 14:44:07 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wed Aug 21 2002 at 15:46, Ulises Ponce wrote:; ; > Hi!
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 15:15:12 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_1547759024P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:06:58 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):   | The background color in this window is the same as the background ;   | color in the ftoc.;
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 18:17:16 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > > > > Just cvs up'ed and nowadays Catch-up Unseen is __extremely__ slow on ; > > > > large (>100 msgs) unseen sequences. Anybody else having this problem?; > > >
## Header (preview): From exmh-workers-admin@redhat.com  Thu Aug 22 18:29:40 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_-518574644P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:04:05 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Oooops!; ; Doesn't work at all. Got this on startup and on any attempt to change folder (which fail)
## Header (preview): From exmh-users-admin@redhat.com  Fri Aug 23 11:04:05 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): In a message dated: Thu, 22 Aug 2002 13:03:57 CDT; Ulises Ponce said:;
## Header (preview): From exmh-users-admin@redhat.com  Fri Aug 23 11:04:17 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Thanks Paul,; That is the way I am doing right now, but I would like to NOT use the mouse ; for such things. Any other clue?
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:07:03 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Just got this ... I was just reading mail, but in a very dark; room, where the keyboard is illuminated mostly by the light from; the (laptop) screen.   I think I put my fingers on the wrong keys.
## Header (preview): From exmh-users-admin@redhat.com  Fri Aug 23 11:04:30 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): In a message dated: Thu, 22 Aug 2002 13:53:55 CDT; Ulises Ponce said:;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:04:57 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_267413022P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:06:00 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>>>> On Thu, 22 Aug 2002, "Chris" == Chris Garrigues wrote:; ;   Chris> --==_Exmh_267413022P Content-Type: text/plain;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:06:06 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --==_Exmh_592622610P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From exmh-workers-admin@redhat.com  Fri Aug 23 11:07:16 2002; Return-Path: <exmh-workers-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): When I said ...; ;   | This is from today's cvs
## Header (preview): From exmh-users-admin@redhat.com  Mon Sep  2 13:15:13 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): HELP.; I had GPG working.; I updated from version gnupg-1.0.6 to gnupg-1.0.7.
## Header (preview): From exmh-users-admin@redhat.com  Tue Oct  8 17:01:35 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): problem I ran into was making sure that no attempt was made to ; play a sound when either:;
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 10:48:44 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > > ; > > >   Dag> but when procmail runs it it doesn't, presumably as it; > > >   Dag> doesn't have the authorization to communicate with the
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 18:31:28 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): When I receive a message that has a line starting with "From ", it's; broken into two messages.  I get my mail from /var/spool/mail.  The; program that incorporates mail thinks that the "From " line starts a new
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:41:06 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is not an exmh problem, but an interaction between sendmail, Solaris and ; mh.;
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:41:12 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> On Wed, 9 Oct 2002, "Jason" == Jason Rennie wrote:; ;   Jason> My sysadmins have told me that the sending mail client
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:41:24 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): James> This is not an exmh problem, but an interaction between sendmail,; James> Solaris and mh.;
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:41:27 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): mcmasjc@tatanka.stortek.com said:; > 3)  You can learn to use procmail,;
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:41:46 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In message <200210091843.OAA01268@hippolyta.crd.ge.com>, Kevin Kenny said:; > ; > mcmasjc@tatanka.stortek.com said:
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:42:09 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; It has been signed conforming to RFC3156.; You'll need GPG or PGP to check the signature.
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:43:07 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In message <200210091925.g99JPGfJ001534@fsck.intern.waldner.priv.at>, Robert ; ldner said:; >
## Header (preview): From exmh-users-admin@redhat.com  Wed Oct  9 22:43:15 2002; Return-Path: <exmh-users-admin@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --==_Exmh_1405404058P; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 18:31:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 23 Sep 2002 17:41:20 +0200; Matthias Saou <matthias@egwn.net> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 18:31:43 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Jesse wrote :; ; > On Fri, 20 Sep 2002 10:40:55 +0200
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 18:31:51 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Jesse wrote :; ; > Oh yeah, I was following this thread in the sylpheed-claws list.  Very
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 23 22:46:13 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; First you have to get the win32 files !!!
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Sep 24 19:48:36 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi folks, I just uploaded RPMS of the new netatalk 1.5.5 released ; yesterday, thought folks here might be interested.  This release fixes a ; nastygram in saving files via Illustrator that I personally have been
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 11:12:47 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello,; ; I'm new to the list.
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 11:13:05 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Thomas wrote :; ; > I wanted to find out who tried recompiling a working apt rpm for (null)
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:39:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; Red Hat 8.0 is released tomorrow (monday).  I took some time out to make
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:40:05 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; > On Sun, 29 Sep 2002, Thomas Vander Stichele wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:40:11 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Thomas wrote :; ; > > On Sun, 29 Sep 2002, Thomas Vander Stichele wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:40:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > > > INFO (15299: 0)gst_xml_registry_rebuild:1555: Plugin ; > > > > /usr/lib/gst/libgstwincodec.so failed to load: Error loading plugin ; > > > > /usr/lib/gst/libgstwincodec.so, reason: /usr/lib/libaviplay-0.7.so.0:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:43:32 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Peter Peltonen (peter.peltonen@iki.fi) wrote*:; >BTW: I just a found a quite nice looking apt repositry for; >all kinds of audio apps at
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:44:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias,; ; On Mon, Sep 30, 2002 at 09:28:26AM +0200, Matthias Saou wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 13:44:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Indeed - I was thinking of getting back into doing mods - nice to see an ; apt-get'able soundtracker there :-);
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 21:44:13 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I would appreciate it if you could get Gabber packages for Red Hat 8. I ; will be making a new release soon, but even in the meantime, 0.8.7 ; packages would be ok.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep 30 21:44:23 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D36181...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01199.59f410d0b6c37510d6a29d0d02f62101 - missing value where TRUE/FALSE needed
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 21:44:30 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Hesty wrote :; ; > I know they're all included in the freshrpms alsa-null
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 21:44:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ralf wrote :; ; > Are there any reasons _not_ to use the new apt releases on RH 7.x?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 21:45:10 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi.; ; Matthias Saou <matthias@egwn.net> wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep 30 21:45:14 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou wrote:; > ; > I'd like to aks this on the rpm-zzzlist : Would a new dependency of 250k, the
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:32:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Hesty wrote :; ; > > Where you can see :
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:33:16 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi.; ; Matthias Saou <matthias@egwn.net> wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:33:02 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ralf wrote :; ; > Matthias Saou <matthias@egwn.net> wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:35:50 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Is it possible to use new apt to do (null) to RH8 upgrade?; ; Even if it's possible, are there good reasons why maybe I should not do it and
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:38:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Is it possible to use new apt to do (null) to RH8 upgrade?; ; It might be, don't think anyone tried it yet.
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 10:50:41 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I remember apt-get dist-upgrading from 7.2 to 7.3 fine, so it -should- ; work, maybe :);
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 14:51:43 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Mark wrote :; ; > I remember apt-get dist-upgrading from 7.2 to 7.3 fine, so it -should-
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 14:58:44 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 1 Oct 2002, Angles Puglisi wrote:; ;
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 15:02:17 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Julian wrote :; ; > I would appreciate it if you could get Gabber packages for Red Hat 8. I
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  1 15:05:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Matthias wrote :; ; > I'm facing another problem right now. It looks like libsigc++ is no
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:41:25 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou (matthias@egwn.net) wrote*:; >As Red Hat does, I really don't recommend trying to upgrade between betas; >or from a beta to a final release either. Simply backup your /home, /etc
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:43:34 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Matthias Saou (matthias@egwn.net) wrote*:; > >As Red Hat does, I really don't recommend trying to upgrade between betas; > >or from a beta to a final release either. Simply backup your /home, /etc
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:44:09 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; --Boundary_(ID_KtnWPrcWHTTzQa7OHxPjiA)
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Wed Oct  2 11:44:20 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id BC29D1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01217.ca4f6cab0653e40829f209aefb242ae0 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:44:56 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ben wrote :; ; > I use a mostly Red Hat 8.0 system, but prefer to configure and build my
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:45:04 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou wrote:; > Well, I don't really find it consistent at all to use an rpm package; > built against something that wasn't installed through rpm :-/
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:45:06 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Brian wrote :; ; >     Yeah, I need to work this out, too; I just learned my lesson about
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:45:15 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; This has been hashed over a few times on various lists, now I finally got
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 11:45:18 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Brian wrote :; ; >    Yeah, but I try to 'take it easy' on your server.  The golden rule of
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Wed Oct  2 11:45:08 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 72F801...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01223.bd57469f0b8c0ca986d7a3f40681b56e - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 18:17:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, ""Angles" wrote :; ; > When I went all "Open Source", I stopped using my old partioning app
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 21:15:48 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --RnlQjJ0d97Da+TV1; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  2 21:15:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou (matthias@egwn.net) wrote*:; >You're really better off backuping all placed where you know you've hand; >edited or installed some files. For me that's only /etc/, /root/ and
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 12:21:41 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Gary wrote :; ; > On Wed, Oct 02, 2002 at 10:09:19AM +0200, Matthias Saou wrote:
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 12:21:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, ""Angles" wrote :; ; > Matthias Saou (matthias@egwn.net) wrote*:
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 12:23:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ; Since I upgraded to redhat8 mplayer -vo sdl isnt working for me; It gives me black screen and I only hear sound.
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 12:25:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > Since I upgraded to redhat8 mplayer -vo sdl isnt working for me
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 12:25:27 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):  >> > Well, I don't really find it consistent at all to use an rpm package;  >> > built against something that wasn't installed through rpm :-/;  >>
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 16:02:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 4 Oct 2002, Mark Derricutt wrote:; ; > Anyone know where one could get rpms for alot of the python libraries for
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 16:02:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --=-ITC4wxYrfSWQCmQFalKh; Content-Type: text/plain; Content-Transfer-Encoding: quoted-printable
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct  3 19:28:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 4 Oct 2002, Mark Derricutt wrote:; ; > Anyone know why Red Hat insist on sticking with python 1.5.2?
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 10:57:57 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 04 Oct 2002 01:14:28 +0200; Vincent <cult@free.fr> wrote:;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Fri Oct  4 10:58:05 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id A78E81...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01236.80295013ea9517181a3a42ad0d4a7f63 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 10:58:10 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ahh sweet.  Theres a reason for me to upgrade then :-); ; --On Thursday, October 03, 2002 16:20:46 +0300 Panu Matilainen
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 10:59:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jesse Keating wrote:; ; >On Fri, 04 Oct 2002 01:14:28 +0200
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 10:59:45 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ville wrote :; ; > how about applying this to the default apt.conf shipped with the
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 10:59:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 04 Oct 2002 03:25:30 +0200; Vincent <cult@free.fr> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:00:41 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): checking build system type... i686-pc-linux-gnu; checking host system type... i686-pc-linux-gnu; checking target system type... Invalid configuration
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:00:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:01:14 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou wrote:; ; >Once upon a time, Roi wrote :
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:01:16 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou wrote:; ; >Once upon a time, Roi wrote :
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:02:23 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > The new spec didn't even want to build the package
## Header (preview): From rpm-list-admin@freshrpms.net  Fri Oct  4 11:02:23 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > `athalon-redhat-linux': machine `athalon-redhat' not recognized; > configure: error: /bin/sh admin/config.sub athalon-redhat-linux failed; > error: Bad exit status from /home/dale/rpmbuild/tmp/rpm-tmp.26673
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Fri Oct  4 11:32:36 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 3C2071...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01247.2a40443c1cba2e07a993b186db41971d - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:35:14 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Although it looks like I'm replying to myself, I just haven't gotten; Matthias' reply yet, although I can see it on the website (and I did; subscribe, but probably to the digest).
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:35:21 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Brian wrote :; ; >
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:35:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou (matthias@rpmforge.net) wrote*:; >I really think that with my ALSA packages, ALSA on Red Hat Linux has never; >been so easy! ;-)
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:36:14 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Haase wrote:; > RH ships the code with the bytecode hinter disabled which makes ; > non-AA fonts really ugly.
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:37:11 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I can't seem to build this package. It errors out because rpm found ; files not included in any of the packages. I tried getting them addes ; (it's the documentation that is being loaded) and was unsuccessful.
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 10:37:14 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On a RH 8 box, I'm trying to install your package; xine-0.9.13-fr5.i386.rpm, I keep running into dependency problems.  I've; tried to install the dev and lib rpm's as well and they error out with
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Sat Oct  5 10:37:15 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 5163E1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01254.e1ba700d620871e67b4f7db4b8859ac3 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 12:38:06 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Coy wrote :; ; > I can't seem to build this package. It errors out because rpm found
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 12:38:12 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, Oct 02, 2002 at 10:45:04PM +0200, Matthias Saou wrote:; > > So I've attached a patch to specify an alternate kernel by setting the; > > "TARGET_KERNEL" environment variable before running rpmbuild. You
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 12:38:08 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, QuaffA wrote :; ; > I've tried the --without options, but still end up with (similar for the
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 14:07:18 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thanks Matthias...After installing those packages Xine now installs; fine.  Guess I shoulda figured that one out...;
## Header (preview): From rpm-list-admin@freshrpms.net  Sat Oct  5 17:21:50 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 04 Oct 2002 16:07:12 -0700; Ben Liblit <liblit@eecs.berkeley.edu> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Sun Oct  6 22:51:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias said:; ; >Could you post the list of files in question?
## Header (preview): From rpm-list-admin@freshrpms.net  Sun Oct  6 22:52:10 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sat, 5 Oct 2002, Coy Krill wrote:; ; > Sure. I used the following command to rebuild the package:
## Header (preview): From rpm-list-admin@freshrpms.net  Sun Oct  6 22:54:53 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Same as in mplayer src package; the --with and --without not working correctly; I do --without arts and it still want to install with arts
## Header (preview): From rpm-list-admin@freshrpms.net  Sun Oct  6 22:54:56 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > Same as in mplayer src package
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 12:02:15 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): hdparm -d1 /dev/hdc says Operation not Permitted.; DVD playback is very jumpy.; Does someone have any ideas on what I can do yo get DMA transfers?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 12:03:31 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 2002-10-06 at 21:17, Alvie wrote:; > hdparm -d1 /dev/hdc says Operation not Permitted.; > DVD playback is very jumpy.
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 12:04:39 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thank you, that was exactly what I needed.; DVD works great now.; 1 more problem?
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 12:04:42 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): When I try to use apt-get upgrade; it wants to install libusb while I got it; (same version)
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Oct  7 12:04:45 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 105E71...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01268.0cd2c295a12fb03140c6549cb8980012 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 12:05:58 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; In my build scripts, I have problems with some of the kernel packages.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Oct  7 18:28:12 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D90D21...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01270.49d052edd258d0f9eb08ca05e177f965 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:28:36 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ville wrote :; ; > > BTW, I think I'll kake it so that my ogle package automatically inserts
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:28:37 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-10-07 at 08:59, Matthias Saou wrote:; > Once upon a time, Alvie wrote :; >
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:28:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Alvie wrote :; ; > This is only the last part of it.I used 'rpmbuild --rebuild --without
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Oct  7 18:41:12 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 835001...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01274.bfe4843cd130926efe53dc96bd3dfeea - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:41:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ville wrote :; ; > I assume that you won't %ghost or remove these and the modules.conf
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:54:52 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2002-10-07 at 11:54, Matthias Saou wrote:; > Once upon a time, Alvie wrote :; >
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 18:54:54 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 7 Oct 2002 19:28:51 +0200; Matthias Saou <matthias@rpmforge.net> wrote:;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 19:49:15 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Jesse wrote :; ; > When I worked as a PC repair tech for a Computer store chain, I did
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Oct  7 19:49:17 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id C2FB11...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01279.8cd7c5fcfd7a06b4e2b066a7c76846fe - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Oct  7 19:49:22 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 525541...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01280.08e69f637d901fab10aec6c9492d068e - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 19:49:22 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Ville wrote :; ; > Any plans for rolling Nessus RPMs for RH8?  Miss it already...
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Oct  7 22:40:35 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've put up a new Red Hat Linux 8.0 build of nessus here :; http://ftp.freshrpms.net/pub/freshrpms/testing/nessus/;
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:55:16 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): humberto@hpcf.upr.edu wrote:; ; >Redhat 8 disables all support for .mp3 files, relinking xmms with a zzmp3
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 15:30:59 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matthias Saou wrote:; ; >Once upon a time, Roi wrote :
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 15:42:29 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > mplayer works with dga (if i am root) and works with x11
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Aug 29 16:32:22 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Joshua wrote :; ; > Just a thought, would it be possible to generalize this ALSA
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:21:22 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Thanks Matthias.  Actually I got all four speakers with subwoofer; working in digital out mode with gamixer.; (http://www1.tcnet.ne.jp/fmurata/linux/down/)
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:22:38 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I want to thank those involved in making these RPMS available.  Thanks; guys, thanks Matthias.;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:24:03 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On 14:22 29 Aug 2002, Matthias Saou <matthias@egwn.net> wrote:; | Once upon a time, Axel wrote :; | > I am now relaxed again ;), and pass this info on. Probably Matthias Saou
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:32:46 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I know this is simple but do you have /usr/src/linux and; /usr/src/linux-2.4 symlinked to your kernel source directory?  Also is; there a .config in /usr/src/yourkernelsource/.config  ?
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Mon Sep  2 12:34:20 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01291.dfc4b8ceb611c971fb6b821eecaa9cea - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 12:34:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Once upon a time, Ville wrote :; ; > Not me, but IMHO it's kind of offtopic to put it in freshrpms.net RPMs.
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 13:12:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This mixer is specific to ALSA's special stuff, I use it in addition to the other; mixers if I need something special.;
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Sep  2 13:15:10 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multipart message in MIME format; ; -----=_Next_Part_10878775_zmiO_mWTr_109818780
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Tue Oct  8 00:10:03 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 9C99F1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01295.c440ea598ea18fee4cf3d2a1a9cd6864 - missing value where TRUE/FALSE needed
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:55:23 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > RPM build errors:
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:55:25 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Roi wrote :; ; > oh xmms didn't work for me also
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:56:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 7 Oct 2002, Thomas Vander Stichele wrote:; ; > Hi,
## Header (preview): From rpm-list-admin@freshrpms.net  Tue Oct  8 10:56:24 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 7 Oct 2002, Jesse Keating wrote:; ; > On Mon, 7 Oct 2002 19:28:51 +0200
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Aug 28 10:46:33 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Matthias Saou (matthias@rpmforge.net) wrote*:; >; >You can also install the XMMS plugin
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 18:18:04 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): After installing and enabling xosd-xmms I get the following error when; trying to start xmms;
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 18:18:25 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Jon wrote :; ; > Since libdvdcss-1.2.0, I have been unable to play DVDs using ogle, xine,
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 22:41:48 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've also just tried doing rpm --rebuilddb, no change.; ; A question:
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 22:42:20 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Should I expect problems if my apt server is running RH 7.3/Apt 0.3 and; some clients are coming on line and will be running RH 8.0/Apt 0.5? Do; the two different version interoperate?
## Header (preview): From rpm-list-admin@freshrpms.net  Wed Oct  9 22:42:55 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Once upon a time, Thomas wrote :; ; > Should I expect problems if my apt server is running RH 7.3/Apt 0.3 and
## Header (preview): From rpm-list-admin@freshrpms.net  Thu Oct 10 12:32:37 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello,; ; Has anyone made a working source RPM for dvd::rip for Red Hat 8.0?
## Warning in strsplit(email_text, "\n"): unable to translate 'From rpm-list-admin@freshrpms.net  Thu Oct 10 12:32:38 2002
## Return-Path: <rpm-zzzlist-admin@freshrpms.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 2CB5A1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01307.4b06bdd9604366d63b4106aa8c715c06 - missing value where TRUE/FALSE needed
## Header (preview): From nobody@dogma.slashnull.org  Fri Aug 23 12:20:28 2002; Return-Path: <nobody@dogma.slashnull.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): **Dublin**: something from the archives.    Daev Walsh forwards an article from; The Irish Digest about ''Billy in the Bowl''.  This story is also immortalised; in an old Dublin song, which in turn was mentioned in a Pogues track.  Billy
## Header (preview): From craig@deersoft.com  Fri Aug 23 11:07:09 2002; Return-Path: <craig@deersoft.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I never claimed it could learn *all* combinatorial ; possibilities, but it certainly can learn some.;
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Aug 23 11:12:01 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hello all,; I get problems with the latest nightly build from Spamassassin with; VMailMgr + OMail-Admin.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:07 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): "Craig R.Hughes" said:; ; > Are you filtering the nonspamtrap for spam when those
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:13 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Like an alias for each list that points to the nonspamtrap address.; ;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:12 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): As the subject line indicates, I'm sure these are stupid questions, but; I'm having trouble getting SA working like I understand it should work,; and have about given up on trying to figure it out myself.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:17 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --lteA1dqeVaWQ9QQl; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Fri Aug 23 11:12:22 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/masses; In directory usw-pr-cvs1:/tmp/cvs-serv440/masses;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:29 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I think with the confusion and all, we should give these folks ; until the end of the day to get fixed logs uploaded :);
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:28 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thursday, August 22, 2002, at 09:36  AM, Justin Mason wrote:; ; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Aug 23 11:12:34 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): So do you know my public key?  Does the guy who wants to buy ; 10,000 licenses of SpamAssassin Pro?  Do I really want to lose ; email from either of you?
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 15:41:16 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi Folks,; ; I have just installed spamassassin 2.31 in my postfix MTA server.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:46:58 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ---------- Forwarded message ----------; From: Vernon Schryver <vjs@calcite.rhyolite.com>; To: dcc@calcite.rhyolite.com
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:47:05 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): There is a whitelist RBL now!  Ironport's Bonded Sender is ; basically a whitelist RBL where you post a bond to get on the ; list, and then lose the bond if you end up spamming from that IP
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Aug 26 16:47:05 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Political news T R U T H O U T uses it too.; ; Justin Mason wrote:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:47:11 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Luiz Felipe Ceglia said:; ; >    :0fw
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:47:12 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Brian R. Melcer said:; >> I've got spamassassin installed and tested on MacOS X 10.1.5,; >> although there are issues with spamd still.  So in addition to
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:57:11 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Daniel Quinlan <quinlan@pathname.com> wrote:; > Exactly, except that I think you may be too optimistic; > about the reporting, the timeframe, and the accuracy.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 16:57:12 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): "Craig R.Hughes" said:; ; > The GA run on the current corpus is yielding an average (mean)
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Aug 26 18:01:19 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002 the voices made bugzilla-daemon@hughes-family.org write:; ; > http://www.hughes-family.org/bugzilla/show_bug.cgi?id=735
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 18:01:29 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Mon, 26 Aug 2002 the voices made CertaintyTech write:; ; > Recently I have been receiving Spam where both the From: and To: address are
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Aug 26 19:13:51 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi, does anyone have a collection of real-world-spam, that I could use to; test my setup?;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Tue Aug 27 10:36:05 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/debian; In directory usw-pr-cvs1:/tmp/cvs-serv23243/debian;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Aug 27 17:34:50 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tuesday, August 27, 2002, at 06:03  AM, Tony L. Svanstrom wrote:; ; > Where can I find it, I was searching online without any luck... =(
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Aug 27 17:34:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002 the voices made Matt Sergeant write:; ; > I've got 6C115 (I think) the current developer release (though not the same
## Header (preview): From jason-exp-1031164464.7f11b3@mastaler.com  Wed Aug 28 10:44:14 2002; Return-Path: <jason-exp-1031164464.7f11b3@mastaler.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > Sounds a lot like TMDA to me. :( Filing date is July 26, 2001,
## Header (preview): From quinlan@pathname.com  Wed Aug 28 10:45:34 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > Actually, I want to avoid that -- I've already removed spamproxyd
## Header (preview): From jm@jmason.org  Wed Aug 28 10:45:59 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > I would be in favor of creating new SpamAssassin CVS modules and; > Bugzilla categories for other clients (provided there is sufficient; > interest and a maintainer).
## Header (preview): From felicity@kluge.net  Wed Aug 28 10:46:13 2002; Return-Path: <felicity@kluge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --wLAMOaPNJ0fu1fTG; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Warning in strsplit(email_text, "\n"): unable to translate 'From rlfrank@paradigm-omega.com  Wed Aug 28 10:46:41 2002
## Return-Path: <rlfrank@paradigm-omega.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 7DAE...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01337.e515b1d01d6d98606d994b1c8901904c - missing value where TRUE/FALSE needed
## Header (preview): From brian@unearthed.com  Wed Aug 28 10:56:21 2002; Return-Path: <brian@unearthed.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>From tmda.net/history.html:; ; The first release of TMDA in April 2001 was essentially a rewrite of TMS in
## Header (preview): From tony@svanstrom.com  Wed Aug 28 10:56:41 2002; Return-Path: <tony@svanstrom.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tue, 27 Aug 2002 the voices made Jason R. Mastaler write:; ; > jm@jmason.org (Justin Mason) writes:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 15:18:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Tuesday 27 August 2002 19:26 CET Leroy B. wrote:; > Ignore...;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 15:50:08 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): | ; | 0 hits here. :(; |
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 15:50:09 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday 28 August 2002 16:33 CET Theo Van Dinter wrote:; > On Wed, Aug 28, 2002 at 04:20:52PM +0200, Malte S. Stretz wrote:; > > I get about 3 of these per week. A google for trafficmagnet convinces
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 16:11:56 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): * Steve Thomas <sthomas@apexvoice.com> [2002-08-28T07:52-0700]:; > I also get a lot of them. I think they're using the domain registry; > database to pull their victims' addresses.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 16:22:09 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday 28 August 2002 16:45 CET Steve Thomas wrote:; > | 0 hits here. :(; >
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Wed Aug 28 17:25:57 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------- Additional Comments From daniel@roe.ch  2002-08-28 09:15 -------; 3. usage of <p> just like <br> (ie. without </p>) which is obsolete;    (not sure whether some mailers still produce such broken html)
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Aug 28 17:56:53 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/masses; In directory usw-pr-cvs1:/tmp/cvs-serv6501/masses;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Aug 28 17:56:53 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin; In directory usw-pr-cvs1:/tmp/cvs-serv6501;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 19:30:34 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Well if you're talking about epiphany, which is in January, then yes it is; 5 months.Some people do celebrate Christmas on january 6th, or even the 13th.;
## Header (preview): From prlawrence@lehigh.edu  Thu Aug 29 11:06:07 2002; Return-Path: <prlawrence@lehigh.edu>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Justin Mason wrote:; > Phil R Lawrence said:; >
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:05:30 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): OK guys -- I reckon it's now Good Enough, modulo some minor score; tweaking, or commenting of some more broken/high-FP-ing rules.;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:32 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi, I'm trying to build SA under Digital Unix 4.0f and am receiving a; compile error (and many warnings) for spamc.  The "perl Makefile.PL"; does OK, but when I do the make, I get this:
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:35 2002
## Return-Path: <spamassassin-talk-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.net...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01352.400cef8d0d007f3d7ba8a0c7a8717fcb - missing value where TRUE/FALSE needed
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:05:37 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0088_01C24EA2.FC21D7A0
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:48 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): To update spamassasin, all I need to do is install the new tar.gz ; file as if it were a new installation? I don't need to stop incoming ; mail or anything like that? Thanks, Mike
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > the number 1 ISP in France and the third ISP in; > Europe Wanadoo.fr is using non RFC2822 compliant; > mail servers:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > I may be dense, but why would anyone want to utilize Habeus?  To; > me, it looks like a potential backdoor to anyone's defenses against spam.;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:05:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wed, 2002-08-28 at 13:57, Michael Clark wrote:; > To update spamassasin, all I need to do is install the new tar.gz ; > file as if it were a new installation? I don't need to stop incoming
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:06:00 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --k3qmt+ucFURmlhDS; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:03 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday, August 28, 2002, at 11:48  AM, Robin Lynn Frank wrote:; ; > If I were a spammer, I'd simply set up a server, send out my
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:10 2002
## Return-Path: <spamassassin-talk-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.net...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01360.542f5bf8fe1935cc079504c0a0269923 - missing value where TRUE/FALSE needed
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:06:15 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Justin Mason wrote:; ; > What do you all think?  are we ready to go?  anyone run into any trouble
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:19 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I'm a new user (or about to be, hopefully) of SA but I've run into some; compilation errors that prevent me from installing.  Rather than picking; through the code, I thought I'd avoid reinventing the wheel and ask here.
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Thu Aug 29 11:06:38 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/masses; In directory usw-pr-cvs1:/tmp/cvs-serv24879;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:43 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Robin Lynn Frank <rlfrank@paradigm-omega.com> writes:; ; > I may be dense, but why would anyone want to utilize Habeus?  To me,
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > MSG_ID_ADDED_BY_MTA   (4.0 points); > INVALID_MSGID         (1.8 points) ; > MSG_ID_ADDED_BY_MTA_2 (1.6 points)
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:06:55 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi, I'm trying to build SA under Digital Unix 4.0f and am receiving a; compile error (and many warnings) for spamc.  The "perl Makefile.PL"; does OK, but when I do the make, I get this:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:07:00 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Is there a way to tell spamassassin to put the results at the bottom; of the message instead?  If not, what is the easiest way to do this.; I found a report_header, but no equivalent report_bottom.
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Thu Aug 29 11:07:07 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/t; In directory usw-pr-cvs1:/tmp/cvs-serv3992/t;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:07:11 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday 28 August 2002 01:50 pm, Robin Lynn Frank wrote:; ; > On Wednesday 28 August 2002 01:34 pm, Brian McNett wrote:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:07:19 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wed, 28 Aug 2002, Matthew Cline wrote:; ; > There must be *some* way of tracking a spammer down, since they are
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Thu Aug 29 11:07:34 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin; In directory usw-pr-cvs1:/tmp/cvs-serv15398;
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:07:41 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > t/db_based_whitelist.Use of bare << to mean <<"" is deprecated at; > ../lib/Mail/SpamAssassin/HTML.pm line 1. Use of bare << to mean <<"" is; > deprecated at ../lib/Mail/SpamAssassin/HTML.pm line 6. Unquoted string
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:07:46 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Matthew Cline <matt@nightrealms.com> writes:; ; > There must be *some* way of tracking a spammer down, since they are
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:07:57 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday, August 28, 2002, at 01:50  PM, Robin Lynn Frank wrote:; ; > And if a spammer forges headers???
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:02 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday, August 28, 2002, at 04:38  PM, Daniel Quinlan wrote:; ; > Just a few notes:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:08 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Now that I have spam assassin and mailscanner working, how can I have smap; deleted rather than forwarded?;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:06 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wednesday 28 August 2002 04:38 pm, Daniel Quinlan wrote:; > Matthew Cline <matt@nightrealms.com> writes:; > > There must be *some* way of tracking a spammer down, since they are
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:12 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Guys, the Habeas Infringers List (HIL) exists explicitly to deal with; spammers while we're getting judgments against them and especially in; other countries, where those judgments are harder to get.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:19 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Wed, 28 Aug 2002 17:45:49 -0700; Brian McNett <bmcnett@radparker.com> wrote:;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:29 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Don Newcomer wrote:; > I'm a new user (or about to be, hopefully) of SA but I've run into some; > compilation errors that prevent me from installing.  Rather than picking
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 29 11:08:30 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > It's this section of spamassassin.raw:; >; > <<<<<<< spamassassin.raw
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:40 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):     DanQ> I think it would make more sense to start Habeas with a less;     DanQ> aggressive score (one which will not give spammers a quick path;     DanQ> into everyone's inbox) and after we've seen evidence that the
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:39 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dan Kohn <dan@dankohn.com> writes:; ; > Guys, the Habeas Infringers List (HIL) exists explicitly to deal with
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 11:08:46 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): > I think I've worked on SA enough to understand that I can localize a; > score.  I'm just not comfortable with using SpamAssassin as a vehicle; > for drumming up your business at the expense of our user base.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 13:00:56 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Urban Boquist wrote:; > If I run spamassassin on this message:; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 13:42:18 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Urban Boquist wrote:; > Hi Matt, and thanks for your quick reply.; >
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Thu Aug 29 14:47:39 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Update of /cvsroot/spamassassin/spamassassin; In directory usw-pr-cvs1:/tmp/cvs-serv7642;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 16:01:58 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thursday 29 August 2002 16:39 CET Mike Burger wrote:; > >[...]; > > re-check I find it immediately:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 17:13:53 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Urban Boquist wrote:; ; > it seems to hang. Memory usage goes up to 73MB and stays there. I have
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 17:13:52 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Bart Schaefer said:; ; > This is off the topic of the rest of this discussion, but amavisd (in all
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 17:24:07 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, Aug 29, 2002 at 11:37:02AM +0100, Clayton, Nik [IT] wrote:; > Have the UPPERCASE_* rules been tested on messages in non-English ; > character sets, and/or where the message is MIME encoded in some way?
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Aug 29 17:35:05 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --9amGYk9869ThD9tj; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From quinlan@pathname.com  Mon Sep  2 12:32:26 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > BTW I tried tweaking some of the scores that lint-rules complained about
## Header (preview): From craig@deersoft.com  Mon Sep  2 12:35:35 2002; Return-Path: <craig@deersoft.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ; ; On Friday, August 30, 2002, at 02:19  AM, Justin Mason wrote:
## Header (preview): From craig@hughes-family.org  Mon Sep  2 13:12:49 2002; Return-Path: <craig@hughes-family.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Daniel Quinlan wrote:; ; DQ> Before we release, it'd be great if someone could test a few
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep  2 16:24:19 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, 29 Aug 2002, Rick Beebe wrote:; ; > > cc: Error: spamd/spamc.c, line 50: In this declaration, "in_addr_t" has no
## Header (preview): From felicity@kluge.net  Mon Sep  2 23:14:41 2002; Return-Path: <felicity@kluge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --eJnRUKwClWJh1Khz; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Aug 23 11:06:18 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Folks, ; ; Some of you seem to have hardcoded honor as the default catalogue server.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Aug 23 11:06:52 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I know that I did this during the week that all the catalogue's were; hokey but after that I changed it back to discovery.  So I can see why; people are using honor.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Aug 23 11:07:36 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I'm after a recipe for using Razor with Sendmail. Unfortunately, I can't ; get Procmail on my hosting but I do have full access to the Sendmail ; alias list.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Aug 23 15:20:53 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Aug 23 16:55:11 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Good day, Fox,
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:16:22 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --hdW7zL/qDS6RXdAL; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:16:16 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): "Bort, Paul" <pbort@tmwsystems.com> wrote:; >If your sendmail has been compiled with Milter support, you can add SMRazor; >easily. We've been using it for a while without problems. Others on the list
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:16:30 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): If you didn't add it when compile would be one way.  Another would be to; grep your sendmail.cf for the word Milter.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:16:58 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --o99acAvKqrTZeiCU; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From dwheeler@ida.org  Tue Sep  3 17:20:20 2002; Return-Path: <dwheeler@ida.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you need to store a database password, then; clearly the first step is to store the text outside the; web tree.  You can encrypt it and store the encryption key elsewhere,
## Header (preview): From ygingras@eclipsys.qc.ca  Tue Sep  3 17:20:22 2002; Return-Path: <ygingras@eclipsys.qc.ca>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Warning in strsplit(email_text, "\n"): unable to translate 'From ygingras@ygingras.net  Tue Sep  3 22:18:53 2002
## Return-Path: <ygingras@ygingras.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 27A7E16F6B
##  for <jm@loc...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01409.6874e3b9aad08eb5081dfcbaa3871ffe - missing value where TRUE/FALSE needed
## Header (preview): From ygingras@ygingras.net  Wed Sep  4 11:37:37 2002; Return-Path: <ygingras@ygingras.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From glynn.clements@virgin.net  Wed Sep  4 11:37:31 2002; Return-Path: <glynn.clements@virgin.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yannick Gingras wrote:; ; >    I am wondering if there are any techniques to make a CD-Key of the like
## Header (preview): From glynn.clements@virgin.net  Wed Sep  4 18:58:43 2002; Return-Path: <glynn.clements@virgin.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yannick Gingras wrote:; ; > > What do you mean by "CD-Key or the like" (I presume that "of" was a
## Header (preview): From ygingras@ygingras.net  Wed Sep  4 18:58:57 2002; Return-Path: <ygingras@ygingras.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > Is the use of "trusted hardware" really worth it ?; >; > Answering that requires fairly complete knowledge of the business
## Header (preview): From ygingras@ygingras.net  Wed Sep  4 18:59:01 2002; Return-Path: <ygingras@ygingras.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Software vendors have been trying since forever to prevent software piracy.; > Remember when you had to enter a specific word from a specific page of the; > software manual, which was printed on dark maroon paper so that it could
## Header (preview): From ben@algroup.co.uk  Wed Sep  4 18:59:06 2002; Return-Path: <ben@algroup.co.uk>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yannick Gingras wrote:; > Is the use of "trusted hardware" really worth it ?  Does it really make it ; > more secure ?  Look at the DVDs.
## Header (preview): Return-Path: whisper@oz.net; Delivery-Date: Thu Sep  5 23:42:38 2002; From: whisper@oz.net (David LeBlanc)
## Body (preview): Errr... not to be pedantic or anything, but this is called "omit one; testing" or OOT in the literature IIRC. Helpful in case you're searching for; additional information, say at http://citeseer.nj.nec.com/ for instance.
## Header (preview): Return-Path: nas@python.ca; Delivery-Date: Thu Sep  5 23:49:23 2002; From: nas@python.ca (Neil Schemenauer)
## Body (preview): Tim Peters wrote:; > I've run no experiments on training set size yet, and won't hazard a guess; > as to how much is enough.  I'm nearly certain that the 4000h+2750s I've been
## Header (preview): Return-Path: nas@python.ca; Delivery-Date: Thu Sep  5 23:56:01 2002; From: nas@python.ca (Neil Schemenauer)
## Body (preview): David LeBlanc wrote:; > Errr... not to be pedantic or anything, but this is called "omit one; > testing" or OOT in the literature IIRC.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 03:14:07 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip Montanaro]; > Any thought to wrapping up your spam and ham test sets for; > inclusion w/ the spambayes project?
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 03:41:13 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Tim> I gave it all the thought it deserved <wink>.  It would be;     Tim> wonderful to get several people cranking on the same test data, and;     Tim> I'm all in favor of that.  OTOH, my Data/ subtree currently has
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 07:09:11 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > Another area for potentially fruitful study:  it's clear that the; > highest-value indicators usually appear "early" in msgs, and for spam
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Fri Sep  6 08:59:38 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): I've got a test set here that's the last 3 and a bit years email to; info@ekit.com and info@ekno.com - it's a really ugly set of 20,000+; messages, currently broken into 7,000 spam, 9,000 ham, 9,000 currently
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Fri Sep  6 09:06:57 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): >>> Tim Peters wrote; > > I've actually got a bunch of spam like that. The text/plain is something; > > like
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Fri Sep  6 09:11:50 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): >>> Anthony Baxter wrote; > I'm currently mangling it by feeding all parts (text, html, whatever ; > else :) into the filters, as well as both a selected number of headers
## Header (preview): From felicity@kluge.net  Mon Sep  2 23:15:26 2002; Return-Path: <felicity@kluge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --1sNVjLsmu1MXqwQ/; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Sep  3 00:14:22 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ; I've just installed SpamAssassin and relevant modules.; Just tried the initial test:
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Sep  3 00:14:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2 Sep 2002, Richard Kimber wrote:; ; > On Mon, 2 Sep 2002 13:20:46 -0700 (PDT)
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Tue Sep  3 00:14:56 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/masses/tenpass; In directory usw-pr-cvs1:/tmp/cvs-serv26829/tenpass;
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Tue Sep  3 00:14:24 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Tue Sep  3 00:15:26 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From steveo@syslang.net  Tue Sep  3 14:31:15 2002; Return-Path: <steveo@syslang.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 2 Sep 2002, Justin Mason wrote:; ; =>http://spamassassin.org/released/ :
## Header (preview): From jm@jmason.org  Tue Sep  3 14:38:29 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): "Craig R.Hughes" said:; ; > Seems like a good idea.  We might get one of two other issues
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep  4 16:52:50 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "zeek" said:; ; > This was thoroughly confusing, but by playing musical chairs with the spamd
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep  4 16:53:10 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thank you Lars for your reply to my query.; ; > SA doesnt do any of these. It is probably a function of whatever scanning
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Sep  4 16:53:14 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/lib/Mail/SpamAssassin; In directory usw-pr-cvs1:/tmp/cvs-serv17809/lib/Mail/SpamAssassin;
## Header (preview): From spamassassin-talk-owner@lists.sourceforge.net  Thu Sep  5 12:50:49 2002; Return-Path: <spamassassin-talk-owner@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --_===6628399====mx1.yipes.com===_; Content-Type: text/plain;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:39:32 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thursday 05 September 2002 04:10 CET Mike Burger wrote:; > Just loaded up SA 2.40 from Theo's RPMs...spamassassin-2.40-1 and; > perl-Mail-SpamAssassin-2.40-1 on a RH 7.1 system with perl 5.6.1 running
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:39:38 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm getting an error page from sourceforge.net when I try to go to; www.spamassassin.org. ;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:51:01 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Clark C . Evans" said:; ; > Hello.  I'm hosted on a FreeBSD box where I can't modify the
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:50:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Kerry Nice" said:; ; > What about some reality check rules.  Yeah, you can pack in lots of things
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:51:15 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jesus Climent said:; ; > d output: Bareword found where operator expected at (eval 11) line 95,
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 12:51:27 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): BTW, I've been thinking a little about the RPMs and other packages.; Already the PLD guys are distributing 3 rpms:;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep  5 13:39:28 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's possible...I performed the update via "rpm -U"...which, of course, ; created all the new rulesets as "xx_rulename.cf.rpmnew"  Crud.  I'll have ; to start moving things around.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep  6 15:29:38 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I finally found the SpamAssassin ninja's!  After months of searchng.. I; found the litte guys at a bowling alley in Valencia!  Here's a shot of my; beloved clan!
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep  6 15:29:56 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): sorry for the dupe.. thought the com address would bounce.. my bad.; ;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep  6 19:36:54 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --UHN/qo2QbUvPLonB; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep  6 19:37:06 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, Sep 06, 2002 at 06:22:52PM +0100, Matt Sergeant wrote:; > Can anyone out there who uses SA with lotus notes users help us figure ; > out what to tell customers to do when they've got emails coming in with
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Sep  6 19:36:59 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --sHrvAb52M6C8blB9; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Sep  6 19:36:57 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From felicity@kluge.net  2002-09-06 10:56 -------; Subject: Re: [SAdev]  spam_level_char option change/removal;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Sun Sep  8 23:57:37 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Saturday 07 September 2002 23:22 CET Daniel Quinlan wrote:; > Craig Hughes <craig@hughes-family.org> writes:; > > How about configuring SA to set precendence to "low" for spam
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Sun Sep  8 23:57:15 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I thought I'd installed razor correctly, but I am seeing the following in my ; logs.  Can anyone give me a hitn?;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep  9 10:50:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Despite my lack of confidence to upgrade to 2.41 using the tarball instead of ; cpan, it worked.  With the help of others, got razor working.  I did however ; notice something in my logs which happened twice but hasn't recurred.
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Sep  9 14:35:56 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Monday 09 September 2002 11:13 CET Matt Sergeant wrote:; > Malte S. Stretz wrote:; > >[...]
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Tue Sep 10 18:18:33 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From larry@5points.net  2002-09-10 08:45 -------; Dan,;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep 11 16:05:26 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "CW" == Carlo Wood <carlo@alinoe.com> writes:; ; CW> to manually decode the base64 part.
## Header (preview): From msquadrat.nospamplease@gmx.net  Wed Sep 11 19:41:22 2002; Return-Path: <msquadrat.nospamplease@gmx.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wednesday 11 September 2002 16:19 CET Justin Mason wrote:; > Malte S. Stretz said:; >[...]
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep 11 19:43:23 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is not directly SpamAssassin related, but more of a general; dealing-with-SPAM issue.;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep 11 21:52:21 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert Strickler said:; ; > Looks like we need an identity stamp in the X-Spam headers so that SA only
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep 11 21:52:27 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 11 Sep 2002, Stephane Lentz wrote:; ; > => I faced a similar problem with the FreeBSD when trying to
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 00:04:58 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I successfully installed spamassassin & razor to run system wide on my; Debian Woody server.  ;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 00:05:00 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, Sep 11, 2002 at 01:46:19PM -0700, David Raistrick wrote:; > On Wed, 11 Sep 2002, Stephane Lentz wrote:; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 00:05:24 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So far today, I've found eff.org and mandrakesoft.com in DCC.  My confidence ; in DCC is beginning to drop.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 00:05:26 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 11 Sep 2002, Vince Puzzella wrote:; ; > Ever since I set defang_mime 0 all spam that contains HTML has a badly
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 13:43:40 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 9/11/2002 at 10:01 AM  spamassassin-talk-request@lists.sourceforge.net; spamassassin-talk@lists.sourceforge.net wrote:;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 15:03:28 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >Anyway I'm making good progress and my implementation works reasonably; >well.  It now seems blindingly clear that we want a tightly-integrated; >implementation of Naive Bayes spam/nonspam classification.  There are
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 21:09:40 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Op 12-09-2002 00:35 schreef Ellen Clary (ellen@dgi.com):; ; >> Then there is a third possibility. Instead of returning a 550 code
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 12 21:09:59 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Heh. RTFM.. Sorry about that.; ; Yep, that did the trick.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 16:51:24 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0009_01C25B03.83C4FDB0
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 16:51:45 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --7ZAtKRhVyVSsbBD2; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 16:51:47 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > -----Original Message-----; > From: carlo@alinoe.com [mailto:carlo@alinoe.com]; > Sent: 13 September 2002 14:21
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 16:51:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 13 Sep 2002 the voices made carlo@alinoe.com write:; ; > What do spammers do with email addresses in
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 20:45:22 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This may be a little off topic but thought people here would have a better; response to this elsewhere.;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 20:45:28 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --Fnm8lRGFTVS/3GuM; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 20:45:30 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --Hlh2aiwFLCZwGcpw; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Sep 13 20:45:39 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 2002-09-13 at 14:33, vernon wrote:; > ; > But only some of the mail is actually being scanned which leads me to
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Sat Sep 14 20:05:30 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --Q68bSM7Ycu6FN28Q; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Sep 16 00:10:32 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have searched the list but did not find any info on this. ; ; How do I setup multiple spamd machines so that spamc load balances - or
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep 16 00:10:34 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Fri, 13 Sep 2002, Tony L. Svanstrom mused:; > On Fri, 13 Sep 2002 the voices made carlo@alinoe.com write:; >
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep 16 00:10:40 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm getting these messages and I'm not sure what they mean. Can anyone clear ; this up for me? Thanks.;
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Sep 16 00:10:43 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 15 Sep 2002 the voices made Marc Perkel write:; ; > Right now we have one spam status flag indicating that a message is or
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep 16 00:10:45 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 15 Sep 2002, Vernon Webb wrote:; ; > I'm getting these messages and I'm not sure what they mean. Can anyone clear
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Mon Sep 16 00:10:47 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tony L. Svanstrom wrote:; ; >On Sun, 15 Sep 2002 the voices made Marc Perkel write:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep 16 18:32:40 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Has anyone noticed a drop in razor-check performance over the past week?; I disabled the razorchecks in Spamassassin and my queues start to clean; out again.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Sep 17 17:35:04 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Can anybody point me to a project/FAQ similar to this:?; ; 1. Perl script fetches POP mail from a distant server
## Header (preview): From quinlan@pathname.com  Mon Sep 16 00:08:16 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; >>>   DATE_IN_PAST_48_96
## Header (preview): From quinlan@pathname.com  Mon Sep 16 10:41:51 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Justin Mason <jm@jmason.org> writes:; ; > hmm. also I think I've found some cases where it's hitting on fetchmail
## Header (preview): From schaefer@zanshin.com  Mon Sep 16 19:20:19 2002; Return-Path: <schaefer@zanshin.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, 16 Sep 2002, Justin Mason wrote:; ; > Simon Matthews said:
## Header (preview): From quinlan@pathname.com  Tue Sep 17 23:30:38 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > Folks who've been hacking on the DNSBLs: would it be worthwhile commenting
## Header (preview): From jm@jmason.org  Wed Sep 18 12:45:20 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): Gary Funck said:; > I thought the ">> /perllocal.pod" line looked odd. Is it normal to write; > documentation into the root directory? (<g>). Is there some Make parameter, o
## Header (preview): From jm@jmason.org  Wed Sep 18 12:57:54 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): Matt Kettler said:; > Ok, first, the important stuff. Happy birthday Justin (a lil late, but; > oh well)
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Sep 18 14:07:12 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0056_01C25F11.18554780
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 19 16:31:49 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>>>> "v" == vernon  <vernon@b2unow.com> writes:; ; v> Some of my "Security Violations" and "Unusual System Events" are being
## Header (preview): From mgm@starlingtech.com  Fri Sep 20 11:29:51 2002; Return-Path: <mgm@starlingtech.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Yes, I think some others, (mgm?) have spamtrap data in there too.; >;
## Header (preview): From dougy@brizzie.org  Fri Sep 20 11:38:29 2002; Return-Path: <dougy@brizzie.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > > Would someone please enlighten me on dependencies / pre-requisites; > > for installation in FreeBSD. The 'official' documentation isn't; > > explicit about this stuff .... eg 'procmail' is mentioned but without
## Header (preview): From jm@jmason.org  Fri Sep 20 13:03:34 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): "Michael Moncur" said:; ; > My corpus is about 50% spamtrap spam at any given time. Let me know if I
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Sun Sep 22 00:46:56 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Sun Sep 22 00:46:58 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Sun Sep 22 00:46:59 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From jm@jmason.org  2002-09-21 16:37 -------; I'd prefer to wait and see if spammers do anything about it.  my; guess is they will not, as it'd mean modifying their spamware to
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Sun Sep 22 00:47:02 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From jm@jmason.org  2002-09-21 16:39 -------; Dan, BTW, is there any code from this that we can get checked in?; I'd love to mess around with it a bit.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Sun Sep 22 00:47:04 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From easmith@beatrice.rutgers.edu  2002-09-21 16:41 -------; I like this idea, but from my reading - part of my dissertation research -; on GAs (or, in this case, more precisely "Evolutionary Programming", since
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep 23 15:13:20 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Mike Bostock" said:; ; > Received: from tracking2 (tracking2.roving.com [10.20.40.142])
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Sep 23 23:44:42 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): No I was just a little confused because I'm running procmail on a gateway; and sits between the external sendmail box and internal exchange bridgehead; server.  So there isn't any delivery to the local system.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Sep 24 23:33:11 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is just an semi-educated guess - if I'm wrong, someone please correct; me!;
## Header (preview): From quinlan@pathname.com  Thu Sep 26 10:59:48 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > except for 1 thing: defanged MIME messages.  that's a big problem.
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Thu Sep 26 11:10:38 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I just picked up Razor SDK 2.03 and  2.14 agents from the the razor site.; I am using SuSe 7.3 - intalled SDK with no problems. All tests passed.;
## Header (preview): From easmith@beatrice.rutgers.edu  Thu Sep 26 16:29:49 2002; Return-Path: <easmith@beatrice.rutgers.edu>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sep 25,  7:35pm, Daniel Quinlan wrote:; > Allen Smith <easmith@beatrice.rutgers.edu> writes:; >
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Thu Sep 26 20:43:38 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Unable to find user: <matt_relay@sbcglobal.net>; Please make sure the address is correct and resend your mail.;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Oct  1 11:01:27 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SpamTalk said:; > Probably better than the "spam phrases" approach would be the database; > approach as currently used for white/black listing.
## Header (preview): From felicity@kluge.net  Sun Sep 22 21:55:57 2002; Return-Path: <felicity@kluge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --qcHopEYAB45HaUaB; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From quinlan@pathname.com  Fri Sep 20 11:28:07 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org (Justin Mason) writes:; ; > Yes -- 50% of the entire set for training and 50% for evaluation.
## Header (preview): From quinlan@pathname.com  Wed Oct  2 11:43:09 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Justin Mason wrote:; ; >> Interestingly, some of these seem (apparently) to be encrypted versions of
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:39 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/lib/Mail; In directory usw-pr-cvs1:/tmp/cvs-serv4019/lib/Mail;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:40 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin; In directory usw-pr-cvs1:/tmp/cvs-serv4019;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:41 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/t; In directory usw-pr-cvs1:/tmp/cvs-serv4019/t;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:44 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin; In directory usw-pr-cvs1:/tmp/cvs-serv4429;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:45 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/rules; In directory usw-pr-cvs1:/tmp/cvs-serv4429/rules;
## Header (preview): From spamassassin-commits-admin@lists.sourceforge.net  Wed Oct  2 16:02:46 2002; Return-Path: <spamassassin-commits-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Update of /cvsroot/spamassassin/spamassassin/t; In directory usw-pr-cvs1:/tmp/cvs-serv4429/t;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Fri Oct  4 11:07:03 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Malte S. Stretz said:; > 1046 is fixed. But what about; > 1011 (add a notice about IRIX and -m to the docs),
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:38 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > eh? any reason why?  wasn't causing any trouble for me, and; > seems like a good idea.;
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:05 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): felicity@kluge.net changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:07 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): jm@jmason.org changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:08 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From spamassassin-contrib@msquadrat.de  2002-10-03 13:57 -------; > I've thought about this and PM_FILTER needs to die. I've now tried  ; > multiple ways to make it just transparently work on 5.00503 and failed.
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:09 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From spamassassin-contrib@msquadrat.de  2002-10-03 13:57 -------; A solution could be the preprocessor in combination with PM_FILTER -- if we ; get the ExtUtils::MakeMaker versioning stuff right (see bug 1046).
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:18 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): spamassassin-contrib@msquadrat.de changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:21 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): spamassassin-contrib@msquadrat.de changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:23 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): spamassassin-contrib@msquadrat.de changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:33 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):         OS/Version: other;             Status: NEW;           Severity: normal
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:07:59 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From rOD-spamassassin@arsecandle.org  2002-10-03 18:51 -------; Ignoring the conspiracy theories, can you supply examples of spam which was ; scored with RCVD_IN_BONDEDSENDER?  The only mail I have received which scored
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:08:09 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):         OS/Version: other;             Status: NEW;           Severity: enhancement
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:08:10 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From mgm@starlingtech.com  2002-10-03 21:46 -------; Looks great! One note: most "image-only" spam actually has some text (a few ; words at the top, a disclaimer at the end) so keep that in mind. The typical
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Oct  4 11:08:14 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):         OS/Version: other;             Status: NEW;           Severity: enhancement
## Header (preview): From craig@hughes-family.org  Sat Oct  5 12:38:05 2002; Return-Path: <craig@hughes-family.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Daniel Quinlan wrote:; ; DQ> jm@jmason.org (Justin Mason) writes:
## Header (preview): From jm@jmason.org  Sat Oct  5 18:17:58 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): Randy Bush said:; ; > >> freebsd -stable
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Oct  7 13:15:13 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In emacs rmail what varieties of different techniques are there for; sorting your favorite correspondents from the mix?... leaving the hundreds; of spam commercials. A filter for the campus computer system puts subject
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Oct  7 20:37:15 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Kenneth Nerhood said:; ; > I too am seeing very weird things with 2.42 and AWL.  I  installed a
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 16:06:55 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I don't know how make of you are in the Bay Area but EFF is having a benifit ; party ast the DNA Lounge in San Francisco tonight. Wil Weaton (Wesley Crussher ; from star Trek TNG) will fight Barney the Dinasour.
## Header (preview): From craig@deersoft.com  Fri Aug 23 11:03:54 2002; Return-Path: <craig@deersoft.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thursday, August 22, 2002, at 10:24  AM, Justin Mason wrote:; ; > I plan to
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Tue Oct  8 12:28:03 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): spamassassin-contrib@msquadrat.de changed:; ;            What    |Removed                     |Added
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 11:31:04 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): "Steve Thomas" said:; ; > I created a user (honeypot) and set up an alias to it. Then I added a
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Aug 28 11:31:20 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Bob Sully said:; ; > Spamassassin (2.30) has been tossing my daily LogWatch (3.3) reports into
## Header (preview): From spamassassin-devel-admin@lists.sourceforge.net  Fri Sep  6 11:49:32 2002; Return-Path: <spamassassin-devel-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ------- Additional Comments From alan@rdrop.com  2002-09-05 22:22 -------; I haven't tried 2.41 yet because it requires File::Spec, which barfs when; spamassassin tries to use it.  I haven't filed a bug yet because I suspect it's
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Tue Oct  8 17:02:46 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a MIME-encapsulated message; ; --==_15304473447567@buffy.jpci.net==_
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-devel-admin@lists.sourceforge.net  Thu Aug 22 15:46:30 2002
## Return-Path: <spamassassin-devel-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.n...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01543.044ee0da6eaa44adbadc131be0bcb2d2 - missing value where TRUE/FALSE needed
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Wed Oct  9 18:31:42 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Craig Hughes said:; ; > >   - All headers are reproduced in full.  Some address obfuscation has
## Header (preview): From quinlan@pathname.com  Thu Oct 10 12:29:12 2002; Return-Path: <quinlan@pathname.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > (Please feel free to forward this message to other possibly-interested; > parties.);
## Header (preview): From jm@jmason.org  Thu Oct 10 13:14:29 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview): (trimmed cc list); ; Daniel Quinlan said:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:16:57 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ----- Original Message -----; From: <razor-users-request@example.sourceforge.net>; To: <razor-users@example.sourceforge.net>
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:18:35 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Aug 23 Bort, Paul wrote:; ; >If your sendmail has been compiled with Milter support, you can add SMRazor
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:19:27 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01549.a465f982502ac6d7c10118f1939f6974 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:19:50 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01550.a036d340bdcf122c8eca891557d50b51 - missing value where TRUE/FALSE needed
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:21:49 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): I'm not sure if this is really a razor problem/issue or a sendmail; problem. Here's the scenario... My mail server is a 150mhz PC funning
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 15:21:59 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): See your /etc/sendmail.cf file, there are a number of methods for limiting; the number of concurrent sendmail processes, either by load average (I'm; sure), or concurrency (I think)... I use sendmail anymore (I use qmail) but
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Aug 26 21:06:36 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Aug 25 Joe Berry wrote:; ; >Very good advice given above.
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Mon Aug 26 21:27:07 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01554.0aed12846b3981a2a13adf793083e4f0 - missing value where TRUE/FALSE needed
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep  2 12:20:30 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): The following was personal correspondence between two people.  I can't; fathom how Razor thinks it is spam:;
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Tue Sep  3 14:20:48 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (unknown [127.0.0.1])
##  by jmason.org (Postfix) ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01556.126fd032d9f624e282a711df96f64cc6 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Tue Sep  3 18:03:02 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix)...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01557.25496d0c7fc8acbf284debadd4f1dc07 - missing value where TRUE/FALSE needed
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep  3 22:32:44 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --aT9PWwzfKXlsBJM1; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Wed Sep  4 11:36:55 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Oh, I was serious. I'm awful with perl/etc. I just think the HTML graph that; was created was pretty neat and I wish I could do something like that. :-);
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep  5 11:26:08 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; Newbie (to the list) question;  I've been working on porting the code to
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:34:24 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; --------------050101050502080302080407; Content-Type: text/plain; charset=us-ascii; format=flowed
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:34:10 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 05, 2002 at 10:12:59PM -0400, Leland Woodbury wrote:; > I found a nice little Perl script for this purpose called rotate, which ; > makes the process of rotating log files very simple.  If there's an
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:35:10 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 05, 2002 at 08:53:16PM -0400, Theo Van Dinter wrote:; > On Thu, Sep 05, 2002 at 06:16:57PM -0500, Mike Burger wrote:; > > You might be better asking this on the spamassassin-talk list.  The folks
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:35:12 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): And you were exactly the person I figured would do so. <G>; ; On Thu, 5 Sep 2002, Theo Van Dinter wrote:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:35:14 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --iJXiJc/TAIT2rh2r; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:35:17 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Shouldn't there be a w, somewhere in tehre?  Simply setting group and ; owner to read and execute won't alleviate a write problem.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:35:27 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --Enx9fNJ0XV5HaWRu; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:36:39 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Theo,; ; Thank you very much, it solves the problem!!!!
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:36:23 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is due to insufficient write privileges to the "razor-agent.log" ; file. A quick work-around is to do a "chmod go+rx" on that file (of ; course, it's better to restrict the access as much as possible).
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:37:01 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0018_01C254F9.146CF4F0
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:37:55 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --4Ycl1UgPPPgGZoSL; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:38:00 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Forgive me for being a partially stupid end-user of this fantastic; spam fighting software.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:38:03 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You might be better asking this on the spamassassin-talk list.  The folks ; there will almost definitely have an answer for this.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:38:50 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thu, Sep 05, 2002 at 06:16:57PM -0500, Mike Burger wrote:; > You might be better asking this on the spamassassin-talk list.  The folks ; > there will almost definitely have an answer for this.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:39:27 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is my first time running Razor, heard a lot of good things about it so; I thought I'd give it a shot.  I also run SpamAssassin so I'd like to; integrate the two.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep  6 11:39:55 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): No as a answer to this FAQ, would the recommended answer be to ; ; a) chmod 755 /usr/bin/procmail
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:22:49 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I just set up razor and spamassassin, but I keep getting this error in my ; mail log file;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:22:53 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, Sep 09, 2002 at 05:10:23PM -0400, Rob wrote:; > I just set up razor and spamassassin, but I keep getting this error in my ; > mail log file
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:22:59 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Or, you could do this. <G>; ; On Mon, 9 Sep 2002, David Rees wrote:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:23:01 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's a permissions issue on the razor log file.  SpamAssassin runs setuid ; to the user to whom mail is being delivered.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:23:06 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hey Folks; ; I know this question gets asked a lot, but I haven't seen an answer lately.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 10 11:23:26 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Does anyone else experience this:; ; http://sf.net/tracker/index.php?func=detail&aid=600311&group_id=3978&atid=10
## Header (preview): From razor-users-admin@lists.sourceforge.net  Wed Sep 11 13:41:28 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have a spamd/spamc/razor/dcc setup.; ; My razor logs are full of:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 12 18:44:30 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, 10 Sep 2002, Rose, Bobby wrote:; ; > Use the sample-spam.txt from Spamassassin and do a "razor-check -d <
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep 13 13:35:15 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): To continue the subject on an otherwise unrelated note, the following; personal correspondence was just flagged as spam:;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Fri Sep 13 16:50:05 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm taking all my razored mail today and calling any 1-800 numbers I can; find.  I say "Hi, I'm calling everyone that spammed me today to raise their; cost of doing business.  You have a great day!"  I'm told I should do it
## Header (preview): From razor-users-admin@lists.sourceforge.net  Sat Sep 14 16:22:01 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Haven't heard anything about this, so excuse the repost but:; ;  http://sf.net/tracker/index.php?func=detail&aid=600311&
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep 16 15:30:51 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; Is it possible to use razor without filtering empty mails as spamm?
## Header (preview): From razor-users-admin@lists.sourceforge.net  Tue Sep 17 11:26:28 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Razor won't filter empty emails. What version of the agents are you using?; ; cheers,
## Header (preview): From jm@jmason.org  Wed Sep 18 12:36:24 2002; Return-Path: <yyyy@spamassassin.taint.org>; Delivered-To: yyyy@spamassassin.taint.org
## Body (preview):
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 19 13:01:03 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --huq684BweRXVnRxX; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 19 13:01:16 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I suggest that you use a normal user to start. Once you are familiar; > enough with razor and understand how it works, try the complex things; > like integration with the MTA and the like.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 19 17:47:31 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Using -lm 4 is yielding an extra 20% a day, but it gets false positives; where it shouldn't.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 19 17:47:42 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Depends on how you want to use it.; ; The default setup of running it from procmail works just fine, as long as
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Sep 19 17:49:35 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Here is my recipe for Maildrop:; ; # Vipul's Razor check
## Header (preview): From razor-users-admin@lists.sourceforge.net  Sat Sep 21 10:41:08 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeff--; ; What is the maildrop recipe you use with spamassassin?  I was trying to
## Header (preview): From razor-users-admin@lists.sourceforge.net  Sun Sep 22 14:34:12 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I received a spam email that had apparently forged the From header with; my own email address. After reviewing the message I forwarded it with; the rest of a batch of spam ti the database with razor-report. Now of,
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep 23 22:46:09 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Vipul Ved Prakash said:; ; > Are there any suggestions for "fixing" this in razor-agents? razor-agents
## Header (preview): From razor-users-admin@lists.sourceforge.net  Wed Sep 25 21:24:59 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm getting "no servers available" about half the time in the last few days.; This is with Razor 2. Is there something I need adjust in the installation; here, or are the servers just down/overloaded?
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep 30 19:57:11 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I just installed razor 2.152 on a FreeBSD 4.4-RELEASE box and having; problems with razor-check.  Any time razor-check is run, (with or without; arguments), i get this error:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep 30 21:44:28 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Date: Mon, 30 Sep 2002 14:00:12 -0400 (EDT); > From: Dayv Gastonguay <noghri@nauticom.net>; >
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 12:22:15 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I noticed a drop in checks, and did some tests.  If I move truth up in; my catalog list, a check comes back postive, but if I move fire up in; the list, then I don't get the positive check back.  It's almost like
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 12:23:27 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): What does this mean?  I set up procmailrc for a spamtrap but I'm getting; an error.  I also am reporting to pyzor and dcc and they aren't; registering an error.  What's weird is that it works sometimes.
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 12:23:28 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I recently brought up a new system - SuSe 7.3 and I am running; spamassassin and procmail, which work fine.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 12:23:43 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --CE+1k2dSO48ffgeK; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 12:25:24 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you examine the log further, you'll see debug messages generated by the; (content) reporting process that follows error 230.;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 19:28:23 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'm still seeing razor reporting bomb out with a small variety of messages.; Would reinitializing something here help, or does razor do that as needed; anyway, and this just reflects trouble at the servers?
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 19:28:37 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): trying to report spam [razor chooses hubris] I timeout on the connection; (which seems to have gotten slower all morning) and receive the following; error message:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 19:28:43 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --ey/N+yb7u/X9mFhi; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct  3 20:03:16 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --5vNYLRcllDrimb99; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep  2 12:20:32 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is happening due to insufficient write access to the; "razor-agent.log" file. I was getting the same error, but; only as a non-root user.  As a quick workaround, you can do
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep  2 12:22:44 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): -----BEGIN PGP SIGNED MESSAGE-----; Hash: SHA1;
## Header (preview): From razor-users-admin@lists.sourceforge.net  Mon Sep  2 12:22:47 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On Thu, Aug 29, 2002 at 07:33:44PM -0400, cmeclax po'u le cmevi'u ke'umri wrote:; > ; > Was it sent in HTML? If so, and it had a background, the background may have
## Header (preview): From razor-users-admin@lists.sourceforge.net  Wed Oct  9 15:09:25 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've been testing Razor, invoked from sendmail/procmail and so far it; seems pretty copacetic. Last night's spam to the list provided a good test; - the spam itself as well as several of the responses were flagged, as
## Warning in strsplit(email_text, "\n"): unable to translate 'From razor-users-admin@lists.sourceforge.net  Wed Oct  9 18:17:46 2002
## Return-Path: <razor-users-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix)...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01615.63a41aa663eeaf93728e7b1ab572ce91 - missing value where TRUE/FALSE needed
## Header (preview): From razor-users-admin@lists.sourceforge.net  Wed Oct  9 18:17:52 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Wed, 9 Oct 2002, Brian Fahrlander wrote:; ; > On Wed, 9 Oct 2002 09:15:03 -0400 (EDT), Samuel Checker <sc@pffcu.org> wrote:
## Header (preview): From razor-users-admin@lists.sourceforge.net  Thu Oct 10 12:29:00 2002; Return-Path: <razor-users-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I am somewhat puzzled by a phone call I (or rather the CIO at the ISP for; whom I work) received from an individual claiming to represent Cloudmark.; The gist of the call was that since we were using razor and checking our
## Header (preview): From bmord@icon-nicholson.com  Wed Sep  4 19:11:17 2002; Return-Path: <bmord@icon-nicholson.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; I was inspired by a mode of operation supported by VMWare. You can have a
## Header (preview): From strange@nsk.yi.org  Thu Sep  5 11:26:30 2002; Return-Path: <strange@nsk.yi.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Tue, Sep 03, 2002 at 09:03:40PM -0400, Yannick Gingras wrote:; > This make me wonder about the relative protection of smart cards.  They have ; > an internal procession unit around 4MHz.  Can we consider them as trusted
## Header (preview): From GlennEverhart@firstusa.com  Thu Sep  5 11:26:32 2002; Return-Path: <GlennEverhart@firstusa.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I did something crudely along those lines for VMS VAX maybe 13 years; ago; there is at least one product that does it for PC though I don't; recall its name. It is also handy for cases where you have a CD image
## Header (preview): From secprog-return-492-jm=jmason.org@securityfocus.com  Fri Sep  6 11:36:01 2002; Return-Path: <secprog-return-492-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Scott MacKenzie wrote:; ; >There is a software package that is used (or was up through w2k)
## Header (preview): From secprog-return-482-jm=jmason.org@securityfocus.com  Fri Sep  6 11:36:07 2002; Return-Path: <secprog-return-482-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): the only way to insure a safe key is to use all the storage space in the; universe. too big to decrypt.;
## Header (preview): From secprog-return-490-jm=jmason.org@securityfocus.com  Fri Sep  6 11:37:35 2002; Return-Path: <secprog-return-490-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --2+N3zU4ZlskbnZaJ; Content-Type: text/plain; charset=us-ascii; Content-Disposition: inline
## Header (preview): From secprog-return-493-jm=jmason.org@securityfocus.com  Fri Sep  6 11:37:38 2002; Return-Path: <secprog-return-493-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): There is a software package that is used (or was up through w2k) ; on MicroSloth for this purpose. Ghost, or some such. One essentially ; "takes a picture" of the machine's proper config, and then upon
## Header (preview): From secprog-return-487-jm=jmason.org@securityfocus.com  Fri Sep  6 11:38:01 2002; Return-Path: <secprog-return-487-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > However, cracking and reverse engineering tools are not so ubiquitous on; > UNIX as they are on Windows platform for two main reasons:; >
## Header (preview): From secprog-return-485-jm=jmason.org@securityfocus.com  Fri Sep  6 11:38:51 2002; Return-Path: <secprog-return-485-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ben Mord wrote:; ; >     -----Original Message-----
## Header (preview): From secprog-return-486-jm=jmason.org@securityfocus.com  Fri Sep  6 11:38:55 2002; Return-Path: <secprog-return-486-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): -----Original Message-----; From: Crispin Cowan [mailto:crispin@wirex.com]; Sent: Wednesday, September 04, 2002 7:30 PM
## Header (preview): From secprog-return-489-jm=jmason.org@securityfocus.com  Fri Sep  6 15:25:00 2002; Return-Path: <secprog-return-489-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ; On Wed, 4 Sep 2002, Yannick Gingras wrote:;
## Header (preview): From secprog-return-491-jm=jmason.org@securityfocus.com  Fri Sep  6 15:25:04 2002; Return-Path: <secprog-return-491-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Ben Mord said:; > ; > >Ah. In that case, you can use something considerably less powerful than
## Header (preview): From secprog-return-507-jm=jmason.org@securityfocus.com  Wed Sep 18 11:50:54 2002; Return-Path: <secprog-return-507-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On 5 Sep 2002, Richard Bartlett wrote:; ; Richard,
## Header (preview): From secprog-return-508-jm=jmason.org@securityfocus.com  Fri Sep 20 11:28:44 2002; Return-Path: <secprog-return-508-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bryan Feir [mailto:bryan@sgl.crestech.ca] wrote: ; ; >Of course, once one player key was broken, dealing with the rest became
## Header (preview): From secprog-return-509-jm=jmason.org@securityfocus.com  Fri Sep 20 11:29:20 2002; Return-Path: <secprog-return-509-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Thursday 19 September 2002 16:44, Michael McKay wrote:; > On Tue, Sep 03, 2002 at 09:03:40PM -0400, Yannick Gingras wrote:; > > This make me wonder about the relative protection of smart cards.
## Header (preview): From secprog-return-510-jm=jmason.org@securityfocus.com  Mon Sep 23 18:31:18 2002; Return-Path: <secprog-return-510-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): reply to the mail from Ben Mord (bmord@icon-nicholson.com):; ; > Hi,
## Header (preview): From neugens@libero.it  Fri Aug 23 11:04:42 2002; Return-Path: <neugens@libero.it>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi everybody!; ; I'm writing a web application in java (tomcat + jsp/servlets + database
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Fri Sep  6 14:44:17 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 05 September 2002, Tim Peters said:; > Greg Ward is; > currently capturing a stream coming into python.org, and I hope we can get a
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 14:54:14 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > I believe the SpamAssassin maintainers have a scheme whereby the corpus; > of non-spam is distributed, ie. several people have bodies of non-spam; > that they use for collectively evolving the SA score set.  If that
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Fri Sep  6 14:57:18 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 06 September 2002, Anthony Baxter said:; > A snippet, hopefully not enough to trigger the spam-filters.;
## Header (preview): Return-Path: barry@python.org; Delivery-Date: Fri Sep  6 15:23:19 2002; From: barry@python.org (Barry A. Warsaw)
## Body (preview): >>>>> "TP" == Tim Peters <tim.one@comcast.net> writes:; ;     >> Any thought to wrapping up your spam and ham test sets for
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 15:24:37 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > Check it into the spambayes project.  SF's disks are cheap <wink>.; ; Perhaps more useful would be if Tim could check in the pickle(s?)
## Header (preview): Return-Path: barry@python.org; Delivery-Date: Fri Sep  6 15:28:12 2002; From: barry@python.org (Barry A. Warsaw)
## Body (preview): >>>>> "GW" == Greg Ward <gward@python.net> writes:; ;     GW> If you (and Guido, Barry, et. al.) prefer, I could change that
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 15:31:22 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): Quite independently from testing and tuning the algorithm, I'd like to; think about deployment.;
## Header (preview): Return-Path: barry@python.org; Delivery-Date: Fri Sep  6 15:38:56 2002; From: barry@python.org (Barry A. Warsaw)
## Body (preview): >>>>> "GvR" == Guido van Rossum <guido@python.org> writes:; ;     GvR> Perhaps more useful would be if Tim could check in the
## Header (preview): Return-Path: bkc@murkworks.com; Delivery-Date: Fri Sep  6 15:39:48 2002; From: bkc@murkworks.com (Brad Clements)
## Body (preview): On 6 Sep 2002 at 10:31, Guido van Rossum wrote:; ; >   your mail, and gives you only the non-spam.  To train it, you'd only need
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 15:45:27 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > OTOH, my Data/ subtree currently has more than 35,000 files slobbering; > over 134 million bytes -- even if I had a place to put that much stuff,
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 15:43:33 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > >   your mail, and gives you only the non-spam.  To train it, you'd only need; > >   to send it the false negatives somehow; it can assume that anything is; > >   ham that you don't say is spam within 48 hours.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 15:59:38 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Anthony Baxter]; > I've got a test set here that's the last 3 and a bit years email to; > info@ekit.com and info@ekno.com - it's a really ugly set of 20,000+
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 16:01:51 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Guido> Takers?  How is ESR's bogofilter packaged?  SpamAssassin?  The;     Guido> Perl Bayes filter advertised on slashdot?;
## Header (preview): Return-Path: bkc@murkworks.com; Delivery-Date: Fri Sep  6 16:02:11 2002; From: bkc@murkworks.com (Brad Clements)
## Body (preview): Did you want this on the list? I'm replying to the list..; ; On 6 Sep 2002 at 10:43, Guido van Rossum wrote:
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 16:05:22 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > > What's an auto-ham?; > ; > Automatically marking something as ham after a given
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 16:06:26 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > Dunno about the other tools, but SpamAssassin is a breeze to incorporate; > into a procmail environment.  Lots of people use it in many other ways.  For; > performance reasons, many people run a spamd process and then invoke a small
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 16:12:58 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> Ultimately I'd like to see tight integration into the "most popular;     >> email clients"..;
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 16:19:30 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> Dunno about the other tools, but SpamAssassin is a breeze ...;     >> SpamAssassin also adds other headers as well, which give you more;     >> detail ...
## Header (preview): Return-Path: nas@python.ca; Delivery-Date: Fri Sep  6 16:57:05 2002; From: nas@python.ca (Neil Schemenauer)
## Body (preview): Guido van Rossum wrote:; > I personally don't think IMAP has a bright future, but for people who; > do use it, that's certainly a good approach.
## Header (preview): Return-Path: barry@python.org; Delivery-Date: Fri Sep  6 17:23:33 2002; From: barry@python.org (Barry A. Warsaw)
## Body (preview): >>>>> "NS" == Neil Schemenauer <nas@python.ca> writes:; ;     NS> Writing an IMAP server is a non-trivial task.
## Header (preview): Return-Path: paul-bayes@svensson.org; Delivery-Date: Fri Sep  6 17:27:57 2002; From: paul-bayes@svensson.org (Paul Svensson)
## Body (preview): On Fri, 6 Sep 2002, Guido van Rossum wrote:; ; >Quite independently from testing and tuning the algorithm, I'd like to
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 17:27:01 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > I guess MUA-level filtering is just a fallback for people who don't have; > 1) a burning, all-consuming hatred of junk mail, 2) root access to all; > mail servers they rely on, and 3) the ability and inclination to install
## Header (preview): Return-Path: jeremy@alum.mit.edu; Delivery-Date: Fri Sep  6 17:28:09 2002; From: jeremy@alum.mit.edu (Jeremy Hylton)
## Body (preview): I think one step towards deployment is creating a re-usable tokenizer; for mail messages.  The current codebase doesn't expose an easy-to-use; or easy-to-customize tokenizer.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 17:45:09 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Barry A. Warsaw, gives answers and asks questions]; ; Here's the code that produced the header tokens:
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 17:55:07 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Anthony Baxter]; > The other thing on my todo list (probably tonight's tram ride home) is; > to add all headers from non-text parts of multipart messages. If nothing
## Header (preview): Return-Path: barry@python.org; Delivery-Date: Fri Sep  6 17:59:49 2002; From: barry@python.org (Barry A. Warsaw)
## Body (preview):     TP> A false positive *really* has to work hard then, eh?  The long;     TP> quote of a Nigerian scam letter is one of the two that made;     TP> it, and spamprob() looked at all this stuff before deciding it
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Fri Sep  6 18:13:17 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Guido van Rossum <guido@python.org> is all like:; ; > > Basic procmail usage goes something like this:
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 18:35:55 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Jeremy Hylton]; > I think one step towards deployment is creating a re-usable tokenizer; > for mail messages.  The current codebase doesn't expose an easy-to-use
## Header (preview): Return-Path: whisper@oz.net; Delivery-Date: Fri Sep  6 18:53:24 2002; From: whisper@oz.net (David LeBlanc)
## Body (preview): I think that when considering deployment, a solution that supports all; Python platforms and not just the L|Unix crowd is desirable.;
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 18:58:14 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > I wonder if the focus of spambayes ought not to be a classifier that; > leaves the fetching and feeding of messages to auxillary code? That; > way, it could be dropped into whatever harness that suited the
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Fri Sep  6 19:02:23 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 06 September 2002, Tim Peters said:; > > Note that header names are case insensitive, so this one's no; > > different than "MIME-Version:".  Similarly other headers in your list.
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 19:48:35 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Greg> In case it wasn't obvious, I'm a strong proponent of filtering;     Greg> junk mail as early as possible, ie. right after the SMTP DATA;     Greg> command has been completed.  Filtering spam at the MUA just seems
## Header (preview): Return-Path: harri.pasanen@bigfoot.com; Delivery-Date: Fri Sep  6 20:07:28 2002; From: harri.pasanen@bigfoot.com (Harri Pasanen)
## Body (preview): On Friday 06 September 2002 20:48, Skip Montanaro wrote:; >     Greg> In case it wasn't obvious, I'm a strong proponent of; > filtering Greg> junk mail as early as possible, ie. right after the
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 20:24:15 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; > ...; > - A program that acts both as a pop client and a pop server.  You
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Fri Sep  6 20:24:38 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > > - A program that acts both as a pop client and a pop server.  You; > >   configure it by telling it about your real pop servers.  You then; > >   point your mail reader to the pop server at localhost.  When it
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 20:21:22 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; >   ...; >   I don't know how big that pickle would be, maybe loading it each time
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 20:43:56 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; > Takers?  How is ESR's bogofilter packaged?  SpamAssassin?  The Perl; > Bayes filter advertised on slashdot?
## Header (preview): Return-Path: whisper@oz.net; Delivery-Date: Fri Sep  6 20:53:36 2002; From: whisper@oz.net (David LeBlanc)
## Body (preview): You missed the part that said that spam is kept in the "eThunk" and was; viewable by a simple viewer for final disposition?;
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Fri Sep  6 20:58:33 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Tim Peters <tim.one@comcast.net> is all like:; ; > [Guido]
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Fri Sep  6 22:32:21 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > My tests train on about 7,000 msgs, and a binary pickle of the database is; > approaching 10 million bytes.
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Fri Sep  6 22:44:33 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Tim Peters <tim.one@comcast.net> is all like:; ; > [Tim]
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Fri Sep  6 23:39:48 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> > ##Remove: jeremy@alum.mit.edu##; ;     Tim> Yuck: it got two 0.01's from embedding your email address at the
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 00:03:58 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): >     >> > ##Remove: jeremy@alum.mit.edu##; >; >     Tim> Yuck: it got two 0.01's from embedding your email address at the
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 00:21:15 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview):     This is the binary pickle of my classifier after training on;     my first spam/ham corpora pair.  All records with;     spamprob == UNKNOWN_SPAMPROB have been purged.
## Header (preview): Return-Path: jeremy@alum.mit.edu; Delivery-Date: Sat Sep  7 01:00:14 2002; From: jeremy@alum.mit.edu (Jeremy Hylton)
## Body (preview): >>>>> "TP" == Tim Peters <tim.one@comcast.net> writes:; ;   >> The false positive rate is 0-3%.  (Finally!  I had to scrub a
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 01:06:56 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Neale Pickett]; > I hacked up something to turn WordInfo into a tuple before pickling,;
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 01:18:18 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Barry]; > Here's an interesting thing to test: discriminate words differently if; > they are on a line that starts with `>' or, to catch styles like
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 01:32:26 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Jeremy Hylton[; > The total collections are 1100 messages.  I trained with 1100/5; > messages.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 03:51:24 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Jeremy]; > The total collections are 1100 messages.  I trained with 1100/5; > messages.
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Sat Sep  7 04:38:51 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): > > Note that header names are case insensitive, so this one's no; > > different than "MIME-Version:".  Similarly other headers in your list.; >
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Sat Sep  7 04:44:50 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): > Looks like your ham corpus by and large has To: jeremy@alum.mit.edu in; > a header while your spam corpus by and large doesn't.  But this one; > does.
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Sat Sep  7 04:50:37 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): >>> Jeremy Hylton wrote; > Then I tried a dirt simple tokenizer for the headers that tokenize the; > words in the header and emitted like this "%s: %s" % (hdr, word).
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Sat Sep  7 04:52:54 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): > course, it instantly picked up on 'received:2001' as a non-ham. ;                                                             -spam.;
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sat Sep  7 04:51:12 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): There seem to be two "drivers" for the classifier now: Neale Pickett's; hammie.py, and the original GBayes.py.  According to the README.txt,; GBayes.py hasn't been kept up to date.  Is there anything in there
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 05:05:45 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): I actually like Neale's X-Spam-Disposition header, I just wonder if maybe we; should choose something with a different prefix than "X-Spam-" so that; people don't confuse it with SpamAssassin, all of whose headers begin with
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Sat Sep  7 05:10:37 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): >>> Skip Montanaro wrote; > ; > I actually like Neale's X-Spam-Disposition header, I just wonder if maybe we
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 05:30:31 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Guido> Therefore I propose to nuke GBayes.py, after adding a -u feature.; ;     Guido> Anyone against?  (I imagine that Skip or Barry might have a stake
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 05:46:01 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): If the frequency of my laptop's disk chirps are any indication, I'd say; hammie is about 3-5x faster than SpamAssassin.
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 06:15:54 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): I'm listed as a developer on SF and have the spambayes CVS module checked; out using my SF username, but I'm unable to write to the repository.  CVS; complains:
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Sat Sep  7 06:17:28 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Tim Peters <tim.one@comcast.net> is all like:; ; > I'm not sure what you're doing, but suspect you're storing individual
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sat Sep  7 06:33:23 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > Yeah, that's exactly what I was doing--I didn't realize I was; > incurring administrative pickle bloat this way.  I'm specifically; > trying to make things faster and smaller, so I'm storing individual
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 06:36:41 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip Montanaro]; > I'm listed as a developer on SF and have the spambayes CVS module checked; > out using my SF username, but I'm unable to write to the repository.  CVS
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 06:40:18 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Tim> About half the developers on the spambayes project were missing;     Tim> some permission or other, so I ran thru all of them and checked;     Tim> every damned box and clicked on every damn dropdown list I could
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 06:40:45 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip Montanaro, to Anthony Baxter]; > ...; > Accordingly, I wrote unheader.py, which is mostly a ripoff of something
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 06:43:31 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> ... choose something with a different prefix than "X-Spam-" so that;     >> people don't confuse it with SpamAssassin ...;
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 06:45:23 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Skip> I'll try a checkout into a new directory...; ; Which didn't help.  At the very least I think that means it's time for
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sat Sep  7 06:46:41 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> Accordingly, I wrote unheader.py, which is mostly a ripoff of;     >> something someone else posted to python-dev or c.l.py within the last;     >> week or so to strip out SA-generated headers.
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Sat Sep  7 06:48:17 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Guido van Rossum <guido@python.org> is all like:; ; > Maybe.  I batch messages using fetchmail (don't ask why), and adding
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sat Sep  7 07:06:31 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > > Maybe.  I batch messages using fetchmail (don't ask why), and adding; > > .4 seconds per message for a batch of 50 (not untypical) feels like a; > > real wait to me...
## Header (preview): Return-Path: jeremy@alum.mit.edu; Delivery-Date: Sat Sep  7 18:18:17 2002; From: jeremy@alum.mit.edu (Jeremy Hylton)
## Body (preview): >>>>> "TP" == Tim Peters <tim.one@comcast.net> writes:; ;   TP> [Jeremy Hylton[
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 20:45:18 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): >   TP> I'm reading this now as that you trained on about 220 spam and; >   TP> about 220 ham.  That's less than 10% of the sizes of the; >   TP> training sets I've been using.  Please try an experiment: train
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sat Sep  7 21:11:36 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; > Perhaps more useful would be if Tim could check in the pickle(s?); > generated by one of his training runs, so that others can see how
## Header (preview): Return-Path: jeremy@alum.mit.edu; Delivery-Date: Sat Sep  7 21:15:03 2002; From: jeremy@alum.mit.edu (Jeremy Hylton)
## Body (preview): Here's clarification of why I did:; ; First test results using tokenizer.Tokenizer.tokenize_headers()
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sat Sep  7 21:19:16 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > [Guido]; > > Perhaps more useful would be if Tim could check in the pickle(s?); > > generated by one of his training runs, so that others can see how
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sun Sep  8 00:11:19 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): Before we get too far down this road, what do people think of creating a; spambayes package containing classifier and tokenizer?  This is just to; minimize clutter in site-packages.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 00:22:18 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Jeremy Hylton]; > Here's clarification of why I did:;
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sun Sep  8 03:47:23 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > Before we get too far down this road, what do people think of creating a; > spambayes package containing classifier and tokenizer?  This is just to; > minimize clutter in site-packages.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 03:55:12 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido, on the classifier pickle on SF]; > I downloaded and played with it a bit, but had no time to do anything; > systematic.
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sun Sep  8 04:38:47 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > > But it also identified as spam everything in my inbox that had any; > > MIME structure or HTML parts, and several messages in my saved 'zope; > > geeks' list that happened to be using MIME and/or HTML.
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Sun Sep  8 06:38:45 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > > I also looked in more detail at some f-p's in my geeks traffic.  The; > > first one's a doozie (that's the term, right? :-).  It has lots of; > > HTML clues that are apparently ignored.
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 08:18:49 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; > I *meant* to say that they were 0.99 clues cancelled out by 0.01; > clues.  But that's wrong too!  It looks I haven't grokked this part of
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 08:48:28 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > ...; > I'd prefer to strip HTML tags from everything, but last time I
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Sun Sep  8 12:03:04 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> Before we get too far down this road, what do people think of;     >> creating a spambayes package containing classifier and tokenizer?;     >> This is just to minimize clutter in site-packages.
## Header (preview): Return-Path: nas@python.ca; Delivery-Date: Sun Sep  8 18:21:13 2002; From: nas@python.ca (Neil Schemenauer)
## Body (preview): These results are from timtest.py.  I've got three sets of spam and ham; with about 500 messages in each set.  Here's what happens when I enable; my latest "received" header code:
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 19:28:02 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Neil Schemenauer]; > These results are from timtest.py.  I've got three sets of spam and ham; > with about 500 messages in each set.  Here's what happens when I enable
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 20:48:13 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): Neil trained a classifier using 3 sets with about 500 ham and spam in each.; We're missing half his test run results due to a cmp.py bug (since fixed);; the "before custom fiddling" figures on the 3 reported runs were:
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 21:01:00 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > One effect of getting rid of MINCOUNT is that it latches on more; > strongly to rare clues now, and those can be unique to the corpus
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 21:13:40 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Greg Ward]; > Case of headers is definitely helpful.  SpamAssassin has a rule for it; > -- if you have headers like "DATE" or "SUBJECT", you get a few more
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 21:36:15 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Neale Pickett]; > ...; > If you can spare the memory, you might get better performance in this
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 21:46:47 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Guido]; > There seem to be two "drivers" for the classifier now: Neale Pickett's; > hammie.py, and the original GBayes.py.  According to the README.txt,
## Header (preview): Return-Path: bkc@murkworks.com; Delivery-Date: Sun Sep  8 21:45:49 2002; From: bkc@murkworks.com (Brad Clements)
## Body (preview): Just curious if subject line capitalization can be used as an indicator.; ; Either the percentage of characters that are caps..
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Sun Sep  8 21:56:59 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Brad Clements]; > Just curious if subject line capitalization can be used as an indicator.; >
## Header (preview): Return-Path: nas@python.ca; Delivery-Date: Mon Sep  9 02:20:51 2002; From: nas@python.ca (Neil Schemenauer)
## Body (preview): Tim Peters wrote:; > If you've still got the summary files, please cvs up and try running cmp.py; > again -- in the process of generalizing cmp.py, you managed to make it skip
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Mon Sep  9 03:16:18 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > ...; > On my box the current system scores about 50 msgs per second (starting
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Mon Sep  9 04:36:00 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Neil Schemenauer]; > Woops.  I didn't have the summary files so I regenerated them using a; > slightly different set of data.  Here are the results of enabling the
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Mon Sep  9 14:16:06 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 07 September 2002, Guido van Rossum said:; > If and when we package this, perhaps we should use Barry's trick; > from the email package for making the package itself the toplevel dir
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Mon Sep  9 15:10:00 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > I'd prefer to strip HTML tags from everything, but last time I tried; > that it still had bad effects on the error rates in my corpora;
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Mon Sep  9 15:45:52 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; >> I'd prefer to strip HTML tags from everything, but last time I tried; >> that it still had bad effects on the error rates in my corpora
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Mon Sep  9 15:11:16 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> If and when we package this, perhaps we should use Barry's trick ...; ;     Greg> It's not a *trick*!  It just requires this
## Header (preview): Return-Path: guido@python.org; Delivery-Date: Mon Sep  9 16:22:52 2002; From: guido@python.org (Guido van Rossum)
## Body (preview): > That has the nasty side effect of placing all .py files in the; > package.  What about obvious executable scripts (like timtest or; > hammie)?  How can I keep them out of the package?
## Header (preview): Return-Path: marklists@mceahern.com; Delivery-Date: Mon Sep  9 17:26:51 2002; From: marklists@mceahern.com (Mark McEahern)
## Body (preview): [Skip Montanaro]; > That has the nasty side effect of placing all .py files in the package.; > What about obvious executable scripts (like timtest or hammie)?  How can I
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Mon Sep  9 17:31:12 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): Because I get mail through several different email addresses, I frequently; get duplicates (or triplicates or more-plicates) of various spam messages.; In saving spam for later analysis I haven't always been careful to avoid
## Header (preview): Return-Path: jeremy@alum.mit.edu; Delivery-Date: Mon Sep  9 17:37:05 2002; From: jeremy@alum.mit.edu (Jeremy Hylton)
## Body (preview): >>>>> "TP" == Tim Peters <tim.one@comcast.net> writes:; ;   >> First test results using tokenizer.Tokenizer.tokenize_headers()
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Mon Sep  9 17:46:55 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip Montanaro]; > Because I get mail through several different email addresses, I; > frequently get duplicates (or triplicates or more-plicates) of
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Mon Sep  9 19:15:37 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Guido> Why would we care about installing a few extra files, as long as;     Guido> they're inside a package?;
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Mon Sep  9 20:19:04 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     >> I wrote a script some time ago to try an minimize the duplicates I;     >> see by calculating a loose checksum, but I still have some;     >> duplicates.  Should I delete the duplicates before training or not?
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Mon Sep  9 20:25:42 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 09 September 2002, Tim Peters said:; > > Would people be interested in the script?  I'd be happy to extricate; > > it from my local modules and check it into CVS.
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Mon Sep  9 20:35:04 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Greg> OTOH, look into DCC (Distributed Checksum Clearinghouse,;     Greg> http://www.rhyolite.com/anti-spam/dcc/), which uses fuzzy;     Greg> checksums.  It's quite likely that DCC's checksumming scheme is
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Mon Sep  9 22:01:10 2002; From: gward@python.net (Greg Ward)
## Body (preview): [followups to spambayes@python.org please, unless you're specifically;  concerned about some particular bit of email policy for python.org];
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Tue Sep 10 04:18:25 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): We've not only reduced the f-p and f-n rates in my test runs, we've also; made the score distributions substantially sharper.  This is bad news for; Greg, because the non-existent "middle ground" is becoming even less
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Tue Sep 10 10:29:19 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): >>> Tim Peters wrote; > We've not only reduced the f-p and f-n rates in my test runs, we've also; > made the score distributions substantially sharper.  This is bad news for
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Tue Sep 10 17:36:57 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview): After my latest cvs up, timtest fails with; ;     Traceback (most recent call last):
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Tue Sep 10 18:12:51 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip Montanaro]; > After my latest cvs up, timtest fails with; >
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Tue Sep 10 19:26:05 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > I never used ConfigParser before, but I read that its read() ; > method silently ignores files that don't exist.  If 'bayes.ini'
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Tue Sep 10 20:01:36 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Anthony Baxter]; > Well, I've finally got around to pulling down the SF code. Starting; > with it, and absolutely zero local modifications, I see the following:
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Wed Sep 11 04:46:15 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; > ...; > At the other extreme, training on half my ham&spam, and scoring aginst
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Wed Sep 11 06:14:36 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): I've been running hammie on all my incoming messages, and I noticed that; multipart/alternative messages are totally hosed: they have no content,; just the MIME boundaries.  For instance, the following message:
## Header (preview): Return-Path: neale@woozle.org; Delivery-Date: Wed Sep 11 08:10:29 2002; From: neale@woozle.org (Neale Pickett)
## Body (preview): So then, Neale Pickett <neale@woozle.org> is all like:; ; > Maybe there's some subtle interaction between generators and lists
## Header (preview): Return-Path: gward@python.net; Delivery-Date: Wed Sep 11 13:23:08 2002; From: gward@python.net (Greg Ward)
## Body (preview): On 10 September 2002, Tim Peters said:; > Why would spam be likely to end up with two instances of Return-Path; > in the headers?
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Thu Sep 12 01:13:06 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Anthony Baxter]; > 5 sets, each of 1800ham/1550spam, just ran the once (it matched all 5 to; > each other...)
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Thu Sep 12 01:23:51 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): > How were these msgs broken up into the 5 sets?  Set4 in particular is giving; > the other sets severe problems, and Set5 blows the f-n rate on everything; > it's predicting -- when the rates across runs within a training set vary by
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Thu Sep 12 01:37:13 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Neale Pickett]; > And then, just as I was about to fall asleep, I figured it out.  The; > tokenizer now has an extra [:], and all is well.  I feel like a real
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Thu Sep 12 01:44:56 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Tim]; >> Why would spam be likely to end up with two instances of Return-Path; >> in the headers?
## Header (preview): Return-Path: skip@pobox.com; Delivery-Date: Thu Sep 12 02:10:50 2002; From: skip@pobox.com (Skip Montanaro)
## Body (preview):     Anthony> They weren't partitioned in any particular scheme - I think;     Anthony> I'll write a reshuffler and move them all around, ...;
## Header (preview): Return-Path: tim.one@comcast.net; Delivery-Date: Thu Sep 12 04:06:24 2002; From: tim.one@comcast.net (Tim Peters)
## Body (preview): [Skip]; > Hmmm.   How about you create empty Data/Ham/Set[12345], stuff all your; > files into a Data/Ham/reservoir folder, then run the rebal.py script to
## Header (preview): Return-Path: anthony@interlink.com.au; Delivery-Date: Thu Sep 12 05:26:41 2002; From: anthony@interlink.com.au (Anthony Baxter)
## Body (preview): > They weren't partitioned in any particular scheme - I think I'll write a; > reshuffler and move them all around, just in case (fwiw, I'm using MH ; > style folders with numbered files - means you can just use MH tools to
## Header (preview): From pudge@perl.org  Mon Aug 26 15:17:33 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; Damian Conway Publishes Exegesis 5
## Header (preview): From pudge@perl.org  Mon Aug 26 15:17:50 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Mon Aug 26 15:22:13 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): The latest proposal to drive the Taliban and Al Qaeda out of the; Mountains of Afghanistan is to send in the ASF (Alabama Special; Forces) Billy Bob, Bubba, Boo, Scooter, Cooter and Junior are being
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Mon Aug 26 15:24:00 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Forwarded by: Gary Williams <garyaw1990@aol.com>; ; A Mother had 3 virgin daughters. They were all getting married within a
## Header (preview): From pudge@perl.org  Tue Aug 27 03:05:47 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Aug 27 03:05:46 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (19-25 August 2002)
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Wed Aug 28 10:45:42 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Brothel duty for Australian MP; ; A conservative Member of Parliament in Australia is set to
## Header (preview): From pudge@perl.org  Wed Aug 28 10:46:24 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; .NET and Perl, Working Together
## Header (preview): From pudge@perl.org  Wed Aug 28 10:46:28 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Mon Sep  2 12:32:31 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; Two OSCON Lightning Talks Online
## Header (preview): From pudge@perl.org  Mon Sep  2 12:32:36 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Mon Sep  2 12:36:33 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Headline Mailer; ; Perl Ports Page
## Header (preview): From pudge@perl.org  Mon Sep  2 12:36:48 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Sep  3 14:20:14 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Sep  3 14:20:15 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (26 August / 1st September 2002)
## Header (preview): From pudge@perl.org  Wed Sep  4 11:39:23 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Perl CMS Systems
## Header (preview): From pudge@perl.org  Wed Sep  4 11:39:26 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Fri Sep  6 11:34:57 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Perl "Meetup"
## Header (preview): From pudge@perl.org  Fri Sep  6 11:35:00 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Mon Sep  9 20:33:36 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Port San Luis, California; September 05, 2002;
## Header (preview): From pudge@perl.org  Tue Sep 10 11:23:11 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (2-8 September 2002)
## Header (preview): From pudge@perl.org  Tue Sep 10 11:23:13 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Wed Sep 11 13:43:29 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; DynDNS.org Offers Free DNS To Perl Sites
## Header (preview): From pudge@perl.org  Wed Sep 11 13:43:32 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Fri Sep 13 13:35:02 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; The Perl Journal Returns Online
## Header (preview): From pudge@perl.org  Fri Sep 13 13:35:05 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Sat Sep 14 16:22:36 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; "Perl 6: Right Here, Right Now" slides ava
## Header (preview): From pudge@perl.org  Sat Sep 14 16:22:37 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Sep 17 11:27:02 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; New Perl Mongers Web Site
## Header (preview): From pudge@perl.org  Tue Sep 17 11:27:03 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Tue Sep 17 23:29:07 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "I'm a tad furry, so animal rights issues come into play.";  Robin Williams, telling Entertainment Weekly why he won't do;   nude scenes in movies.
## Header (preview): From pudge@perl.org  Wed Sep 18 11:50:50 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Subscribe to The Perl Review
## Header (preview): From pudge@perl.org  Wed Sep 18 11:50:51 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Warning in strsplit(email_text, "\n"): unable to translate 'From 0xdeadbeef-request@petting-zoo.net  Tue Sep 17 23:29:14 2002
## Return-Path: <0xdeadbeef-request@petting-zoo.net>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/01794.e322c3e66406d3a985a61aba25902c5b - missing value where TRUE/FALSE needed
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Thu Sep 19 11:21:30 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Did you know that you can tell from the skin whether a person is; sexually active or not?;
## Header (preview): From pudge@perl.org  Thu Sep 19 12:59:59 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; How much does Perl, PHP, Java, or Lisp suck?
## Header (preview): From pudge@perl.org  Thu Sep 19 13:00:03 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Fri Sep 20 11:29:30 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; PerlQT 3 Released
## Header (preview): From pudge@perl.org  Fri Sep 20 11:29:32 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From pudge@perl.org  Mon Sep 23 12:05:59 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; YAPC 2003 Call For Venues
## Header (preview): From pudge@perl.org  Mon Sep 23 12:06:06 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Sep 24 10:47:05 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (16-22 September 2002)
## Header (preview): From pudge@perl.org  Tue Sep 24 10:47:07 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Thu Sep 26 11:02:41 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Using Web Services with Perl and AppleScript
## Header (preview): From pudge@perl.org  Thu Sep 26 11:02:45 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Tue Oct  1 10:34:35 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; This Week on perl5-porters (23-29 September 2002)
## Header (preview): From pudge@perl.org  Tue Oct  1 10:34:37 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Wed Oct  2 11:42:58 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Wed Oct  2 11:43:00 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Announcing SouthFlorida.pm
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Thu Oct  3 12:22:21 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 01. I was so poor growing up...  if I wasn't a boy...  I'd have had;     nothing to play with.;
## Header (preview): From pudge@perl.org  Thu Oct  3 12:22:42 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Mailing List Judo movie available
## Header (preview): From pudge@perl.org  Thu Oct  3 12:22:44 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Thu Oct  3 12:22:47 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):      New $199 PC Doesn't Do Windows;      - Oct 2, 2002 03:53 PM (AP Online);      - http://finance.lycos.com/home/news/story.asp?story=28928829
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Sat Oct  5 10:34:07 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A guy struck up a conversation with a young lady in a bar.  After a half; dozen drinks, he suggested they get their own bottle and retire to his; motel room, and she readily agreed. "Say, how old are you, anyway?" the
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Sat Oct  5 10:34:15 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The History of Medicine:; ;   2000 B.C. -- Here, eat this root.
## Header (preview): From pudge@perl.org  Mon Oct  7 12:03:53 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Mon Sep  2 12:23:15 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Mon Sep  2 12:31:10 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): There were four buddies golfing and the first guy said, "I had to; promise my wife that I would paint the whole outside of the house; just to go golfing."
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Fri Sep  6 15:24:22 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): First they sue the tobacco companies for giving them lung cancer,; then the fast food places for making them fat.; Guess I can sue Budweiser for all the ugly women I've slept with.
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Wed Oct  9 10:49:11 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "I've started referring to the proposed action against Iraq as Desert; Storm 1.1, since it reminds me of a Microsoft upgrade: it's expensive,; most people aren't sure they want it, and it probably won't work."
## Header (preview): From pudge@perl.org  Wed Oct  9 10:51:26 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Headline Mailer; ; Passing the Parrot Pumpkin
## Header (preview): From pudge@perl.org  Wed Oct  9 10:51:28 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From pudge@perl.org  Thu Oct 10 12:25:46 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Shelley Powers_: &#8220;I thought the stuff this weekend on FOAF was a joke[1]; &#8212;a bunch of people playing with new toys. ... How does FOAF aid ; aggregation? The author is included with each bit. Why do we need extraneous
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy Zawodny[1] who works at Yahoo Finance offers an RSS 0.91 feed for every ; stock. It's a beta feature. Here's the feed for Microsoft[2] and one for ; Marimba[3]. Thanks to Jon Udell[4] for the pointer. Nice. Jon also notes that
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Finally finished up (most of) TRAMP, my RDF interface for Python. (If you don't ; use RDF or Python you can probably safely skip this entry.)  ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Halley[1]: "When is someone going to create _audio fonts_ for Christ's sake."; ; [1] http://halleyscomment.blogspot.com/2002_09_22_halleyscomment_archive.html#85483723
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've received an _incredibly kind invitation_; I sure hope I can take it! I ; feel sort of bad though, because I think other people deserve it more than I ; do.
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): NY Times piece[1] on reporters with weblogs.; ; [1] http://www.nytimes.com/2002/09/23/technology/23BLOG.html?ex=1033358400&en=a34d8a401c775a55&ei=5007&partner=USERLAND
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Phil Wolff: Dave Winer books I'll buy[1]. _Sweet! _; ; [1] http://dijest.com/aka/2002/09/23.html#a2082
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): DVDSynth is an open source project that allows you to splice in your own ; footage, alternate audio, subtitles, etc, to any DVD. This means that you can ; insert your own non-sucky subtitles, make and circulate edit-lists that make
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sheila Lennon was interviewed[1] for the Times piece.; ; [1] http://www.lennon2.com/sept23.htm
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Great article on a group of East Bay activists who rehab junk computers, using ; semi-skilled volunteers who train other semi-skilled volunteers. The resulting ; computers are sent to the developing world for activist use.
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tonight on the Style Network's TV show "Area," my house will be featured ; undergoing a Hawaiiana makeover. Watch it and meet Carla, my daughter, and me. ; It'll play Monday at 9:30 pm ET. (If someone can tape it for me, I'd appreciate
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The good folks at ResearchBuzz have released a groovy Google API tool, "The ; Suffix Census." Enter your search terms, and the census will tell you how many ; of the results are in .NET, .COM, .ORG, and other top-level domains. Link[1]
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Article about a scam expert who belives the mom who beat her child is a grifter ; belonging to the Irish Travelers. The reason she beat up her little girl, he ; thinks, is becasue she was pissed that the kid blew her con at a toy store.
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Carny concessionaires have taken to selling deep-friend Twinkies, doing big ; business with artery-clogging horripilations: ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:40 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Slashdot reports[1] that Amazon still wants to patent the Web.; ; [1] http://slashdot.org/article.pl?sid=02/09/23/1156216&mode=thread&tid=155
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Aaron Swartz has written up a warchalking FAQ that addresses the shibboleths ; and paranoia about discovering, marking and using wireless connectivity. ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): News.Com[1]: "Amazon.com is hoping to use more than the honor system to protect ; a payment method it established online last year.";
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "rssflowersalignright"I've gotten to know Phil Ringalda over the last few weeks ; in all the discussions about RSS 2.0, and I like him, and would like to work ; with him in the future. I don't say that lightly. This evening he posted a note
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gold Lake Mountain Resort[1] looks pretty gooood. Man there are a lot of cool ; relaxing places to stay in Colorado. Keep the suggestions coming. ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gold Lake Mountain Resort[1] looks pretty gooood. Man there are a lot of cool ; relaxing places to stay in Colorado. Keep the suggestions coming. ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Janis Ian, a brave and talented recording artist (and budding and talented ; science fiction writer) has done a terrific interview with the Slashdot ; groupmind about her views on the music industry.
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ed Cone[1]: "I told my grandmother goodbye."; ; [1] http://radio.weblogs.com/0107946/2002/09/24.html#a186
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Google has seriously revamped Google News -- the system automatically gathers ; today's top stories and finds all the various coverage of them. It's really ; excellent. Link[1] Discuss[2] (_Thanks, Nate!_)
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Paul Everitt: Interop in the Bazaar[1].; ; [1] http://advogato.com/article/544.html
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): CNN Headline News: To Blog or not to Blog[1].; ; [1] http://www.cnn.com/2002/SHOWBIZ/09/20/hln.hot.buzz.blog/index.html
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): After posting my comment yesterday about next things[1] I want to do, I'm ; starting to get job offers. Hey I wasn't expecting that. But I like it I like ; it. Especially in this stinkin economy. On the other hand can you imagine _me_
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Phil Wolff: Dave Winer books I'll buy[1]. _Sweet! _; ; [1] http://dijest.com/aka/2002/09/23.html#a2082
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://jw.servebeer.com:8080/images/bigE/thumbnails/tn_P0002140.JPG] Jeff ; writes: "Goats with enormous testicles, and a life-sized cow sculpted from ; butter. Pictures from Massachusett's Eastern States Expo this weekend. Anyone
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Shelley Powers raises[1] some interesting questions re whether RDF has a place ; in syndication. She says that RDF is trying to build a persistent database (aka ; the Semantic Web) and RSS is trying to flow news that has a short lifespan. I
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've been hearing a lot about FOAF, which is an acronym for Friend Of A Friend. ; It's an RDF-based file format that lets you walk a network of people who are ; friends. It's a lot like a network of blogrolls[1].
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:47:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Homeland Alert is an OS X app that puts a little beacon in your menubar, ; telling you what the current nationwide alert status is -- just in case you ; don't have enough free-floating anxiety in your life. Link[1] Discuss[2] (_
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Trust me when I tell you that heavy medication and RDF do not mix. Here is a ; list of things I intend to re-read once the fog lifts: ;
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): No, really. My sinus infection, which appeared to be gone, flared up again over ; the weekend in the nastiest way, and I am now coughing up dark mucus and doing ; other things that probably don't bear repeating in a public forum. I have the
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Robert L Forward, a giant of hard science fiction, has died at 70 of brain ; cancer. Link[1] Discuss[2] (_Thanks, Michael[3]!_);
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Google PR sends a message that they have a new News service[1]. Maybe I'm slow ; this morning, or maybe I'm spoiled, but what's the big deal. I thought they ; already had this. My personal aggregator[2] is better, it shows me what I'm
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Javawalk is a coffee-oriented walking-tour of San Francisco. ; ;     Javawalk is a two-hour walk in the city center. We start at Union Square
## Header (preview): From rssfeeds@jmason.org  Tue Sep 24 10:48:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): News.Com: Google search gets newsier[1].; ; [1] http://rss.com.com/2100-1023-958927.html?type=pt&part=rss&tag=feed&subj=news
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Anil Dash_: XML version 1.0[1]. &#8220;Why isn't there a way to syndicate my ; words without butchering the way they look?&#8221; Several people protested ; last week by changing their weblog templates to something like this[2]. Jason
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bruce Loebrich[1] has scraped RSS feeds for Google news, and a RSS 2.0 success ; story. In other words, it's okay to use the features in 2.0. We're doing it at ; UserLand and so is Bruce.
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I need a lawyer willing to argue that not-for-profit file sharing is fair use. ; I've got a plan. ;
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): News.Com[1]: "Linux is a serious competitor," said Ballmer.; ; [1] http://rss.com.com/2100-1001-959165.html?type=pt&part=rss&tag=feed&subj=news
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Sam Ruby_: Stark raving mad[1]. ; ;     This post was entered in Radio, extracted using a batch file via some
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): There are a few net innovations that have far greater ramifications than you ; would, at first hearing, expect them to. Napster, at heart just IRC with a UI, ; was one. Google News[1] is another.
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): - _Phil Ringnalda_: Putting on the brakes[1]. &#8220;So, the answer to the ; question that started this whole project, "what is the RDF in RSS 1.0 good ; for?" is two things: it's good for someone who has an infinitely large database
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sam Ruby[1]: "Yup, I'm a sick puppy." _Me too!_; ; [1] http://www.intertwingly.net/blog/844.html
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Note to self: Read the pingback spec[1]. Form opinion.; ; [1] http://www.hixie.ch/specs/pingback/pingback
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Aaron Swartz[1]: "If everyone is afraid to speak, who will defend our right to ; download?" _I'm not afraid._;
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Lest anyone doubt that Brent[1] has a good heart. "I laughed, because here's ; the irony -- on this site, on my own personal weblog, Radio UserLand rather ; than NetNewsWire is the most-used aggregator."
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dotcom Scoop[1]: "CNET's Download.com is set to introduce a new program for its ; Download.com software portal. Beginning Sept. 30, software vendors will be ; charged a fee to upload their wares. There is also a monthly-package to get
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Iowa[1]: "There was frost outside this morning!"; ; [1] http://iowa.weblogger.com/2002/09/24
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): MacNet Journal reports[1] that OmniOutliner will support OPML[2] soon. That's ; very good news[3] indeed. ;
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 9/2/00[1]: "In the overworked world of Web development, there's no time to ; study, there's only time to do.";
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ray Ozzie: Software Platform Dynamics[1].; ; [1] http://www.ozzie.net/blog/stories/2002/09/24/softwarePlatformDynamics.html
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wired[1]: "An urgent business proposition and requests for urgent assistance ; from a so-called Nigerian official were heeded by a Detroit bank secretary in ; the latest example of how the ubiquitous e-mail scam actually works."
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy Allaire: Wholistic Web Services[1].; ; [1] http://radio.weblogs.com/0113297/stories/2002/09/24/wholisticWebServices.html
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Scoble[1]: "I'm just not that excited by much that Microsoft is doing."; ; [1] http://radio.weblogs.com/0001011/2002/09/24.html
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): NY Times[1]: "Google's automated editors appeared to match the work of human ; competitors.";
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Jeffrey Zeldman_: OS X Blues update[1]. ; ;     A couple of intellectuals have pointed out parallels between the rigidity
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): DVD Capture 1.0[1] &#8220;is a helper application for the Apple DVD Player. It ; enables the user to take screen captures of the DVD Player Viewer in window and ; full screen mode. The captures can be saved to a file or placed on the
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Looks like Google did a deal to index the NY Times. If you do this news search; [1], and mouse over the link, you'll see there's a partner attribute on the ; URL, like the ones in our links[2]. What are the implications of this? Here's
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Lance Knobel[1] of Davos Newbies does a quick review of Tony Blair's case ; against Sadam Hussein.;
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Barbie has been made over as a Bond girl:  ; ;     [IMG: http://www.craphound.com/images/bondbarbie.jpg] As James Bond, Ken
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): For UK#400,000, a bioresearcher will map your personal genome for you. As ; geneticists discover more markers for congenital diseases, you can compare them ; to your genome and learn what you're in for in your lifetime -- heart disease,
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've put up a page called "12 Reasons to Pre-Order Down and Out in the Magic ; Kingdom," with blurbs by twelve people telling you why they think you should ; buy it. Here're the blurbers:
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): EFF is looking for a few good slogans! We're getting some banners made up to ; place on P2P network clients, with slogans like, "P2P Has a Posse." We need ; more. Mail your suggestions to kevin@eff.org or post to the discuss link. Link
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A new addition to the parodical genre of 419 ("Nigerian Money Laundry Scam") ; letters from members of the Shrub establishment, following up on Cheney's ; letter[1].
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): DVD Capture is an AppleScript for OS X that captures screen-grabs from DVDs. OS ; X normally disables screen-capture while the DVD player is running (even if it ; isn't visible!). I have some home movies on DVD that I'd love to get stills
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gregor sez: ; ;     ENRON Corp material assets go on the block 7 AM CT TOMORROW, Wednesday,
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Horror Writers of America are hosting a charity auction on eBay to raise ; money for American literacy charities. ;
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:23:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ben Hammersley posts a parable about design specifications, showing the link ; between Roman Chariots and the Space Shuttle. It has the ring of something ; apocraphyl to me, but it's a good read, nevertheless.
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:24:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The British government has invited the local equivalent of the RIAA to fund an ; "anti-piracy" post. As Charlie puts it, "Mr Fox, here's the new set of ; hen-house keys you ordered."
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:24:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Moller, a public company in Davis, California, has developed a flying car.  ; ;     [IMG: http://www.craphound.com/images/flyingcar.jpg] Moller International
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:24:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Stefan sez: ; ;     A federal judge has determined that gas pipline manager El Paso did indeed
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:24:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): NewZoid generates fake news-headlines: ; ;     1- Miss Universe Calling For Isidore
## Header (preview): From rssfeeds@jmason.org  Wed Sep 25 10:24:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/nanodog.jpg] Matt "Warchalking" Jones has ; come up with a bio-dog for the latest Viridian Design Contest[1], called Von ; Neumann's Best Friend. Link[2] Discuss[3] (_Thanks, Matt[4]!_)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): One of the weirdest things I heard when listening to the Cato Institute debate ; was an economist claim "a tenet of my profession is that people won't pay for ; something they can get for free." Someone objected, using the analogy of
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thanks to Jenny[1] for the pointer to this Yale Law article[2] about The ; Wayback Machine removing articles about Scientology. "While Lawmeme doesn't ; know all the details of Scientology's request to the Internet Archive,
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [1] http://www.liberation.com/page.php?Article=55024
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy Bowers[1]: "None of the trackback mechanisms has reached the critical ; mass necessary to see the negative effects experienced in all other community ; models."
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ken Dow reports[1] that the current version of OmniOutliner can read and write ; OPML. This means, for example, with a little Radio script (or an AppleScript) ; you could use Omni as an Instant Outliner[2].
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ray Ozzie[1]: "How long before we see auto pingback generator spambots?"; ; [1] http://www.ozzie.net/blog/2002/09/25.html#a65
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:02:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy Zawodny[1] on life in Silicon Valley: "I came out here to work at a ; company that has since forgotten how to innovate and take risks. Yippie.";
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A new KPMG study concludes that the RIAA and its member companies are hurting ; themselves by focusing on cracking down on P2P sharing instead of figuring out ; ways to earn a living with it.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Reuters[1]: "Pets may not only provide good company for their owners, they may ; also help lower stress, according to new study findings.";
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Just a reminder: I'm speaking at the University of Texas at Austin at 7PM this ; Friday -- giving a talk on Hollywood's legislative agenda, sponsored by ; EFF-Austin, ACTLab, and ACLU-Texas. Love to see you there! Link[1] Discuss[2]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "rssflowersalignright"A productive thread[1] on RSS-DEV confronts the ; negativeness about RSS 2.0[2] head-on. This will go someplace interesting.  ;
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Great piece on the pulp comic characters that appear in the new series of Alan ; Moore's _League of Extraordinary Gentlemen Tom Strong_ (thanks, Zed) funnybook. ; These characters, like The Terror and The Fighting Yank, are in the public
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://radio.weblogs.com/0001015/images/2002/09/25/uncSamMedium.gif (A ; picture named uncSamMedium.gif)][1]Last year on this day[2]: "It's been ; not-correct for most of my life for Americans to say we love our country.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Brian sez: Vocera Communications has developed what is essentially a Star Trek: ; TNG-style lapel communicator device that uses WiFi to transmit voice across ; networks.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Daypop[1] is back. _Ye-hi._; ; [1] http://www.daypop.com/top/
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Fred Grott: How to Keep RDF and RSS Straight[1].; ; [1] http://www.diaries.com/ShareMe/2002/09/24
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mixed news from yesterday's heart checkup. ; ; First, I went seven minutes on the treadmill. That was pretty good. My heart
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jon Hanna, on the RSS-DEV list, says[1] that RSS, was "not designed to be of ; any particular use to bloggers, aggregators, or metadata providers." This is ; not true. Half of RSS 0.91 was scriptingNews format[2], which was totally
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ed Cone[1]: "The House Subcommittee on Courts, the Internet, and Intellectual ; Property will hold a hearing on 'Piracy of Intellectual Property on ; Peer-to-Peer Networks' at 9AM., Thursday, September 26, (2141 Rayburn House
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gracie Allen[1]: "Never put a period where God has placed a comma."; ; [1] http://www.inspirationpeak.com/archives/2001/012301.html
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Great email[1] from the RIAA's Hillary Rosen to execs at Yahoo, Real, AOL and ; Microsoft, on how to crack down on the millions of Morpheus and Kazaa users. Is ; this for real?
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wired[1]: "Stronger ties between ISPs and file-trading companies could bolster ; Kazaa's defenses.";
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ben Silverman, the publisher of Dotcom Scoop, says the Rosen email is real, and ; part of a confidential internal memo[1] that outlines the RIAA's legal strategy ; re Kazaa, Music City and Grokster.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You can see Cory Doctorow explain the problems with the Berman Bill while his ; host subscribes to the EFF Action Center on TechTV[1] if you've got Windows ; Media Player. If you're on Windows, you can also hear them. (The Mac version
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 11:03:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): John Robb[1]: "Yesterday, AT&T upgraded my cable box to a digital system."; ; [1] http://jrobb.userland.com/2002/09/25.html#a2595
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:30:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Morten Frederiksen has taken a first stab at a real-time social network ; explorer based on FOAF files. You could start on my profile[1] and explore from ; there, or enter the URL of your own FOAF file (at the bottom of the page). It's
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:31:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Mark Tosczak_: A New Way to Read, Not See, Maps[1]. &#8220;The map-navigation ; software, dubbed Blind Audio Tactile Mapping System ... takes digital map ; information and provides nonvisual feedback as a user moves a cursor across the
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:31:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Paul Ford_: Falling Off a Truck[1]. &#8220;In the last 4 days I fell off a ; truck and was dragged for 30 feet, and was interviewed by an NPR show. Those ; two facts are not related except that they both happened to me and made me
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:31:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Amazing story about the "dabba wallahs" -- India's 112-year-old meal-delivery ; system that outdoes FedEx using pictograms, bicycles, and largely illiterate ; (but well-compensated) deliverypeople:
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A lot of people seem to be missing the point of Phoenix, as evidenced by the ; responses on Mozilla News[1] and MozillaZine[2]. Let me emphasize something ; here: if you think Mozilla's current UI is acceptable, then you are clearly not
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bug 22056 has to do with enabling different toolbar modes. It's a pretty basic ; browser feature that has been missing from Navigator for years. Even simplified ; browsers like Chimera have this feature. Neil did some excellent work in 22056
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/tapedup.jpg] Duct-tapers are mainstream ; bondage fetishists who tape each other up to walls and ceilings "just to see if ; it will hold." Pervs. Link[1] Discuss[2] (_Thanks Steve[3]!_)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:49 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tony Davis wrote in his blog:; ; _All Mozilla did is steal Netscape's thunder. _
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Blake blogs[1] about how mpt[2] wants Mozilla to look just like MSIE. I have to ; admit, the evidence is pretty compelling. I recall someone asking me, "Do you ; really agree with mpt's Top 10 list? He's quoted you at the top of the list!"
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:33:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Some of the words in the new shorter Oxford English Dictionary: ; ;     Asylum seeker, economic migrant, bed-blocking, and stakeholder pension
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:34:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): We're trying to decide if FogBUGZ[1] 3.0 should support custom fields. ; Historically, I am opposed to custom fields in principle, because they get ; abused. People add so many fields to their bug databases to capture everything
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:34:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Eddie Kessler describes programming at Napster[1]. ; ; Ray Ozzie has more on platforms[2]. "Finding the 'right' price point for a
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:34:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I feel so tremendously validated right now in all my criticisms of Netscape vs. ; Mozilla. I told Netscape management that if the Netscape beta shipped without ; popup blocking that CNet would write an article on it. They didn't believe me
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:34:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jakob Nielsen on Offshore Usability[1]: "To save costs, some companies are ; outsourcing Web projects to countries with cheap labor. Unfortunately, these ; countries lack strong usability traditions and their developers have limited
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): John Robb has an interesting perspective on trust-based, targetted advertising; [1] based on his experiences at Gomez during the heady days of the Internet ; gold rush.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I received some feedback in email (from several of you actually) regarding my ; earlier blog about the Parents Television Council[1], which recently published ; a report in which they labeled Buffy as the worst show on television for
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Ugly Guy)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Stoner)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/bostonglobe.gif ([BostonGlobe])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Daniel Berlinger has noticed[1] that Mac software shops are starting to move to ; OS X-only development. This makes sense, for two reasons. First, most people ; who pay for software have new computers. So while OS X may only have a small
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/yahoonews.gif ([Yahoo])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Test your knowledge with this set of movie quotes. I'll be back in a couple of ; days with the answers.;
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/msnbc2.gif ([MSNBC])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In the second of our series from the GDC Europe, we talk with Microsoft's Bill ; Fulton about usability testing for games, SCEE's Zeno Colaco about pitching ; publishers, and Harvey Smith of Ion Storm about emergent game design.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Gentleman)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Comment:* The success of the mass demonstrations against the Vietnam war show ; why this Saturday's Stop the War march is so important, says *Paul Foot*.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This feature, excerpted from Wolfgang Engel's ShaderX book from Wordware ; Publishing, presents a simple shader trick that performs a good per pixel ; approximation of a non-integer power function. The technique works for input
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Further evidence of a slowdown in the housing market emerged today as ; figures revealed a 15% drop in the total value of mortgages approved during ; August.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:41:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/scotsman.gif ([The Scotsman])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It came out a while ago, but Ben Hammersley reviewed AmphetaDesk and a few ; other free aggregators in his Guardian article, Working the web: Newsreaders[1]; . In more timely news, OSDir[2], a repository of "stable, open source apps",
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Since the AmphetaDesk source code is so easily modifiable on any platform, I've ; been seeing some interesting hacks and modifications lately. The most powerful ; of them is l.m. orchard's newest template[1], which provides an insane amount
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Got a stock ticker for which you'd like to have an RSS news feed? Help test the ; beta RSS feeds we've put up o Yahoo Finance. Take your favorite ticker, say ; YHOO, and put this URL in your news aggregator:...
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Nigerian researchers say their study negates arguments used to defend the ; practice, which is still widespread in Africa
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dan thinks it is evolution. To me it's stupidity, laziness, and apathy. I have ; to respectfully disagree. Or maybe I'm just being stubborn. For whatever ; reason, whenever I get e-mail from someone who: Writes "ur" instead of "you
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A hardy microbe that can withstand huge doses of radiation is most likely to ; have evolved this ability on the Red Planet, argue scientists
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): An influential think tank warns that "regime change" could disperse weapons ; stockpiles into the murky world of global terrorism
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A new analysis of satellite images shows regeneration of once arid lands across ; the southern Sahara, making farming viable again
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Males suffer more parasitic infections than females - this could help explain ; why they die younger, say researchers
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Millions of tiny fat droplets are thought to damage the brains of most heart ; surgery patients - sonic waves may help
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Over the last century, an "extra" 35,000 suicides occurred under Tory rule in ; the UK - a similar effect is apparent in Australia
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A genetically engineered yellow fever vaccine shows promise in animal tests - ; if fast-tracked it could soon be available for humans
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): British scientists vow to have their robotic probe ready for launch in 2003, ; amid concerns over the project's finances
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Shining a laser through a cheap, little disc can generate an immensely powerful ; secret code - they could be used to secure credit cards
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rings around distant stars betray small rocky planets, say astronomers, ; suggesting a census will soon be possible
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): We are more unique than previously thought, according to new comparisons with ; the genetic code of our closest relatives
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The controversial claim could be evidence of hidden extra dimensions and help a ; 'theory of everything' fall into place
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:49 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): New laws, prompted by earlier cloning claims, promise 10 years in jail for ; offenders - but the blanket ban angers scientists
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The faint microwave afterglow of the Big Bang is polarised - the discovery ; should help probe the birth of the Universe
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tests for the infectious agent in people without symptoms do not reduce the ; deaths predicted - larger studies are "urgently needed"
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:42:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The cargo vessel ran aground off a World Heritage conservation site in South ; Africa - raging fires are hampering salvage attempts
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): US officials have all but confirmed that the virus - which has killed 84 people ; - can be transmitted via donated blood
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The US Air Force is set to test the steering and control technique first used ; during the Wright brothers' famous flight in 1903
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It will be the only US state where medical researchers can use public funds to ; create embryos and extract stem cells
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A subconsciously perceptible pattern explains the mysterious appeal of a famous ; old Japanese garden, say researchers
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Detailed guidelines for vaccinating all 288 million citizens within five days ; of an outbreak are being dispatched to every state
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It claims Iraq is ready to use chemical weapons and is pursuing long-range ; missiles, but it lacks dramatic new evidence likely to win over war sceptics
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Technical problems beat a transatlantic record attempt, as the weather beats an ; altitude record attempt - for now
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gory hieroglyphs found on a Guatemalan pyramid support the idea of a superpower ; struggle at the civilisation's peak
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Researchers say they have made at least 50,000 atoms of cold antihydrogen - ; analysing them may reveal why antimatter is so rare
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I just finished reading an article about Mozilla[1] for Salon.com[2]. This ; excerpt was rather amusing.;
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Black entrepreneurs face more problems in raising money for ; start-ups than white or Asian counterparts, new report says.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A patented system allows drivers of hushed modern vehicles to enjoy the throaty ; engine sounds of classic cars, all in synch with your driving
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So, I called the power company promptly at 8am to find out what they were ; smoking. The allowed me to pay by credit card so that I could get reactivated ; today (and pay a $40 "reconnection fee" for the privilege)....
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've added a new blog category: Yahoo. Why? Because occasionally I post stuff ; about work, so I might as well categorize. Plus, some private e-mail has ; convinced me that it might be a good idea. (You know who you are....
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/azcentral.gif ([AZCentral])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Comic Book Guy)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): First of all, thanks for all the great feedback. I see that a lot of folks are ; pulling it now. I'm working on some stats. It'll be interesting to see which ; stocks bloggers tend to watch, which aggregators they use,...
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Matt describes something I've been experiencing a lot recently: You know you ; read too many primary sources when you read an article on slashdot and think, ; "I read that yesterday." Yeah, ever since I got into weblogs. I don't rely...
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Arizona Republic)
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/pravda.gif ([Pravda])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (me)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (NY Daily News)
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Thu Sep 26 16:43:26 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id E534F16F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02003.0efdf5386d93ddbff346b304c637ab35 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (creationists.org)
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Scripting languages allow rapid development of game behavior without the ; pitfalls that await the unwary C++ programmer. Using an existing scripting ; language saves the time and cost of developing a custom language, and typically
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/cleveland.gif ([Cleveland])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It appears that hfb has an evil toilet. It's a good thing that Josh never met ; it. She also found some amusing lines to use at work. I could use a few of ; those myself. It's not like we didn't...
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): With project budgets in the multiple millions of dollars and virtually no ; margin for error, more and more development teams are under tremendous pressure ; to come out on top of the entertainment software market's cutthroat
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *The Northerner:* Subscribe to our free email round-up of the best of the ; northern English press.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Books:* Fay Weldon may have opted to be writer in residence at the Savoy Hotel ; in London, but Will Self has chosen a different kind of residency.
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/sbb.gif ([Sports by Brooks])]
## Header (preview): From rssfeeds@jmason.org  Thu Sep 26 16:43:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (whatever-dude)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Disney's put up a little brochureware site about its forthcoming (and very ; exciting!) film based on the Haunted Mansion ride, a followup to the Country ; Bears movie (I may be the only adult in the world who enjoyed that one). All
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is the headline of the month, possibly the year: "Doctors Grow Pig Teeth ; in Rat Intestines." Do we even need to read the story to understand it? It's ; like a freaking _haiku_ of near-singularity, future-shocky wonderment!
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (The Japan Times)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some albino rhino)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/abcnews.gif ([ABC News])]
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:40:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (DeKalb Daily Chronicle)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/aicn.gif ([AintItCoolNews])]
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Last week my hands and shoulders were starting to really act up on me again. ; The pain. I will spare you the details of my emotions when work all day with ; pain and discomfort in what feels like my whole body. Tuesday I dragged myself
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/cbc.ca.gif ([CBC])]
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/cnn.gif ([CNN])]
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (orlando sentinel)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Stuff.co.nz)
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Fri Sep 27 10:41:10 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 0C56916F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02026.e6e094c6110cbff0c3a55e0fc5c9273a - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): As many of you have noticed, the feeds are off now. Will they be back on? I ; hope so. Soon? I'm not sure. What I will (and can) say is that the experience ; was very valuable for us....
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You are not still using sourceforge, are you? If you have any hopes that they ; are anything but yet another business giving away a free service, then see ; this: Selling Microsoft VisualStudio on the "open source development platform".
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Guy)
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems that my body runs on a 25-26 hour clock, usually tending closer to 26 ; hours. This really drives me nuts sometimes. Scheduling is a real pain in the ; ass at times. Like when I'm not even close to...
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/xent.gif ([X-Entertainment])]
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): People using the drug for just one night could be affected, researchers claim, ; but others experts are highly sceptical
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yesterday Viridiana came to my place and dragged me out to look at the sky. It ; was beautiful. Odd colors and light. Obviously we wondered what it was. Today ; Jim explains it. (It was a rocket test from the Vandenburg air force base).
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems like ATTWS will offer a service that'll tell you where your friends ; (or children or spouse or whatever) are ... I haven't seen it announced, but ; from their "Explanation of Rates and Charges. "Find Friends service will only
## Header (preview): From rssfeeds@jmason.org  Fri Sep 27 10:41:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rael is plagued by MSIE instability on Mac OS X. I use a recent nightly build ; of Chimera as my default browser. 0.4 has some issues with plugins (or with ; QuickTime anyway) on 10.2, but the 0.5 builds are working great. Fast too!
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Mark Newhouse_: CSS Design: Taming Lists[1]. &#8220;I'll demonstrate how to ; use CSS to bring unwieldy lists under control. It's time for you to tell lists ; how to behave, instead of letting them run wild on your web page.&#8221;
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Ivory Coast coup could involve rest of the region in a ; bloodbath.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy writes about people who ignore basic language rules I entirely agree ; with him. Writing "how r u 2day." is the best way to make me shift my attention ; and respect away from you really fast. Another pet peeve: I have only been
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It wasn't just the lack of wellies that made this protest different - it was ; the mix of the marchers, writes *Euan Ferguson*.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): PM rules out compromise on public service reform in hard-hitting pre-conference ; interview.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* She was vivacious, he was Mr Grey. Theirs was a love no one ; imagined.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:36:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest:* Sacked regulator accuses her of 'unbearable pressure'.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Media*: It only took one column in a newspaper by Rod Liddle, editor of ; radio's flagship new show, to put the BBC under pressure. Jamie Doward and ; Vanessa Thorpe report on unease within the corporation's top brass - and how
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Comment:* Prince Charles's attempts to meddle in politics show how detached he ; is from real life, says *Nick Cohen*.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you've been in Los Angeles for long enough to read this sentence, chances ; are you've spent more time stuck in traffic than you would care to consider. ; That annoying fact of Southern California life is only going to become more
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Oracle of Google can answer multiple choice questions amazingly well ... ; Who is the author of Perl?, What family lives next door to the Simpsons?. As ; the author points out on the about page; this thing would be really useful in a
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Football:* Kolo Toure was among the goals as Arsenal gave Leeds a good hiding ; at Elland Road.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Sep 30 13:37:18 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 0AE8516F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02048.146a986ae719349d6b6e4d5f9c0e38bd - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems like ATTWS will offer a service that'll tell you where your friends ; (or children or spouse or whatever) are ... I haven't seen it announced, but ; from their "Explanation of Rates and Charges. "Find Friends service will only
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Using one species to develop the eggs of another could in future help ; endangered species and even women
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rael is plagued by MSIE instability on Mac OS X. I use a recent nightly build ; of Chimera as my default browser. 0.4 has some issues with plugins (or with ; QuickTime anyway) on 10.2, but the 0.5 builds are working great. Fast too!
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You are not still using sourceforge, are you? If you have any hopes that they ; are anything but yet another business giving away a free service, then see ; this: Selling Microsoft VisualStudio on the "open source development platform".
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I am thinking about getting a new Mac. Not any good reason for it though. I'll ; try to wait it out for one of the new iBooks rumored for next spring. No new ; PowerBook next month if new models come out. No. I said no! Stop thinking about
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This Monkey Switch Ad is too funny. Huge smile on my face. :-) It was the ; winner of a competition MacRumors had set up. (Via Nathan)...
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yesterday Viridiana came to my place and dragged me out to look at the sky. It ; was beautiful. Odd colors and light. Obviously we wondered what it was. Today ; Jim explains it. (It was a rocket test from the Vandenburg air force base).
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:37:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Dan Rookwood* and *Lawrence Booth* on how Europe and the United States ended ; all-square to set up a tense final day.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Reborn[1].; ;
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anyone have a copy of Gill Sans or Bell Centennial I can borrow? I wonder if ; I'll ever have $250 to spend on fonts. *Update:* Kevin Marks[1], who is ; stupendously incredible for far more things than I can list here points out
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): After the talk at UT Austin, I spent Saturday at the Turkey City science ; fiction writers' workshop at Bruce Sterling's place. Turkey City is a venerable ; science fiction workshop that has spawned many good writers and a lexicon of
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:40 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've been in Austin all weekend. On Friday, I spoke at the University of Texas ; about EFF issues. Jon Lebkowsky was there -- hell, he organized it -- and he ; blogged the hell out of the talk:
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/electricball.jpg] Stefan sez: "My ; brother's friend Sue plays with high voltage. The linked-to page shows the ; gadget she used to photograph high voltage discharges in *water*." Link[1]
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): No retreat on PFI, unions are warned.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sinn Fein president accused of setting up IRA cell to kill 'informers'.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Arts:* Fourth art raid on philanthropist's home once targeted by the IRA and ; Dublin gangster Martin Cahill.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Struggling mutual insurance society admits to scale of mis-selling.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Professionals are asking amateurs to sign up and help them glean valuable ; information about planets orbiting distant stars
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Sep 30 13:43:55 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1C00916F16
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02067.4d2f2b0ae64c68570f08423ed43ce845 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* City and Wall Street are sceptical of plan to prevent more ; countries slipping into Argentina-style crisis
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:43:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This Monkey Switch Ad is too funny. Huge smile on my face. :-) It was the ; winner of a competition MacRumors had set up. (Via Nathan)...
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You are not still using sourceforge, are you? If you have any hopes that they ; are anything but yet another business giving away a free service, then see ; this: Selling Microsoft VisualStudio on the "open source development platform".
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Edwina Currie 'sad and indignant' at hearing John Major's admission ; of shame at their four-year affair.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yesterday Viridiana came to my place and dragged me out to look at the sky. It ; was beautiful. Odd colors and light. Obviously we wondered what it was. Today ; Jim explains it. (It was a rocket test from the Vandenburg air force base).
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy writes about people who ignore basic language rules I entirely agree ; with him. Writing "how r u 2day." is the best way to make me shift my attention ; and respect away from you really fast. Another pet peeve: I have only been
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Internet news:* Can Freeserve hold on to its position as the ISP that most ; Britons dial up to, asks Kate Bulkley.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I like Kasia's latest idea. Let's all try that. But not on the same day. Maybe ; we should all use our birthdays as the basis. Since I was born on June 4th, ; I'll be stupid on the 4th of every...
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Strangely, I managed to get up before 9am (on a Sunday!) without the aid of an ; alarm clock. Not sure how that happened. I had some breakfast (muffin with ; jelly and peanut butter, and strawberry drink) while catching up on...
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I am thinking about getting a new Mac. Not any good reason for it though. I'll ; try to wait it out for one of the new iBooks rumored for next spring. No new ; PowerBook next month if new models come out. No. I said no! Stop thinking about
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems like ATTWS will offer a service that'll tell you where your friends ; (or children or spouse or whatever) are ... I haven't seen it announced, but ; from their "Explanation of Rates and Charges. "Find Friends service will only
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I forgot to write this up yesterday and didn't feel like forging the blog entry ; date. Anyway, while taking a break from writing the book, I tried to finish up ; the work on friends.zawodny.com before I ship it off to...
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Israel pulled its tanks and soldiers out of Yasser Arafat's ; West Bank headquarters yesterday.
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you've been in Los Angeles for long enough to read this sentence, chances ; are you've spent more time stuck in traffic than you would care to consider. ; That annoying fact of Southern California life is only going to become more
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Oracle of Google can answer multiple choice questions amazingly well ... ; Who is the author of Perl?, What family lives next door to the Simpsons?. As ; the author points out on the about page; this thing would be really useful in a
## Header (preview): From rssfeeds@jmason.org  Mon Sep 30 13:44:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rael is plagued by MSIE instability on Mac OS X. I use a recent nightly build ; of Chimera as my default browser. 0.4 has some issues with plugins (or with ; QuickTime anyway) on 10.2, but the 0.5 builds are working great. Fast too!
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Dean Allen_: About the author[1]. &#8220;The funniest thing Dean has ever ; witnessed was some footage of narcoleptic dogs in a Nova documentary on sleep ; disorders.&#8221;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Heather Hamilton_: About[1]. &#8220;I am that girl.&#8221;; ;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Jason Gurley_: Rap Sheet[1]. &#8220;I once played drums in a band with no name ; that never played a single gig anywhere.&#8221;;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Tue Oct  1 10:36:26 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 66EFB16F1A
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02087.1d6e87f2e6e97b044d7c4955a1e394a1 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Kevin Fanning_: Hallmark vs. Successories[1]. &#8220;At Successories you were ; mostly left alone. There'd be brainstorm meetings to come up with new topics to ; tackle ("Howsabout 'Diligence'?" "No I think we did that one already, didn't
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dan Gillmor interviewed Jack Valenti[1] last week in his column and did the ; impartial thing, representing Valenti's beliefs as fairly as possible. This ; week, Dan takes Valenti's arguments apart, looking at what Hollywood's agenda
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Paul Ford_: East River Unconsecration[1]. &#8220;There are a lot of hearts ; under the East River, and it took a long time for it to find mine.&#8221;;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/salon.gif ([Salon])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Slashdot's reporting that according to the current ish of Popular Science, an ; Easter Egg has been discovered in the transmission control software for the BMW ; M3:
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/nandotimes.gif ([NandoTimes])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Treasury admits that growth targets set in March have been destroyed by the ; worsening global economy.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (TBO)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/local6.gif ([Local6])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Sydney dispatch:* An Afghan boy whose family was killed during massacres in ; Mazar-i-Sharif has been denied asylum in Australia, says *David Fickling*.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): After months of repairs to cracked fuel lines, the shuttle prepares for ; lift-off - an onboard video camera will relay live footage
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The antiviral drug significantly reduces the spread of the incurable infection ; through sex
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Iraq muddles US resolve with 'positive' talks in Vienna.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:40 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/aicn.gif ([AintItCoolNews])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Michael Portillo strode into the hostile territory of the Labour ; party conference in Blackpool last night to mock David Blunkett as an ; authoritarian rightwinger.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (St. Petersburg Times)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:44 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Julian Glover*, who worked on John Major's autobiography for two years, on why ; Edwina Currie wasn't in it.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/yahoonews.gif ([Yahoo])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/iol.gif ([IOL])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This Monkey Switch Ad is too funny. Huge smile on my face. :-) It was the ; winner of a competition MacRumors had set up. (Via Nathan)...
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some depraved farkette)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Margaret Berry_: Don't Be Rude: Part IV, Weddings[1]. &#8220;There's a lot of ; room for error with invitations. It's helpful to think of them as petite social ; landmines with quaint wax seals.&#8221;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (The Cincinnati Enquirer)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (charlotte.com)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/reuters.gif ([Reuters])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/smh.com.au.gif ([smh.com.au])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The modified form of vitamin D could be an effective new treatment for ; osteoporosis, says a US team
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anyone have a copy of Bell Centennial I can borrow? I wonder if I'll ever have ; $100 to spend on fonts. (Matthew Carter, I'd be happy to pay you the two cents ; in royalties you probably get for selling $100 worth of fonts.)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (ClickOnDetroit)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:36:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some TV Guy)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/sacbee.gif ([SacBee])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Arts:* The long-running dispute between the widow of Kurt Cobain and the ; remaining two members of his band Nirvana has been settled, paving the way for ; a new CD.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (abc.net.au)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Guy)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Farker's roommate)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Up to 70,000 former Equitable Life policyholders could be in line for ; compensation as a result of mis-selling of policies.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Local Library)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jeremy writes about people who ignore basic language rules I entirely agree ; with him. Writing "how r u 2day." is the best way to make me shift my attention ; and respect away from you really fast. Another pet peeve: I have only been
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Heather Hamilton_: Very Best of the World's Worst[1]. &#8220;After watching ; last night's premiere of "The Very Best of the World's Worst Drivers: 2" I ; tried to figure out what it was about these very best worst drivers that made
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/sun.gif ([The Sun])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Media:* The race is on for the most coveted job in BBC News after Rod Liddle ; says he is stepping down as editor of the Today programme.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/xent.gif ([X-Entertainment])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Guy)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yesterday Viridiana came to my place and dragged me out to look at the sky. It ; was beautiful. Odd colors and light. Obviously we wondered what it was. Today ; Jim explains it. (It was a rocket test from the Vandenburg air force base).
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Dalai Lama's envoy hails first contact in 20 years.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Watch out Yahoo Shopping and other shopping meta-sites. Google is at it again ; with Google Catalogs. The only question in mind mind is this: Will it hit big ; this Christmas shopping season or next year? Google Product Search and
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Standard Life finally capitulates and cuts payouts on millions of ; policies.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is an issue that comes up all the time at work. It is an issue for roughly ; four reasons: Yahoo is a FreeBSD shop Someone has heard that MySQL runs better ; on Linux Someone knows that we run some...
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Philly.com)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I am thinking about getting a new Mac. Not any good reason for it though. I'll ; try to wait it out for one of the new iBooks rumored for next spring. No new ; PowerBook next month if new models come out. No. I said no! Stop thinking about
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Tue Oct  1 10:37:20 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 4C34916F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02140.ccabcb71ece6c0835518e4c7900ef94b - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Disney has named a new president of Walt Disney Parks, replacing Paul Pressler, ; the exec who did his damnedest to ruin Disneyland, slashing spending (at the ; expense of safety and employee satisfaction), building the craptastical
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (orange-today.co)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (canada.com)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (charlotte.com)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Dysfunctional Woman)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Doc Brown)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Comment:* The suppression of debate shows Labour's leadership at its worst, ; writes *Jonathan Freedland*.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Night-clubbers who swapped their glasses for contact lenses report big ; increases in physical contact with the opposite sex
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Campaigners say this and other mega-projects renege on promises made by African ; leaders at the World Summit in Johannesburg
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/sun.gif ([The Sun])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): An article titled Mac poses as much of challenge to Linux as to Windows is both ; insightful and missing the point. The general thrust of the article, is ; dead-on. It's just the sort of stuff I've been saying to folks...
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Aaron Warchalker will probably be on Public Radio's Marketplace tomorrow ; evening. I tried to cut down on the number of "you know"s but I didn't do too ; well. :-( I'll keep trying.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): You are not still using sourceforge, are you? If you have any hopes that they ; are anything but yet another business giving away a free service, then see ; this: Selling Microsoft VisualStudio on the "open source development platform".
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/yahoonews.gif ([Yahoo])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Poynter.org)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/mdn.gif ([MDN])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some guy with lice)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (DPO)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (Some Game Boy)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you've been in Los Angeles for long enough to read this sentence, chances ; are you've spent more time stuck in traffic than you would care to consider. ; That annoying fact of Southern California life is only going to become more
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (canada.com)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest:* Potters Bar claimants' group investigates reason for accident as ; it dismisses Railtrack's compensation offer.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Oracle of Google can answer multiple choice questions amazingly well ... ; Who is the author of Perl?, What family lives next door to the Simpsons?. As ; the author points out on the about page; this thing would be really useful in a
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:37:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (dayton daily news)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:38:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rael is plagued by MSIE instability on Mac OS X. I use a recent nightly build ; of Chimera as my default browser. 0.4 has some issues with plugins (or with ; QuickTime anyway) on 10.2, but the 0.5 builds are working great. Fast too!
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:38:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/ncbuy.gif ([NCBuy])]
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:38:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It seems like ATTWS will offer a service that'll tell you where your friends ; (or children or spouse or whatever) are ... I haven't seen it announced, but ; from their "Explanation of Rates and Charges. "Find Friends service will only
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:38:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): (katu)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  1 10:38:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.newsisfree.com/Images/fark/homestar.gif ([Homestar Runner])]
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): One year ago today, my (now former) manager told me to shut down my weblog and ; remove all traces of it from my server. He tried to convince me that the ; Internet was too small to mix the professional[1] and the personal[2].
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): New York Times as a Weblog[1] (source code[2]) Comments appreciated. Yes, I ; know UserLand had something like this[3] but as you can see it doesn't seem to ; be working anymore.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Joint Hearing of the Senate Committee and Senate Select Committee on the ; Entertainment Industry is underway in LA, investigating artists' claims that ; the labels engage in unfair and corrupt business-practices. The first day's
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:44 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The US has rejected an agreement between Iraq and the United Nations on arms ; inspections, vowing to block the inspectors' return unless they are backed with ; threats of military force.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Live online:* The Observer's *Tracy McVeigh* and experts *Tim Brighouse* and *; Ann Hodgson* will be here on Thursday at 3pm to discuss the government's ; record. Post your questions now.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thanks to an anonymous helper, I've mirrored all 5 ISO images for Red Hat 8.0. ; Ohio - http://family.zawodny.com/~jzawodn/iso/rh80/ (DS-3 connection via ; Sprint) California - http://litterbox.zawodny.com/~jzawodn/iso/rh80/ (multiple
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:49 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* For the Labour leader in trouble there are usually two ways out. ; Faced with a restless party, you can either cave in or stand firm, writes *; Jonathan Freedland*.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hundreds of US transfusion patients are set to receive red blood cells cleaned ; with compounds that inactivate viruses and bacteria
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Leading Republicans side with the Democrats over the ; president's war powers.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wow. Check out Western Digital's Drivezilla. They've announced 200GB hard ; disks. Something tells me that I'll have my own terabyte by the end of 2003....
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:43:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The new network aims to thwart hackers and beat technical problems that make ; such networks slow or unreliable
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A new internet worm marks a worrying crossover between virus writing and ; hacking, say experts
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The French and the iPod aren't getting along -- the iPod outputs more decibels ; through its headphones than are legal in La Belle France. Link[1] Discuss[2] (_; Thanks, Ernie[3]!_)
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): David Pogue is talking about Mac in the past, present, and future. Mac market ; is growing. It's a small part of a very large and growing pie. So Apple isn't ; dead and won't die. But they'll never be the big...
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Eli the Bearded sez: ; ;     Ever wanted to see an international agreement? There are an awful lot of
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Talk:* Join the discussion on the web's liveliest talkboards.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The T-Mobile Sidekick -- the first commercial implementation of the wonderful ; Danger Hiptop PDA/phone -- is now onsale and the reviews are starting to ; appear. As soon as I'm in San Francisco for more than a couple days straight, I
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Time to transform post-war 'one size fits all' public services, urges PM.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The reaction that forms the potential carcinogen acrylamide in baked foods is ; revealed, suggesting ways of reducing levels
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Wed Oct  2 11:44:31 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 50B4B16F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02189.87c2e44a35ec0e62b20783d9a29d5c5e - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): testified that they have NEVER received a royalty check" So much for "we're ; just trying to protect the artists", eh? ;
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I had to leave the conference after the first half of the day so that I can get ; some stuff done at work and some work on the book. David Pogue's keynote was ; excellent. He knows the Mac, Apple history,...
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The Distributed.net project -- a precursor to SETI@Home that used volunteer ; computer-time to attack giant, sophisticated ciphers -- has cracked RC564. I ; used to have half a dozen computers working on this.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Kevin "Free Kevin" Mitnick and Steve "Woz" Wozniak co-hosted an episode of The ; Screen Saver on Tech TV, where Woz autographed one of the laptops that Kevin ; got arrested for using. Now that machine, signed by both net-celebs, is up for
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Britain's biggest building society has signalled it expects no let-up ; in the runaway property boom.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mena sez: "We've set up a TrackBack ping repository for attendees of O'Reilly's ; Mac OS X Conference. If you're using Movable Type or a TrackBack-enabled tool, ; you can ping the category relating to your OSXCon-specific weblog post." Link
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hypocrites in the recording industry have been screaming about people stealing ; music. All the while, they've been robbing CD buyers. ;
## Header (preview): From rssfeeds@jmason.org  Wed Oct  2 11:44:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The legendary Clarion Writers' Workshop -- of which I am an alumnus, class of ; '92 -- has spun out another satellite branch (Clarion West, in Seattle, has ; been going for some years now). The new workshop, Clarion South, will be held
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Remember that saying from chaos theory about how when a butterfly flap its ; wings, it can cause a hurricane a month later halfway around the world? As ; several people have already noted, Google has made some major changes in their
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Heather Hamilton_: Hypochondriac[1]. &#8220;It is because of my dog that I ; have been smitten with an Ovarian Cyst&reg;; it is because of my dog that my ; husband can't breathe with phlegm-free lungs. I can safely blame the dog for
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Interview with cartoonist Ted Rall, who has traveled to South Asia recently, ; and has tips on how to deal with bribe-hungry border guards and the like: ;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rendering polygons is not as easy as it used to be, the reason being the vast ; amount of different rendering techniques, methods and algorithms available. Not ; only is choosing the right ones a problem, even worse, all that are selected
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): NYT op-ed piece about this newfangled OS called Linux and how it is developed ; using something called the "open source" method. This is the paper to go to for ; breaking news, folks. Link[1] Discuss[2] _(Thanks, Dave!)_
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Keys encoded in photons of light are sent 23 kilometres through air, an ; important step towards a secure global communications system
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): All through October, Berkeley's Mathematical Sciences Research Institute is ; hosting Cinemath, a mathematics film festival: ;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* The ethnic Greek and Turkish leaders of Cyprus will hold ; crucial talks today in an effort to reunite the island.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Federal prosecutors in the US have filed charges against the ; highest ranking Enron executive yet.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I realized something the other day. I've been programming in Perl for roughly ; seven or eight years now. Maybe nine. It's hard to remember for sure. But at ; some point it lost its shine. It used to be a lot...
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dismuke has a 24 hour radio station and RealAudio archive of '20s and '30s ; music. Some nice stuff in here. (Also check out my favorite music archive, Red ; Hot Jazz[1].) Link[2] Discuss[3]
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rob "Pringles Can" Flickenger and others at the O'Reilly OS X con have tracked ; down the cause of the annoying flakiness in the wireless network here -- every ; 20 or 30 seconds, you start getting "connection refused" messages from your
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Leslie Harpold_: This Too, Shall Pass[1]. &#8220;There's a rumor that my ; possessions and I will be reunited in about a week.&#8221;;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Ian Hickson_: My faceless enemy has been defeated[1]. &#8220;My arch nemesis ; over the last couple of weeks has been the very poorly documented Hebrew ; Traditional Numbering System.&#8221;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/hiptopblog.jpg] The T-Mobile Sidekick and ; other instances of the Danger Hiptop PDA/Phone are being promoted as mobile ; blogging tools. Link[1] Discuss[2] (_via Hack the Planet[3]_)
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I think I'm going to become one of _those_ people. You know, one of those ; people who has a &#8220;Semantic Web&#8221; category on their weblog. This will ; be a Geek Purity Test question someday. Onward:
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dan Gillmor's column this week is all about Apple's burgeoning resistance to ; the Hollywood onslaught on general-purpose computing: ;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Rio dispatch: *18,880 candidates standing in the Brazilian elections get a ; party political broadcast each, says *Alex Bellos*.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Airlines are facing fresh calls to fit fuel tank inerting systems, following ; warnings from Boeing about potentially faulty fuel pumps
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Contrary to popular belief, a new study shows women receive the same mental ; health boost from marriage as men
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Thu Oct  3 12:24:45 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 2E44216F72
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02218.f615f1b7360b9a22a0c9387f285a5af0 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bill Clinton and a tale of two Tonys. *Howard Jacobson* on his first Labour ; party conference.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >>From Ed Felten's "Freedom to Tinker" site, regarding the TinkleToonz Musical ; Potty.: ;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Bill Clinton uses his Labour conference speech to urge George Bush to persevere ; with the UN.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The business news of the day has long been telling us that we're in a very slow ; economic period. Yet I've received multiple job solicitations recently. Not ; random head-hunters or anything. People I know, who know me relatively well,
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Thank you[1]. I needed that. We now return you to your regularly scheduled ; programming.;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Talking about his mainframe background and roots in computing. He played a lot ; on the big iron and sorta "missed" the PC revolution. He wasn't terribly ; interested in PCs for quite a while. Then he got to play with one...
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): As noted in the inluminent weblog there don't seem to be many bloggers at ; OSXCon. At least they're not blogging. That's rather disappointing. They were ; strong at OSCON and the Emerging Technologies Conference (damn, I wish I had
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): And so many North Sea harbour seals have been killed that a repeat outbreak in ; the 2003 breeding season is highly unlikely
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:24:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Ex-lover tours studios to denounce former PM.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Last week, I noticed that I was on Dave's radar. Now that I've caught up on ; blogging, it seems that I'm on Windley's radar too. He picked up on my ; FreeBSD/Linux MySQL story and that provoked an interesting discussion of...
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Which was the better UI? Mac OS 9? Mac OS X? Windows? Nobody can agree. Tim ; O'Reilly didn't like Mac OS 9. He gets OS X. Traditional Mac users are a bit ; annoyed by OS X. They think it's a...
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I've been snowed under for the last four weeks, working on the FogBUGZ 3.0 ; Setup program. ;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Washington has revealed its intention to use UN weapons inspections as a ; possible first step towards a military occupation of Iraq.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Here's a brief interview with me.  ; ;     *Interviewer:* If the Boing Boing zine and blog were TV characters, who'd
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Java has been successful everywhere but the desktop. Or at least that's what ; people here. It's big on the server and that downs out the desktop news. What ; else went wrong? Applets. Microsoft's battle with Java. For the longest
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mark and I were two of many wonderful contributors to a new book from TechTV, ; called "The Catalog of Tomorrow." It's like a Whole Earth Catalog for ; futuristic technologies, with great illustrated spreads throughout -- you can
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The launch is postponed until at least Monday - the first time bad weather in ; Houston has delayed a shuttle flight
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Thu Oct  3 12:25:18 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 46C5F16F49
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02236.46b510d2f030ddaa7bcc52ef26535bae - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest:* The government should immediately announce that Britain will ; abandon nuclear weapons when the Trident missile system is phased out, say a ; group of eminent scientists.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Phil Ringnalda_, in an unrelated discussion about RSS namespaces[1]: ; &#8220;Looks like [yet another person] decided to switch to NetNewsWire Lite. ; Does it come with crack, or what?&#8221;
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This talk is not supposed to be technical or marketing, but more of a ramble. ; We'll see. :-) "Living above the Curve" BB is a strange company, as they've ; been Mac-only are have been in business for over 10 years....
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Live online:* The Observer's *Tracy McVeigh* and experts *Tim Brighouse* and *; Ann Hodgson* will be here on Thursday at 3pm to discuss the government's ; record. Post your questions now.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Education:* The scale of this year's A-level crisis is even worse than ; expected, the inquiry into claims of "grade fixing" has revealed.
## Header (preview): From rssfeeds@jmason.org  Thu Oct  3 12:25:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): First Blood is Spilled at Record Industry Hearings[1]. &#8220;In a shocking ; statement made by Back Street Boy, Kevin Richardson, he testified that they ; have NEVER received a royalty check, and that they only took a large advance
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So I was researching the history of the tilde, because D told me that her ; company just installed a new web proxy that denies access to any URL with a ; tilde in it. Presumably because the presence of a tilde indicates with
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): - _Phil Ringnalda_: Hey Radio, this PRE's for you[1]. &#8220;You did update ; Radio.root after yesterday's fix for the double-decoding bug in the aggregator, ; didn't you?&#8221;
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): So, d'ya remember that whole CSS debate that flared up about six months ago? ; (Actually, it flares up continuously in various circles. In fact, I think it's ; about time for it to flare up again in weblogging circles. These things are
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Jeffrey Zeldman_: Party like it's 1997[1]. &#8220;Microsoft has redesigned. ; Its new layout uses font tags and other deprecated junk straight out of the ; mid-1990s. ... When a W3C member company that helped create XHTML and CSS
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: ; http://i.cnn.net/cnn/2002/US/Central/10/02/candidate.blue.skin.ap/story.blue.canidate.ap.jpg; ]In 1999, Montana's 63-old Libertarian candidate for Senator starting drinking
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Executive pay has once again outpaced average earnings, climbing an average of ; 17% last year.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A new census of the world's robot population reveals disturbing negative robot ; population growth, but still, our fleshless offspring's numbers point to a ; machinery future:
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:01:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The President's niece will no longer have to forge prescriptions for Valium. ; All she'll have to do is participate in an unruly public demonstration to get a ; free dose. Unfortunately for her, the government has no plans to shoot rocks of
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Shipments of low-cost drugs being intercepted and sold at vast profits.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A San Francisco cabbie -- generally a well-educated and firm-opinion-holding ; class of person -- has an essay about a subject near and dear to my ; (non-car-owning) heart: Why is it so damned hard to get a cab in San Francisco?
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* The US and Britain yesterday told the chief UN weapons ; inspector not to resume inspections in Iraq until new guidelines were passed.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The defective yeti isn't fond of Culture Jam. I read it a year or so ago and ; joined Adbusters as a result. I liked the book, but more importantly, I liked ; the message. It resonated with me. A lot. Yes,...
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Congressional report offers damaging summary of bank's dotcom boom ; years.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Is it just me, or is RSS really, really close to critical mass. You, know the ; kind where you read article in The Wall Street Journal about it. Well, Dave ; notes that "I just learned that RSS is being taught...
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Arts:* Kevin McKenzie last night emerged as the frontrunner to take over at ; the scandal-hit Royal Ballet.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rob "Pringles Can" Flickenger and others Cliff Skolnik at the O'Reilly OS X con ; has tracked down the cause of the annoying flakiness in the wireless network ; here -- every 20 or 30 seconds, you start getting "connection refused" messages
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Media:* BBC and Sky-backed service will be launched at the end of this month ; with 30 free channels.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Tony Blair has distanced himself from a minister accused of ; meddling in an election for the leadership of the Labour party's biggest trade ; union affiliate.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A French trial of a highly promising treatment for the fatal "bubble boy" ; disease is stopped after a patient developed leukaemia
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Education:* 'Small' A-level problem to be dealt with but no change on student ; grants or charitable status of public schools.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A material that turns into a conductor at the flash of a light promises to ; reduce the cost of large LCD displays and optical data storage
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A year-long search received more than 40,000 entries from over 70 countries, ; and two million ratings - the analysis is now complete
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Paris dispatch:* A growing number of French people are questioning the medical ; ruling - and the law - that enabled a Vichy war criminal to walk free, writes *; Jon Henley*.
## Header (preview): From rssfeeds@jmason.org  Fri Oct  4 11:02:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Drugs designed to prevent the complications of diabetes may work by slowing ; accelerated ageing - future versions may delay symptoms of ageing in everyone
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Doom has been ported to the Nokia 7650 handset! Link[1] Discuss[2] (_via Ben ; Hammersley.com[3]_);
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The WSJ has published a round-up of phone companies, wired and wireless, ; ranking them based on performance and price. They don't mention Nextel, whose ; hullking milspec i700 handset I've been carrying for years now, with incredible
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The ancient remains of 200 fishermen who were tied up and stabbed through the ; heart have been excavated from a beach
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): WorldCom, the world's biggest internet traffic carrier, suffers a major outage ; which affects millions of users
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/timmyerrorsmall.jpg] Check out this weird ; easter-egg I found in MacOS 10.2.1's Sharing control panel! Link[1] Discuss[2];
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Society:* Law lords to hear challenge to bill giving big money an even bigger ; say.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Government increases secondments from energy, arms and construction ; industries, but tries to keep it dark.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sat Oct  5 10:37:27 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 6276516F1F
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02274.d25fe5d3adc798112cd281bd89d642db - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Viral antibodies are identified in a one-month-old baby, as the US death toll ; rises sharply
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A detector from an asteroid-chasing NASA probe will soon be helping detectives ; to solve gun crimes and murder cases
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Research on scrotal asymmetry and the surface area of elephants were among ; other recipients of the 2002 spoof awards
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sat Oct  5 10:37:28 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 9AA3E16F7D
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02278.5681f9fd02e38391b917d4623ff9d198 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Brussels dispatch:* Calls for an inquiry into Belgium's complicated wartime ; past are gathering pace, writes *Andrew Osborn*.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Great Village Voice story about oddball museums in New York. My favorite ; weird-ass museum is the Museo de Criminologia in San Jose, Costa Rica, which ; has bits of victims of famous crimes (machete-dented brain-pans, severed arms,
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A collision is seen from start to finish for the first time - it may provide ; clues to how the Universe's largest single objects are formed
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Humiliating rebuff for Blair initiative comes only days after plan was ; announced at the Labour conference.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Neil "Sandman" Gaiman has won his lawsuit against Todd "Spawn" McFarlane, ; vindicated in his assertion that McFarlane breached his contracts, stole his ; characters, and used his name.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Briton Richard Reid pleads guilty to attempting to blow up flight.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Anil Dash discovers that the T-Mobile Sidekick's web-browser is pretty ; arbitrary in which pages it will load and which pages it will throw up its ; hands at:
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 10:37:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SixDegress is a $99 OS X app that data-mines your own hard-drive and tries to ; build links between people, files and folders. Laura Carpenter at the OS X con ; was talking it up yesterday and it looks way cool -- I've just downloaded the
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sat Oct  5 10:37:38 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 9F87B16F87
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02287.05088931220174dcef44fd30efb3616d - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 12:37:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/tsquarebw.jpg]; Wonderful gallery of historical advertising and postcard photos of Times Square ; at Lileks's site. Stefan urges us to "have some mercy on his bandwidth budget
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 12:37:56 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Hardliners battle for control of divided parliaments and ; presidency.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sat Oct  5 12:37:57 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 2010316F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02290.63a40c780fe1f8e771f62473dc3dce0b - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 12:37:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Football:* Arsenal midfielder believes the Premiership champions have the ; ablility to become the world's best.
## Header (preview): From rssfeeds@jmason.org  Sat Oct  5 12:37:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Sport: *BBC Panorama programme, The Corruption of Racing, reveals little that ; is new, writes *Greg Wood*.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sun Oct  6 22:54:30 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id E5CAD16F72
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02293.2ae2c667486323afb16d109b406b8783 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *The Observer Profile: *Brazil goes to the polls today, and all the indications ; are that its 110 million voters will elect a man who once sold peanuts on the ; street: *Luis 'Lula' da Silva*.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I guess it's time to reveal the incredibly kind invitation I received[1]. As ; many of you may have found out or guessed, I will be attending oral argument ; for the Eldred case[2] before the Supreme Court.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Net news:* A devastating new computer virus is causing havoc around the world ; as it crashes computers, distributes confidential e-mails and steals credit ; card details.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:37 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The popularity of garage or car-boot sales could be behind a recent worldwide ; resurgence of the nuisance bugs, says a UK scientist
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/bluelady.jpg] Stan Jones isn't the only ; person to have turned himself blue with quack silver remedies. "Rosemary" took ; silver supplements in the 50s for her allergies and put up this site in 1998 to
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Michael McKevitt, the founder of the Real IRA, is likely to serve less than two ; more years in jail in a deal to cover up MI5's role in Ireland.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/curlinggame.jpg] An Alberta teenager has ; hit the bigtime with a curling videogame. Friends of mine who curl assure me ; that curling is way fun to play (it certainly isn't that fun to watch!) and, of
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Sun Oct  6 22:54:42 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 7A5BD16F19
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02301.a12a68c684b8c32e4f93cf6628e9eb5c - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:44 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Glenn Fleishman's written an open letter to the Infoworld writer who published ; an hysterical ambivalent article[1] about warchalking: ;
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest: *Osama bin Laden is alive and regularly meeting Mullah Omar, the ; fugitive leader of the Taliban, according to a telephone call intercepted by ; American spy satellites.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/actlab.jpg] Jon Lebkowsky has posted a ; little gallery of pictures from my EFF-Austin talk at ACTLab at the University ; of Texas (and a couple shots from the kick-ass BBQ we ate beforehand, note the
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business: *Stockbrokers around the world are braced for a potentially ; calamitous week as alarm mounts over a looming, Thirties-style global financial ; crisis.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:49 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Football: *David Seaman to carry on as England goalkeeper when their European ; Championship qualifying programme begins in Slovakia on Saturday.
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Ian Hickson_: #include web-log.txt[1]. &#8220;I used some of Perl's niftier ; features, such as using method lookup instead of a switch statement for the ; preprocessing instruction dispatching, and exceptions instead of passing error
## Header (preview): From rssfeeds@jmason.org  Sun Oct  6 22:54:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Modern Living is a series of about 100 tiny Flash animations that use ; recursions, gloomy music and simple interactivity to make inarticulate yet ; compelling existentialist morality plays. This stuff is like Philip K Dick
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:04:59 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Law.com_: Suit Over Airlines' Web Sites Tests Bounds of ADA[1]. [via Slashdot: ; Blind User Sues Southwest Over Web Site, Cites ADA[2]] ;
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Slashdot_: Digital Camera Quality Passing Film?[1] We just hired a ; photographer for our wedding yesterday, Light Touch Imagery[2]. They offer ; competitive prices; they can design the type of albums we want (with some
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Michael Barrish_: Home[1]. &#8220;Had I been given a choice in the matter, I ; would have preferred a name that made people think of things I considered more ; central to my identity, like &#8220;artist&#8221; or &#8220;intellectual&#8221;
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Michael Barrish_: Poem[1]. &#8220;Here are the 15 most popular Oblivio search ; strings since October 1. I consider it a poem.&#8221;;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:05 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B648E16F70
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02313.792888aeb3a4fdd1adcbbb094959714c - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Scripting languages allow rapid development of game behavior without the ; pitfalls that await the unwary C++ programmer. Using an existing scripting ; language saves the time and cost of developing a custom language, and typically
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Armed with a cult film licence and the knowledge that The Italian Job already ; had a huge fan base in the UK, Pixelogic set out to make a game that would not ; only do the film justice but would also be a game worth playing.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The killer T cells of HIV patients who stay healthy for years replicate ; unusually rapidly, researchers discover - better treatments may result
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): As game developers reach for new forms of gameplay and a better process for ; implementing established genres, the wisdom of licensing physics engines is ; becoming inescapable. Physics engines do more than just knock over boxes,
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Plastic discs designed to sit inside food packaging and change colour when the ; contents go off could provide warnings to consumers
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Arts:* Medieval religious images salvaged from the destruction wrought during ; the reign of Henry VIII reign and the civil war go on show in Leeds.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:12 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id F352416F75
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02320.9d983e803c0325063c06097d7bb4b3f1 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:13 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): We in the game industry know what we mean when we say that a game is ; "addictive." We think that quality in a game is a good thing: people like it, ; they keep coming back to it, and they want to play it more and more. I agree
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In the second of our series from the GDC Europe, we talk with Microsoft's Bill ; Fulton about usability testing for games, SCEE's Zeno Colaco about pitching ; publishers, and Harvey Smith of Ion Storm about emergent game design.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:18 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id C9D3716F22
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02323.dbe22daff2cf3e9c7aa284ec961481c4 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Pro football players are addicted to football games, as a means of ; wish-fulfillment -- by "managing" the team, they can be free of the rule of ; their coaches and bosses. Maybe this explains the amazing success of The Sims,
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:19 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In our final round-up from the GDC Europe 2002, we review the confernece ; sessions and the ECTS expo, noting the spiraling increase in game complexity.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In 1986, we in the U.S. were playing the Nintendo Entertainment System (known ; as the Famicom in Japan), and roughly a third of the music for its first set of ; games was written by Hirokazu "Hip" Tanaka, then with Nintendo Co. Ltd.He has
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:23 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): In the first of a two-part series of interviews from the GDC Europe, we talk ; with Mark Cerny about game preproduction, Jonty Barnes about camera control, ; and Jason Kingsley about ratings and censorship.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:20 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This feature, excerpted from Wolfgang Engel's ShaderX book from Wordware ; Publishing, presents a simple shader trick that performs a good per pixel ; approximation of a non-integer power function. The technique works for input
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest: *Blunkett and Straw accused of trying to intimidate judge as ; Shayler case starts today at Old Bailey.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ubi China had always wanted to make a PC game for the local market, but a ; number to factors kept the idea on hold. In January 2001, the right incentive ; to motivate Ubi China to try a local project finally arrived: the license for
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:28 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Disney's themepark business is in deep trouble in the post-9/11 world. A war ; with Iraq could really kill 'em: ;
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Troy Paradise is a versatile and creative artist with over seven years of ; experience in the videogames industry, working as a freelance lead artist and ; college art instructor.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:25 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 0B64716F7B
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02333.2a59c82074b44c35e79462984c8f8d9d - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Rendering polygons is not as easy as it used to be, the reason being the vast ; amount of different rendering techniques, methods and algorithms available. Not ; only is choosing the right ones a problem, even worse, all that are selected
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): With project budgets in the multiple millions of dollars and virtually no ; margin for error, more and more development teams are under tremendous pressure ; to come out on top of the entertainment software market's cutthroat
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): For those new to the product, Virtools is a production environment (such as ; Director) designed to allow the rapid creation of 3D-interactive ; applications.The second version of Virtools clearly builds upon previous
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Max Payne. Elite Force. Theif. Ico. Deux Ex. Oddworld. Medal of Honor. Baldur's ; Gate. The more recent Final Fantasy games. More and more developers are pushing ; the game design envelope, forging new entertainment experiences and art forms
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ted Rall: My Government Went to Afghanistan and All I Got Was This Stupid ; Pipeline[1] ;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:37 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id D12A616F1F
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02339.6a217c7473a881cc0d68a2c1617722e4 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:37 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1EF0B16F84
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02340.de68a83f900418f6cde87bdf92801f73 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Iain Duncan Smith will this week gamble his political future on a return to the ; Thatcher revolution of the 80s.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): French ship burns off Yemen.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Abbey National has received a takeover approach from Bank of ; Ireland which could flush out other bidders.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): 36 million pheasants now reared for Britain's fastest growing 'sport'.
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Mon Oct  7 12:05:44 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 333CA16F89
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02345.52eedf6f431a61908c62a4d561e655fe - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Football:* Ugo Ehiogu will stand in for Rio Ferdinand following his sudden and ; unexpected withdrawal from the England squad.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Pensions experts say tax lures should be used to raise retirement age.
## Header (preview): From rssfeeds@jmason.org  Mon Oct  7 12:05:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics:* Stormont near collapse as Sinn Fein protests at allegations.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): DeCSS detractors have repeatedly claimed that DeCSS needs to be stopped because ; it makes perfect digital copies of DVDs possible. Recently, in private email, ; Ernest Miller claimed that doing so would be a violation of the DMCA. In this
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Here's a how-to explaining how to blind a surveillance camera a laser-pointer. ; Link[1] Discuss[2] (_Thanks, Mike[3]!_);
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:35 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): NTT DoCoMo have released a paper on the use of human flesh as a networking ; medium: ;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I spoke at the Mac OS X conference in Santa Clara last week. It was a really ; fun event, and it was great meeting a lot of people whom I previously knew only ; through email, like Rael Dornfest, Danny O'Brien, and Glenn Fleishman. Here's
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:33 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Joe Gregorio_: My next pet project[1]. &#8220;Trying to re-create the "Good ; Easy[2]" on a Windows machine.&#8221; I have also made half-hearted attempts in ; this direction, as I am forced to use Windows during the day. I say
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Tue Oct  8 10:55:38 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 837A716F03
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02354.3be731874b373f98e66b3254f75a30b6 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Last Friday's Christie's auction of original physics manuscripts included ; original works by Einstein, Curie, Newton and other physics rock-stars. The ; Einstein (which included an early attempt to prove relativity) went to an
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This time around, we have _two, two, two_ Guestbloggers for the price of one. ; Quinn Norton and Danny O'Brien have agreed to fill the sidebar slot for a ; little while. Danny and Quinn and their rommie Gilbert are just about the most
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Gun violence in America: *A 13-year-old boy was shot in the chest and ; critically wounded outside of his school in Maryland becoming the latest victim ; of a sniper who has already killed six people.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SweatyFrog is a toy-review magazine/store, focusing on collectible toys with ; great, MegoSteve[1]-style erudite toy-otaku commentary. Toy_Design_Guru, who ; suggested the link, recommends their occassional email newsletter as a
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): If you like to live on the bleeding edge and play with code that's not yet ; ready for prime-time, good news! You can now get the MySQL 4.1 source tree. The ; only real difference from the 3.23 and 4.0 trees...
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tony Blair to hold crisis summit with Ulster Unionist leader David Trimble in ; Downing Street today.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Arts and Letters Daily, a wonderful and dense blog, has folded up its tent due ; to the bankruptcy of its parent company. A&L Daily will be auctioned off by the ; receivers. Link[1] Discuss[2] (_Thanks, Misha!_)
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Delphi Questions[1], a new _Joel on Software_ discussion group.; ;
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Simon Hattenstone* meets comedian Lee Evans.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At the OS X conference, Cory told me about a book called "The Life and Death of ; the Great American Cities," by Jane Jacobs. This Metropolis Magazine comic ; strip, by Ben Katchor, seems to resonate with what Cory told me about the book
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:06 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest: *Support for military action against Iraq among British voters has ; fallen to 32%, the lowest level recorded while the Guardian/ICM survey has been ; running.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Feature: *She has loved clothes with a passion all her life. And yet acclaimed ; author *Linda Grant* has never been to the collections - until now. So what ; does she make of the Paris shows?
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:08 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): For the past week, I've been waiting for one of my FreeBSD servers to reproduce ; a problem we've been seeing with MySQL + LinuxThreads. This particular machine ; is running a custom build of MySQL 4.0.4 (or MySQL 404, as I...
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Politics: *The Conservative leadership yesterday launched itself into a frenzy ; of self-reproach as it struggled to shed the image of Britain's "nasty party".
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The latest "Red List" adds 124 to the 11,000 endangered species around the ; globe - but also includes a stick insect revival
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Feorag writes from Scotland: "You probably haven't heard of John Otway, but he ; has a small and devoted following here. He did a limited issue CD and asked his ; fans to vote on which track _they'd_ like to see as a single. The one they
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:55:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ... for not updating: I'm doing the guestblog at Boing Boing[1]. Now to find an ; excuse for missing last week.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Tue Oct  8 10:55:48 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 180F216F16
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02372.ba6a7288c11b60bd92e3245c76652846 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Medicine and health: *The discovery of the myriad little deaths which lead to ; life brought the most coveted prize in world medicine to two Britons and an ; American yesterday.
## Header (preview): From rssfeeds@jmason.org  Tue Oct  8 10:56:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business: *The long-awaited recovery in Britain's manufacturing sector ground ; to a halt in August, despite a sharp rise in car production, official figures ; showed yesterday.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Microsoft Knowledge Base Article Q172668: Barney Fun on Imagination Island ; Error Message: Barney Not Found[1]. Microsoft ActiMates Interactive Barney may ; conflict with a wide range of radio-operated electronic devices, including
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:36 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Movable Type 2.5 is out. I'm running it and it appears to work. It incorporates ; many suggestions from Dive Into Accessibility[1], a book which was written in ; and is still powered by Movable Type. I find this amusing in a self-referential
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:38 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): === Scissors === ; ; I, like most other people here, went through the security checkpoint. Unlike
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _Clay Shirky_: In Praise of Evolvable Systems[1]. This entire article could be ; rewritten to explain RSS. In fact, let's do that. ;
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:39 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yet another Lego obsessive has built a working Lego harpsichord. Tons of points ; for style, but damn, it sounds like hell. Link[1] Discuss[2] (_Thanks, Tim[3]!_; )
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Teresa's written a wonderful blog post about the revelation that Tyco's crooked ; CEO spent "6,000 on a shower curtain, $15,000 for an umbrella stand, $2,900 on ; coat hangers, $5,960 on bedsheets and $2,200 for a wastebasket."
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:41 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.konaweb.com/stick/left.jpg] I often carry my ukulele with me ; on planes. The case is so little it can fit in my suit case. I missed a great ; photo opportunity when I was in the airport a couple of weeks ago, and saw
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:42 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Media:* Move could lead to Rupert Murdoch's News Corporation being outvoted on ; major board decisions.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:43 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Brown blocks plans for new secure training centres for teenage offenders.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:45 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *UK latest:* Met blocks Brian Paddick returning to his job as commander of ; Lambeth by appointing him to another post.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:46 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://boingboing.net/Images/luckystack1.jpg]Tim Biskup is an artist who ; does a lot of work for animation studios. His work is inspired by one of my ; favorite illustrators, Jim Flora. Tim's selling a deck of poker cards, each
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:48 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.craphound.com/images/escherlego.jpg] Lego enthusiasts have ; implemented three of Escher's optical illusion paintings (including "Ascending ; and Descending," pictured here), using Lego! Link[1] Discuss[2] (_via MeFi[3]_)
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:47 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Football:* It's a safe bet that Kurt Cobain hated sports. And when you look at ; the England football team, it's difficult not to agree with him, writes *Steven ; Wells*.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:50 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Illness and City's mailing of sports empire share are blamed for ; death.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:51 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): PM calls for major arms deal to save Stormont.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:52 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The US Military is planning on equipping Gulf troops with two-way translators: ; Palm-sized devices with speech-recognition and automated translation. Tried ; speech-to-text lately? How about Babelfish? Boy, is this technology ever gonna
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:53 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): At 155 metres, Anish Kapoor's sculpture is one of the world's largest.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:54 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ken "Oral Fixation" Starr has a new cause: fighting in the Supreme Court for ; the First Amendment rights of Soth Carolinans to get and give tattoos. Link[1] ; Discuss[2] (_Thanks, Jeremy!_)
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:55 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Government employees are routinely screened in a bid to spot spies - but the ; testing is useless, says influential panel of scientists
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:57 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Pioneering contributions to astrophysics have provided 'two new windows on the ; Universe'
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:52:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Tory conference:* Thatcherites cheer former chairman's housing plans.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The virus has wiped most of India's vultures, causing ecological havoc - ; migrating birds could now carry it to Europe and Africa
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Damaged forms of the newly identified gene are implicated in many breast and ; lung cancers - new treatments for thousands may result
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:03 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Cartoon: Steve Bell *on the Conservative party conference.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Feedback from my posting[1] about FogBUGZ[2] Setup fell into four categories. ; ; *"Why make Setup reversable? Instead you should collect all the information
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:00 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Berkeley's Impact Theatre is running a one-man show called "Working for the ; Mouse," which details one man's experiences working at Disneyland. The story of ; the show's poster[1] is pretty funny, too. Link[2] Discuss[3] (_Thanks, Barry!_
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Japanese toilet technology has developed creeping featuritis. New Tokyo toities ; sport speech-recognition, air-conditioning, and body-chemistry monitors: ;
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World dispatch:* Bush's arguments strain the limits of plausibility to justify ; war on Iraq, and this, says *Simon Tisdall*, means regime change is imperative ; - in Washington.
## Header (preview): From rssfeeds@jmason.org  Wed Oct  9 10:53:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): New Scientist is throwing a scavenger hunt with two prizes: "Live forever" and ; get a gift certificate good for cryonic freezing or "Live now" and take a ; luxury trip to Hawai'i. Link[1] Discuss[2] (_Thanks, Jens[3]!_)
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:31:58 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): _The Morning News_: Rosencrantz & Joshua[1]. Words fail me, which is a rare ; and pleasant gift, thank you. Instead, I will simply take this opportunity to ; quote the original _Rosencrantz & Guildenstern Are Dead_, the excellent
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:01 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's confirmed: Dora and I will be walking down the aisle to the sounds of the ; Triangle Tuba Quartet[1]. That is just too cool for words.;
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:02 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Actually, 5.6. I clocked my &#8220;long loop&#8221; today and discovered that ; the run I thought was 6 miles is actually only 5.6. And the &#8220;short ; loop&#8221; I thought was 5 miles is actually only 4.6. I have an off-by-0.4
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:04 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): - _OSNews.com_: Red Hat 8.0 for KDE Users (and Newbies)[1]. ; - _Aaron Swartz_: Trip notes[2]. ; - _Sean Palmer_: The Semantic Web in Haiku[3].
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:05 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [IMG: http://www.joelonsoftware.com/pictures/dhtml2d.jpg (Dynamic HTML, 2d ; Edition)][1]Ah! Danny Goodman has released the new version of Dynamic HTML[2]. ; It's been a few years since the first edition, which is _still_ the best
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:07 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): US invasion could push Saddam Hussein into retaliating with chemical or ; biological weapons, warns CIA.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:09 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Rome dispatch: *Italy's 'post-fascist' National Alliance is behind two ; controversial attempts to commemorate the country's military past, writes *; Philip Willan*.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:10 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Conservative party conference:* Iain Duncan Smith will today tell the Tory old ; guard to stop sniping at his policy agenda.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:11 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): My Tivo has been picking up the Twilight Zone for the last few weeks. I have to ; say, I'm really enjoying it. It reminds me of the old ones. It's good to have ; it back on the air....
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:12 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The reserve will protect the pristine habitats of a group of sub-Antarctic ; islands described as the "wildest place on Earth"
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:14 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): New evidence in case of murdered British tourist Peter Falconio.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:15 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Three researchers are honoured for pioneering ways of identifying large ; biological molecules such as proteins and DNA
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:16 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I'll be in Ohio this weekend for a family gathering, so I'll be missing Fleet ; Week (Google can't find a good "official site"). Damn. I've wanted to see the ; Blue Angles again. Wow, that site sucks. And Google couldn't find...
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:17 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Government employees are routinely screened in a bid to spot spies - but the ; testing is useless, says influential panel of scientists
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:18 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yeay! We had a good earnings report at work today. There was much happiness and ; a good party after the news. I'm not quite sure how we managed that, but we're ; still making money. I had the distinction of being...
## Warning in strsplit(email_text, "\n"): unable to translate 'From rssfeeds@jmason.org  Thu Oct 10 12:32:20 2002
## Return-Path: <rssfeeds@spamassassin.taint.org>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 9311E16F16
##  for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02419.ade095af23802012668f4ec856bf7e63 - missing value where TRUE/FALSE needed
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:21 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *World latest:* Warning to next PM as Pakistan goes to the polls.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:22 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Sufferers fail to produce effective amounts of key bacteria-killing molecules - ; the discovery raises hopes of new treatments for millions
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:24 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Media:* *Peter Preston* on the question that split the Guardian into two - ; broadsheet and tabloid.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:25 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Arts:* Curators despair at 'shortfall' in chancellor's funding.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:26 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The UK Environment Agency plans to allow a trebling of emissions of a ; radioactive gas produced in reactors - a decision dubbed "spineless" by critics
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Live online:* One of Britain's leading poets will be here tomorrow at 2.15pm ; to celebrate National Poetry day. Post your questions now.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:27 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Men trying for a baby subconsciously influence their hormone levels - and thus ; sperm production - to make conception more likely
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:29 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Business:* Powergen yesterday shut down a quarter of its generating capacity.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:30 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): A method that could allow scientists to probe our ancestors' evolution over the ; last 20,000 years passes its first test
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:31 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Society:* Blair brokers Whitehall deal on trusts borrowing private cash.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:32 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The new software was switched for dummy code containing a "Trojan horse" on its ; download servers
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): *Money:* Government admits millions may have to work on beyond 65.
## Header (preview): From rssfeeds@jmason.org  Thu Oct 10 12:32:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Military communications could be jammed or intercepted and satellites thrown ; off course or destroyed, a new US study warns
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-60159-1038784998-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:18 2002
## Return-Path: <sentto-2242572-60159-1038784998-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02433.9cfb47708291604f2c38393706175160 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-60166-1038789202-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:37 2002; Return-Path: <sentto-2242572-60166-1038789202-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Just to put the germano-Indian fascination in context, one should note that; there is a sizable group of German Klingons as well. Well, _I_ see a; connection, anyway.
## Header (preview): From sentto-2242572-60161-1038786846-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:26 2002; Return-Path: <sentto-2242572-60161-1038786846-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Ray Wallace passed away on November 26, 2002, at Toledo, Washington.; Details to follow.;
## Header (preview): From sentto-2242572-60160-1038786826-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:23 2002; Return-Path: <sentto-2242572-60160-1038786826-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- In forteana@y..., Rachel Carthy <rachel@r...> wrote:; > Apparently it has giant walking land squid in it! Unmissable!;
## Header (preview): From sentto-2242572-60162-1038786958-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:27 2002; Return-Path: <sentto-2242572-60162-1038786958-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- In forteana@y..., "D.McMann" <dmcmann@b...> wrote:; > Jeffrey Archer: The Truth ;
## Header (preview): From sentto-2242572-60163-1038787094-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:30 2002; Return-Path: <sentto-2242572-60163-1038787094-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): The material appended below comes from Martin Gardner's; book _Fads and Fallacies in the Name of Science_ -- revised; and expanded edition published in 1957 by Dover Publications,
## Header (preview): From iiu-admin@taint.org  Mon Dec  2 11:18:53 2002; Return-Path: <iiu-admin@taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I found this interesting, but not very original. Another search engine ; (can't remember which one tho') was doing this a long time ago.;
## Header (preview): From ilug-admin@linux.ie  Mon Dec  2 11:21:47 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): hi i was just wondering if anyone experiening difficulty with eircom mail; sever.I was trying to send mail from mozilla mail but it keeps coming up; with this error:
## Header (preview): From sentto-2242572-60164-1038788774-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:32 2002; Return-Path: <sentto-2242572-60164-1038788774-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- In forteana@y..., That Goddess Chick <felinda@f...> wrote:; > >It's official, I'm a failure. ;
## Header (preview): From sentto-2242572-60165-1038789071-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:35 2002; Return-Path: <sentto-2242572-60165-1038789071-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Yes, I enjoyed it.; Then afterwards, there was a debate thing on ITV about genius or madness,; featuring a friend of mine's boss plus David Icke, also the very likeable
## Header (preview): From sentto-2242572-60167-1038790646-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:40 2002; Return-Path: <sentto-2242572-60167-1038790646-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jets Attempt to Intercept 'Contrail' ; ; By ROBERT BURNS
## Header (preview): From sentto-2242572-60168-1038790994-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:41 2002; Return-Path: <sentto-2242572-60168-1038790994-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): "Leonard R. Cleavelin" wrote:; >Scat I have, unfortunately, run across. But this is the second reference I've ; >seen in as many weeks to "Japanese tentacle porn", which is a genre I've
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-60169-1038792313-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:43 2002
## Return-Path: <sentto-2242572-60169-1038792313-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02445.c8fd8c92ab5a91bbf5e94e5277a47863 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-60170-1038792948-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:46 2002; Return-Path: <sentto-2242572-60170-1038792948-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Well, I know a guy that split up from her that wrote Harry Potter.; Though he is doing fine.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-60171-1038794219-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:51 2002
## Return-Path: <sentto-2242572-60171-1038794219-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02447.5ecaa423bfa4ab050e5b9a0a34f6191f - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Dec  2 11:23:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Best bang for the buck:  390 hp Mustang Cobra @ $35k.; ; GG, recently emerged from the passenger side of a 2003 with the largest
## Header (preview): From pudge@perl.org  Mon Dec  2 11:10:55 2002; Return-Path: <pudge@perl.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): use Perl Daily Newsletter; ; In this issue:
## Header (preview): From sentto-2242572-60172-1038798260-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:53 2002; Return-Path: <sentto-2242572-60172-1038798260-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >It's official, I'm a failure. Just finished listening to one of my high; >school classmates being interviewed on NPR about her new film that she; >wrote and directed, based on her recent successful book.   Do I have a
## Header (preview): From sentto-2242572-60173-1038799103-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:56 2002; Return-Path: <sentto-2242572-60173-1038799103-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Jay Lake wrote:;  ; >It's official, I'm a failure. Just finished listening to one of my high
## Header (preview): From rpm-list-admin@freshrpms.net  Mon Dec  2 11:20:12 2002; Return-Path: <rpm-zzzlist-admin@freshrpms.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Nova Nova wrote:; > bass and treble settings do not seem to have any affect on the sound.
## Header (preview): From sentto-2242572-60174-1038799992-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:25:57 2002; Return-Path: <sentto-2242572-60174-1038799992-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Well, you might be successful too if Arthur Miller had been; > your father.  Or is this some other movie?;
## Header (preview): From fork-admin@xent.com  Mon Dec  2 11:23:27 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Sun, 2002-12-01 at 21:01, Geege Schuman wrote:; > Best bang for the buck:  390 hp Mustang Cobra @ $35k.; >
## Header (preview): From sentto-2242572-60176-1038814880-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:01 2002; Return-Path: <sentto-2242572-60176-1038814880-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Terry W. Colvin fwded:; >"Leonard R. Cleavelin" wrote:; >>Scat I have, unfortunately, run across. But this is the second reference I've
## Header (preview): From sentto-2242572-60177-1038816526-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:06 2002; Return-Path: <sentto-2242572-60177-1038816526-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): One of the main strands of this 'modernisation' is to have all stations on a 'retained' basis at night. Basically this means that the fire station will be unmanned and in the event of a fire, the fire-fighters will be summonsed by pagers, the same way that they currently are in a lot of rural regions. The main reason for this is that fewer fires occur at night. However, the majority of fatalities in fires do occur at night and the recent deaths during the fire-fighters' strike all occurred at night. Over half of these happened in areas currently covered by retained crews who aren't on strike and would appear to give a grim foreshadowing of what may be to come. Currently one of the conditions for being in a retained crew is that you must live/work within one mile of the station. How they will apply this to whole time fire-fighters is still unclear. A good friend of mine is a station officer in Hampshire and currently lives 20 miles from his station so how he'll respond to fire calls at night is a mystery.  And I can't see many fire-fighters living within a mile of some of the inner London stations.; ;
## Header (preview): From 0xdeadbeef-request@petting-zoo.net  Mon Dec  2 11:11:05 2002; Return-Path: <0xdeadbeef-request@petting-zoo.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Mainichi Shimbun; Dec. 1, 2002;
## Header (preview): From sentto-2242572-60178-1038817126-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:06 2002; Return-Path: <sentto-2242572-60178-1038817126-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > >It's official, I'm a failure. ; ; Same here.
## Header (preview): From sentto-2242572-60179-1038817382-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:09 2002; Return-Path: <sentto-2242572-60179-1038817382-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- In forteana@y..., "Jayne Ayris" <jayris@b...> wrote:; > Think of a letter between A and W. ; Oh, all right, then. I'll give it a go.
## Header (preview): From sentto-2242572-60180-1038818909-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:10 2002; Return-Path: <sentto-2242572-60180-1038818909-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > US listers will recognise Damian Lewis as Lieutenant/Captain/Major ; > Winters from "Band of Brothers" which is annoying as he was one of ; > the actors I was sure was actually american.  I wouldn't be
## Header (preview): From sentto-2242572-60181-1038819076-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:16 2002; Return-Path: <sentto-2242572-60181-1038819076-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >I was watching that last night and I couldn't help wondering if one ; >of the GIs was Dexter Fletcher out of the Crystal Maze. ; Yup, was him out of Press Gang
## Header (preview): From sentto-2242572-60182-1038819229-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:17 2002; Return-Path: <sentto-2242572-60182-1038819229-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): --- In forteana@y..., "David McQuirk" <David.McQuirk@D...> wrote:; > TimH:; >
## Header (preview): From sentto-2242572-60183-1038819290-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:19 2002; Return-Path: <sentto-2242572-60183-1038819290-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Its possibly a different Shauna Lowery: The one I'm talking about ; is ; > about 7 foot tall and presents "Animal Hospital" or something like
## Header (preview): From ilug-admin@linux.ie  Mon Dec  2 11:21:52 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >; >hi i was just wondering if anyone experiening difficulty with eircom; >sever.I was trying to send mail from mozilla mail but it keeps coming
## Header (preview): From sentto-2242572-60184-1038819359-jm=jmason.org@returns.groups.yahoo.com  Mon Dec  2 11:26:20 2002; Return-Path: <sentto-2242572-60184-1038819359-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): >Its possibly a different Shauna Lowery: The one I'm talking about is ; >about 7 foot tall and presents "Animal Hospital" or something like ; >that.
## Header (preview): From rssfeeds@jmason.org  Mon Dec  2 11:20:34 2002; Return-Path: <rssfeeds@spamassassin.taint.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Upon arriving safely in Raleigh, our stewardess sang us this, to the tune of ; Barney's I Love You, You Love Me: ;
## Header (preview): From sentto-2242572-59582-1038248914-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 21:03:18 2002; Return-Path: <sentto-2242572-59582-1038248914-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): It's a shame that these guys are some controversial sect --; I'd be much more into it if these were mainstream and we; could task the kneejerk Christians with this fact...
## Header (preview): From sentto-2242572-59584-1038248966-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 18:32:36 2002; Return-Path: <sentto-2242572-59584-1038248966-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): One more congratulation from me, Tim. Why 'Ro' instead of 'Rose' as a short; form of 'Rosemary'? Is it a Welsh thing?;
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-59585-1038249586-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 21:05:18 2002
## Return-Path: <sentto-2242572-59585-1038249586-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02469.901d2dc268a72e42497dac1ea80d861d - missing value where TRUE/FALSE needed
## Header (preview): From social-admin@linux.ie  Mon Nov 25 18:42:54 2002; Return-Path: <social-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ok, if an email address is not in my whitelist, they are asked to confirm.; in that message there is the following text:;
## Header (preview): From spamassassin-talk-admin@lists.sourceforge.net  Mon Nov 25 18:54:01 2002; Return-Path: <spamassassin-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is possible, however using SA as a block criteria is not recommended. ; SA does have a very realistic chance of mis-marking mail so using it as an ; autodelete function is at best extraordinarily foolish.
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-59586-1038250481-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 21:05:30 2002
## Return-Path: <sentto-2242572-59586-1038250481-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02472.5c879dd55c3d4171e1787e8529bbd7e1 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-59589-1038252135-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 21:04:38 2002; Return-Path: <sentto-2242572-59589-1038252135-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): ----- Original Message -----; From: "Tim Chapman" <timc@2ubh.com>; To: "zzzzteana" <zzzzteana@yahoogroups.com>
## Header (preview): From sentto-2242572-59588-1038251274-jm=jmason.org@returns.groups.yahoo.com  Mon Nov 25 21:02:43 2002; Return-Path: <sentto-2242572-59588-1038251274-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > Mr Tim Chapman, freelance gentleman of letters of Halifax,; Yorkshire,; > announces his betrothal to Dr Ro Gault, virtual reality boffin of
## Header (preview): From ilug-admin@linux.ie  Mon Nov 25 21:02:43 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Smith, Graham - Computing Technician wrote:; > ; > ntp.cs.tcd.ie  (thats a strata 2 isnt it? are there any other publically
## Header (preview): From fork-admin@xent.com  Mon Nov 25 21:06:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Geege wrote a strange story:; >I know a guy who in attempting to loosen  a nut at the base of the toilet ; >tapped it with a wrench, cracked the bowl in HALF, and, to prevent a flood,
## Header (preview): From spambayes-bounces@python.org  Mon Nov 25 20:49:28 2002; Return-Path: <spambayes-bounces@python.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): [Paul Moore]; >    but let's walk before we run - after all, we may end up; >    all using Zodb in any case :-)
## Header (preview): From social-admin@linux.ie  Mon Nov 25 20:48:45 2002; Return-Path: <social-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): On Mon, Nov 25, 2002 at 06:54:49PM +0000, Philip Trickett wrote:; > how much overhead does this add to your daily 'email reading'?;
## Header (preview): From secprog-return-625-jm=jmason.org@securityfocus.com  Tue Nov 26 11:27:38 2002; Return-Path: <secprog-return-625-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I don't know how one can expect better and more secure code from the; community when this being a security list some post like this shows; clearly no knowledge of C.
## Header (preview): From secprog-return-624-jm=jmason.org@securityfocus.com  Mon Nov 25 23:16:06 2002; Return-Path: <secprog-return-624-yyyy=spamassassin.taint.org@securityfocus.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): No, you need to learn how declarations work in C.  You have specified; testbuff as "an array of 1024 pointers to characters".  That means,; you have allocated an array big enough to store 1024 pointers.  On
## Header (preview): From spambayes-bounces+jm=jmason.org@python.org  Mon Nov 25 20:49:29 2002; Return-Path: <spambayes-bounces+yyyy=spamassassin.taint.org@python.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):     Richie> As I understand it, post-1.8x versions of the core bsddb code;     Richie> ship under the Sleepycat license, which demands that projects;     Richie> using it must be published-source.
## Header (preview): From spambayes-bounces@python.org  Mon Nov 25 20:49:31 2002; Return-Path: <spambayes-bounces@python.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):     Paul> I suspect the best answer is to make the DBM implementation;     Paul> configurable via bayescustomize.ini (with the default being;     Paul> anydbm).
## Warning in strsplit(email_text, "\n"): unable to translate 'From sentto-2242572-60402-1038998187-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:13 2002
## Return-Path: <sentto-2242572-60402-1038998187-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>
## Delivered-To: yyyy@localhost.spamassassin.taint.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02483.ab1bee02c10ddecc0e86c39eaebc2996 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-60403-1038998528-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:16 2002; Return-Path: <sentto-2242572-60403-1038998528-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I have to say I was surprised about Jacko dangling that kid of the; balcony.; Usually he just tosses them off...
## Header (preview): From sentto-2242572-60404-1038998759-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:17 2002; Return-Path: <sentto-2242572-60404-1038998759-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Now then I recently read a novel about exactly that sorta thing; happening. Can't remember what is was called tho..maybe something like; 51st State?
## Header (preview): From sentto-2242572-60405-1038999606-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:21 2002; Return-Path: <sentto-2242572-60405-1038999606-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): What the hell is it with these mini remote control cars? Not only has ; my mailbox been full of spam advertising them, but there's a fairly ; large stall selling them at Paddington station.
## Header (preview): From sentto-2242572-60406-1039000032-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:19 2002; Return-Path: <sentto-2242572-60406-1039000032-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): here, for your enjoyment, is a little something discovered by my daughter; Kim.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Wed Dec  4 11:52:38 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 3DF4616F18
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/ham/02488.68fed64ff8169f1505b74080bb7b6158 - missing value where TRUE/FALSE needed
## Header (preview): From sentto-2242572-60408-1039001119-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:26 2002; Return-Path: <sentto-2242572-60408-1039001119-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Joe McNally writes:; ; > What the hell is it with these mini remote control cars? Not only has
## Header (preview): From sentto-2242572-60407-1039000218-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:23 2002; Return-Path: <sentto-2242572-60407-1039000218-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Wednesday, 4 December, 2002, 08:52 GMT; Bomber targets Dutch Ikea stores;
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:52:44 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi all.; Does anyone know how to set up dual keyboards(one is actually a stand-alone; keypad)?
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:52:49 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Carlos Luna wrote:; ; >Hi all.
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:52:58 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi all; ;
## Header (preview): From sentto-2242572-60410-1039002801-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:28 2002; Return-Path: <sentto-2242572-60410-1039002801-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Tim Chapman writes:; ; > http://news.bbc.co.uk/1/hi/world/europe/2541827.stm
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:53:00 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): > I had the same problem when installing Win on it and eventually sorted it; > out by disabling the infrared port. ;
## Header (preview): From sentto-2242572-60409-1039002175-jm=jmason.org@returns.groups.yahoo.com  Wed Dec  4 11:58:27 2002; Return-Path: <sentto-2242572-60409-1039002175-yyyy=spamassassin.taint.org@returns.groups.yahoo.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Man killed 'trying to surf' on Tube train ; Ananova ; Wednesday December 4, 2002 11:07 AM
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:53:04 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi Gianni,; ; A very good resource for this is:
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:53:08 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Gianni Ponzi wrote:; > I have a prob when trying to install Linux (tried RedHat, Suse) on my; > laptop. I can start the install but after about 2min, the whole pc just
## Header (preview): From spambayes-bounces@python.org  Wed Dec  4 11:52:09 2002; Return-Path: <spambayes-bounces@python.org>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Neale Pickett <neale@woozle.org> writes:; ; > Skip Montanaro <skip@pobox.com> writes:
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:53:15 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hi,; ; I think you need to give us a little more detailed information.
## Header (preview):
## Body (preview): mv 00001.7c53336b37003a9286aba55d2945844c 00001.7c53336b37003a9286aba55d2945844c; mv 00002.9c4069e25e1ef370c078db7ee85ff9ac 00002.9c4069e25e1ef370c078db7ee85ff9ac; mv 00003.860e3c3cee1b42ead714c5c874fe25f7 00003.860e3c3cee1b42ead714c5c874fe25f7
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
spam_data <- map(spam_files, ~process_email_file(.x, "spam")) %>% compact() %>% bind_rows()
## Header (preview): 
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From spamassassin@localhost  Mon Jun 24 17:04:13 2002; Return-Path: salestoner@bol.com.br; Delivery-Date: Wed May 15 20:21:19 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0009_01C1EC40.AE23FA20
## Header (preview): From southerngent23@hotmail.com  Mon Jun 24 17:47:13 2002; Return-Path: southerngent23@hotmail.com; Delivery-Date: Fri Apr 26 21:18:44 2002
## Body (preview): --------------7736744SOS1; Content-Type: multipart/alternative;;  boundary="------------744SOS1SOS2"
## Header (preview): From contact@soft2reg.com  Mon Jun 24 17:47:24 2002; Return-Path: anonymous@soft2reg.com; Delivery-Date: Mon Apr 29 19:12:45 2002
## Body (preview): <html>; <head>;    <title>The Soft2Reg Team</title>
## Header (preview): From submit94@dubaimail.com  Mon Jun 24 17:05:54 2002; Return-Path: yyyy@dogma.slashnull.org; Delivery-Date: Thu May  2 11:21:40 2002
## Body (preview): To remove see below.; ; I work with a company that submits
## Header (preview): From submit94@dubaimail.com  Mon Jun 24 17:05:58 2002; Return-Path: yyyy@dogma.slashnull.org; Delivery-Date: Thu May  2 11:21:47 2002
## Body (preview): To remove see below.; ; I work with a company that submits
## Header (preview): From reply-56446664-9@william.monsterjoke.com  Mon Jun 24 17:07:56 2002; Return-Path: yyyy@dogma.slashnull.org; Delivery-Date: Thu May  2 11:29:20 2002
## Body (preview): <html><body><center><a href=http://www.vitafactory.com/><img src=http://www.vitafactory.com/images/vitafactory-mail-logo.jpg border=0><hr><a href=http://www.vitafactory.com/ad-saturday/1.html><img src=http://www.vitafactory.com/ad-saturday/1.gif border=0></a><hr><br><a href=http://www.vitafactory.com/ad-saturday/><img src=http://www.vitafactory.com/ad-tuesday/joke1008.gif border=0><hr><a href=http://www.vitafactory.com/ad-saturday/2.html><img src=http://www.vitafactory.com/ad-saturday/2.gif border=0></a><hr> </b><p align=left><br></font><font color=#616161 face=Verdana size=1><b>Unsubscribe:</b><br>Please send a blank mail to:<br>unsub-56446664-9@william.monsterjoke.com<br><br><a href=http://www.mach10.com/><img src=http://www.vitafactory.com/images/mach10.gif border=0></body></html>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Jul  3 12:07:30 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix on SuSE Linux 8.0 (i386)) wi...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00214.39bd955c9db013255c326dbcbb4f2f86 - missing value where TRUE/FALSE needed
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:06:43 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_HpdzYzPLaja9wyog5zqAedGH8s
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:02:35 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_dD40Vgw1oCGOp3EPEdazdG
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:02:35 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_cFRm0wxfhQWISt2h0cpKwOo0
## Header (preview): From kir_31@yahoo.com  Mon Jun 24 17:03:08 2002; Return-Path: kir_31@yahoo.com; Delivery-Date: Sat May 11 22:41:11 2002
## Body (preview): <HTML>; <BODY>; <CENTER>
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:02:46 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_eUxDdjUhs0x9uMaOFtuwV3zERJuu
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:06:50 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_LvB0ncUGqkJjbmgyYlLrXGX
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:02:53 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_EvPezLBcciXYy
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:06:51 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_a4U4f4Lb5R29pMZQoWcLdBAFKn
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:07:01 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_2Lj58GhIL6KI2etaeCVCn
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:07:01 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_BD64YauT129KiRyjtaWSq5xSFVObB
## Header (preview): From crackmice-admin@crackmice.com  Wed Jul  3 12:07:20 2002; Return-Path: <crackmice-admin@crackmice.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_KclG2AeIezUiae9B4w
## Header (preview): From howell@mercadobr.com  Wed Jul  3 12:35:16 2002; Return-Path: <howell@mercadobr.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): Have you ever wondered how the hell these petite Asian girls,; with their tiny little Asian holes, can accommodate such huge; hard cocks? Oh, but they can expand, can't they!!!? Have you
## Header (preview): From tazgirlcd@msn.com  Wed Jul  3 12:07:43 2002; Return-Path: <tazgirlcd@msn.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html><body>; ; <table bgcolor=3D"#FF6666" border=3D"2" width=3D"999" cellspacing=3D"0" ce=
## Warning in strsplit(email_text, "\n"): unable to translate 'From crackmice-admin@crackmice.com  Wed Jul  3 12:07:20 2002
## Return-Path: <crackmice-admin@crackmice.com>
## Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix on SuSE ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00228.238a0547cbbd70a024d7d4376707f201 - missing value where TRUE/FALSE needed
## Header (preview): From mzsczzokjmosobfc@hotmail.com  Wed Jul  3 12:07:33 2002; Return-Path: <mzsczzokyyyyosobfc@hotmail.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): WEALTH IN THE NEW MILLENNIUM; ; The New Millennium has arrived with more financial opportunities than ever
## Header (preview): From jude_schleiferman6485@Flashmail.com  Wed Jul  3 12:07:37 2002; Return-Path: <jude_schleiferman6485@Flashmail.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!-- saved from url=(0022)http://internet.e-mail -->; <html>
## Header (preview): From newhgh2002@bigfoot.com  Wed Jul  3 12:07:48 2002; Return-Path: <newhgh2002@bigfoot.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; <body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; Hello, jm@neteze.com<BR>
## Header (preview): From fork-admin@xent.com  Wed Jul  3 12:07:44 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format; ; --=_NextPart_2rfkindysadvnqw3nerasdf
## Header (preview): From sigfin@insurancemail.net  Wed Jul  3 12:07:50 2002; Return-Path: <sigfin@insurancemail.net>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1F32E9_01C1F449.C9876C50
## Header (preview): From bounce-56446664-12@george.jokerville.com  Wed Jul  3 12:07:51 2002; Return-Path: <bounce-56446664-12@george.jokerville.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html><body><center><a href=http://www.vitafactory.com/><img src=http://www.vitafactory.com/images/vitafactory-mail-logo.jpg border=0><hr><a href=http://www.vitafactory.com/ad-saturday/1.html><img src=http://www.vitafactory.com/ad-saturday/1-adnew.gif border=0></a><a href=http://www.vitafactory.com/ad-saturday/2.html><img src=http://www.vitafactory.com/ad-saturday/2-adnew.gif border=0><hr></a> </b><p align=left><font color=#616161 face="Trebuchet MS" size=1><br></font><font color=#616161 face=Verdana size=2><b>Unsubscribe:</b><br>Please send a blank mail to:<br>unsub-56446664-12@fiona.free4all.com </font><br></body></html>
## Header (preview): From Webmaster_r@icqmail.com  Wed Jul  3 12:08:08 2002; Return-Path: <Webmaster_r@icqmail.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; <body bgcolor="#7CB5F0">; <a href="http://teens.xxxfreehosting.com/hotteens/index.html"><img border="0" src="http://members.aol.com/tjoyce/mail_01.gif" width="500" height="558" border=0></a><br>
## Header (preview): From rob5ftft45cd454d@msn.com  Wed Jul  3 12:08:11 2002; Return-Path: <rob5ftft45cd454d@msn.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): Jane,; ; Here is the information you requested
## Header (preview): From weou345@msn.com  Wed Jul  3 12:08:07 2002; Return-Path: <weou345@msn.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): I have been receiving emails saying that I'm contributing to the "moral decay of society" by selling the Banned CD.  That may be, but I feel strongly that you have a right to benefit from ; this hard-to-find information. ;
## Header (preview): From walteribe@c4.com  Wed Jul  3 12:34:26 2002; Return-Path: <walteribe@c4.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): --=====================_889472414==_; Content-Type: text/plain; Content-Transfer-Encoding: 8bit
## Warning in strsplit(email_text, "\n"): unable to translate 'From osa_ame2001@yahoo.com  Wed Jul  3 12:35:24 2002
## Return-Path: <osa_ame2001@yahoo.com>
## Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix on SuSE Linux 8.0 (i386)...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00239.91d2d5c0e8827c4a42cb24733a0859fa - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Jul  3 12:35:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; ; <body>
## Header (preview): From fork-admin@xent.com  Wed Jul  3 12:35:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; <body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <p><br>
## Header (preview): From rha@insurancemail.net  Wed Jul  3 12:35:07 2002; Return-Path: <rha@insurancemail.net>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_237950_01C1F52E.BB0EE1E0
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Jul  3 12:35:07 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix on SuSE Linux 8.0 (i386)) wi...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00243.2fa7ea5c308d2d572c7e8efc679bb6a9 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Wed Jul  3 12:35:12 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; <head>; <title>FREIGHTMART Mail Campaign</title>
## Header (preview): From fork-admin@xent.com  Wed Jul  3 12:35:16 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): REQUEST FOR URGENT BUSINESS ASSISTANCE; --------------------------------------; I stumbled into your contact by stroke of luck after a
## Warning in strsplit(email_text, "\n"): unable to translate 'From crackmice-admin@crackmice.com  Wed Jul  3 12:35:23 2002
## Return-Path: <crackmice-admin@crackmice.com>
## Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix on SuSE ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00246.d314e68151f961425104dbe6a4e3bc9a - missing value where TRUE/FALSE needed
## Header (preview): From savemoney@first.topdrawerbiz.com  Wed Jul  3 12:35:26 2002; Return-Path: <savemoney@first.topdrawerbiz.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): Protect yourself with an extended warranty for your car, minivan, truck or SUV. Rates can be as much as 60% cheaper than at the dealer!;         ; Extend your existing Warranty.
## Header (preview): From cristopher@hotmail.com  Wed Jul  3 12:35:31 2002; Return-Path: <cristopher@hotmail.com>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From do1cubs7j71@hotmail.com  Mon Jun 24 17:07:00 2002; Return-Path: do1cubs7j71@hotmail.com; Delivery-Date: Tue May 28 11:22:38 2002
## Body (preview): Get ready for the most amazing site you will ever see!; ; Click on this link NOW!
## Header (preview): From acordovado66@ala.btk.utu.fi  Wed Jul  3 12:34:31 2002; Return-Path: <acordovado66@ala.btk.utu.fi>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <HTML><BODY BGCOLOR=3D"#FFFFFF">; <table width=3D400 align=3Dcenter cellpadding=3D5 border=3D0><tr><td>; <font face=3D"arial" size=3D1.5><p>
## Header (preview): From dontjtrjy8754@glo.be  Mon Jun 24 17:09:24 2002; Return-Path: dontjtrjy8754@glo.be; Delivery-Date: Fri May 10 18:12:15 2002
## Body (preview): <!doctype html public "-//w3c//dtd html 4.0 transitional//en">; <html>; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From adfxh@engfac.uct.ac.za  Mon Jun 24 17:03:10 2002
## Return-Path: adfxh@engfac.uct.ac.za
## Delivery-Date: Sat May 11 22:50:20 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00252.3b352c8a7266026be4f1c1ba89690cfc - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From jgetty@talk21.com  Mon Jun 24 17:03:04 2002
## Return-Path: jgetty@talk21.com
## Delivery-Date: Sat May 11 13:41:11 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4BCf9e22368...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00253.bd8e0dd85f0f848be89aadbf6d6364dc - missing value where TRUE/FALSE needed
## Header (preview): From wit96@ecis.com  Mon Jun 24 17:09:21 2002; Return-Path: wit96@ecis.com; Delivery-Date: Fri May 10 15:54:04 2002
## Body (preview): <HTML><FONT  COLOR=3D"#0000ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: =; #ffffff" SIZE=3D2 PTSIZE=3D10><B>                     </FONT><FONT  COLOR=3D=; "#0000ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: #ffffff" SIZE=3D3 PT=
## Header (preview): From mrchservice311510@aol.com  Mon Jun 24 17:02:56 2002; Return-Path: mrchservice@aol.com; Delivery-Date: Sat May 11 01:02:35 2002
## Body (preview): <html>; A<!--mom and dad-->ccept C<!--grandma and grandpa-->redit C<!--aunt kate-->ards - Everyone A<!--uncle don-->pproved<p>; NO C<!--hi family-->REDIT CH<!--i love you all-->ECKS
## Header (preview): From insb@insurancemail.net  Mon Jun 24 17:02:56 2002; Return-Path: insb@insurancemail.net; Delivery-Date: Fri May 10 23:49:55 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_346C22_01C1F83E.20E71340
## Header (preview): From hudson@netcnct.net  Mon Jun 24 17:02:57 2002; Return-Path: vindc@folkekirken.dk; Delivery-Date: Sat May 11 01:48:46 2002
## Body (preview): _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/; ;  S   P   E   C   I   A   L         R   E   P   O   R   T
## Header (preview): From bearike@sohu.com  Mon Jun 24 17:02:57 2002; Return-Path: bearike@sohu.com; Delivery-Date: Sat May 11 02:09:28 2002
## Body (preview): This is a multi-part message in MIME format; --3daab575-64bd-11d6-b6fa-0050ba415022; Content-Type: text/plain; charset=gb2312
## Header (preview): From bearike@sohu.com  Mon Jun 24 17:02:58 2002; Return-Path: bearike@sohu.com; Delivery-Date: Sat May 11 03:35:28 2002
## Body (preview): This is a multi-part message in MIME format; --d51589f6-64c8-11d6-b6fa-0050ba415022; Content-Type: text/plain; charset=gb2312
## Header (preview): From fddgl@data.net.mx  Mon Jun 24 17:09:22 2002; Return-Path: fddgl@data.net.mx; Delivery-Date: Fri May 10 16:34:34 2002
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <!-- saved from url=3D(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">
## Warning in strsplit(email_text, "\n"): unable to translate 'From Emailcenter@cmmail.com  Mon Jun 24 17:03:03 2002
## Return-Path: Emailcenter@cmmail.com
## Delivery-Date: Sat May 11 13:33:43 2002
## Received: from webnote.net (mail.webnote.net [193.120.211.219]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00261.e679a9947bd481d47fb1a3d83b482fd5 - missing value where TRUE/FALSE needed
## Header (preview): From us-green-card2583k27@yahoo.com  Mon Jun 24 17:03:07 2002; Return-Path: us-green-card2583k27@yahoo.com; Delivery-Date: Sat May 11 18:52:43 2002
## Body (preview): <body bgcolor="#FFFFFF" leftmargin="0" topmargin="0">; <!-- NEW TOP LOGO & NAV -->; <table width="100%" border="0" cellspacing="0" cellpadding="0">
## Header (preview): From imrich@nete.net  Mon Jun 24 17:03:00 2002; Return-Path: monna@datatex.com.ni; Delivery-Date: Sat May 11 06:30:36 2002
## Body (preview): =============================================; Astounding New Software Lets You Find; Out Almost ANYTHING about ANYONE...
## Header (preview): From achris918@au.ru  Mon Jun 24 17:03:05 2002; Return-Path: achris918@au.ru; Delivery-Date: Sat May 11 15:18:14 2002
## Body (preview): ; ;
## Header (preview): From jdlockhart@yahoo.com  Mon Jun 24 17:02:58 2002; Return-Path: jdlockhart@yahoo.com; Delivery-Date: Sat May 11 04:59:11 2002
## Body (preview): <html>; <body bgcolor=3D"#003300">; <P align=3Dcenter><FONT color=3D#ffffff size=3D5>Congratulations,
## Header (preview): From reply-56446664-6@william.free4all.com  Mon Jun 24 17:03:02 2002; Return-Path: bounce-56446664-6@george.free4all.com; Delivery-Date: Sat May 11 11:24:32 2002
## Body (preview): <html><body><IMG SRC='http://master2.free4all.com/cgi-bin/sp/t.pl?id=6:56446664&o=1&d=1' BORDER=0 WIDTH=0 HEIGHT=0/><center><img src=http://www.vitafactory.com/ad-friday/test.gif border=0></body></html>
## Header (preview): From reply-56446664-7@william.free4all.com  Mon Jun 24 17:03:04 2002; Return-Path: bounce-56446664-7@boris.free4all.com; Delivery-Date: Sat May 11 13:59:04 2002
## Body (preview): <html><body><IMG SRC='http://master2.free4all.com/cgi-bin/sp/t.pl?id=7:56446664&o=1&d=1' BORDER=0 WIDTH=0 HEIGHT=0/>; <center><img src=http://www.vitafactory.com/ad-friday/test.gif border=0>; </body></html>
## Header (preview): From fh89446@lycos.com  Mon Jun 24 17:03:01 2002; Return-Path: fh89446@lycos.com; Delivery-Date: Sat May 11 08:11:19 2002
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0//EN">; ; <html>
## Header (preview): From MedicalCenter@mail24.inb-mail.com  Mon Jun 24 17:03:02 2002; Return-Path: root@mail24.inb-mail.com; Delivery-Date: Sat May 11 12:36:08 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>Full Access Medical</TITLE>
## Header (preview): From GamingCenter@mail9.inb-productions.com  Mon Jun 24 17:03:07 2002; Return-Path: root@mail9.inb-productions.com; Delivery-Date: Sat May 11 17:41:10 2002
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD><TITLE>Maxim Casino ad</TITLE>; <META content="text/html; charset=iso-8859-1" http-equiv=Content-Type>
## Warning in strsplit(email_text, "\n"): unable to translate 'From gryydw@aol.com  Mon Jun 24 17:03:07 2002
## Return-Path: gryydw@aol.com
## Delivery-Date: Sat May 11 22:06:50 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4BL6ge06363 for
##  ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00271.7105f4998a88cbf4036403f61ba60d65 - missing value where TRUE/FALSE needed
## Header (preview): From mort239o@693.six86.com  Mon Jun 24 17:03:10 2002; Return-Path: mort239o@693.six86.com; Delivery-Date: Sun May 12 03:08:59 2002
## Body (preview): How would you like a Top Rated Law Firm working for you, your family and your business for only pennies a day?; ; CLICK HERE
## Header (preview): From mort239o@686.six86.com  Mon Jun 24 17:03:11 2002; Return-Path: mort239o@686.six86.com; Delivery-Date: Sun May 12 03:23:39 2002
## Body (preview): WAKE UP!;  ; Here's the deal: Mortgage interest rates are DOWN right NOW, but with the economy improving it is only a matter of time before they go UP again!
## Warning in strsplit(email_text, "\n"): unable to translate 'From momsday4277@eudoramail.com  Mon Jun 24 17:03:06 2002
## Return-Path: momsday4277@eudoramail.com
## Delivery-Date: Sat May 11 16:51:51 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESM...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00274.192bd3848a65302344dff2d7c0d3f08a - missing value where TRUE/FALSE needed
## Header (preview): From chickweed@wt.net  Mon Jun 24 17:03:11 2002; Return-Path: chickweed@wt.net; Delivery-Date: Sun May 12 05:45:28 2002
## Body (preview): <HTML>; <BODY>; <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=3Diso-8859-=
## Header (preview): From bearike@sohu.com  Mon Jun 24 17:03:14 2002; Return-Path: bearike@sohu.com; Delivery-Date: Sun May 12 09:33:36 2002
## Body (preview): This is a multi-part message in MIME format; --de3568c4-65bc-11d6-b6fa-0050ba415022; Content-Type: text/plain; charset=gb2312
## Header (preview): From newsletters@the-financial-news.com  Mon Jun 24 17:03:15 2002; Return-Path: newsletters@the-financial-news.com; Delivery-Date: Sun May 12 09:55:43 2002
## Body (preview): This is a multi-part message in MIME format; ; --=_NextPart_2rfkindysadvnqw3nerasdf
## Header (preview): From group5_0510261386@erols.com  Mon Jun 24 17:03:29 2002; Return-Path: social-admin@linux.ie; Delivery-Date: Mon May 13 13:26:02 2002
## Body (preview): Updated May 9, 2002 ...; ; READ THIS! YOU'LL BE HAPPY YOU DID!
## Header (preview): From newsletters@the-financial-news.com  Mon Jun 24 17:03:16 2002; Return-Path: newsletters@the-financial-news.com; Delivery-Date: Sun May 12 12:28:25 2002
## Body (preview): This is a multi-part message in MIME format; ; --=_NextPart_2rfkindysadvnqw3nerasdf
## Header (preview): From storemanager2276@msn.com  Mon Jun 24 17:03:17 2002; Return-Path: JHGM@attbi.COM; Delivery-Date: Sun May 12 14:54:08 2002
## Body (preview): ------=_NextPart_84815C5ABAF209EF376268C8; Content-type: text/plain; charset=windows-1252; Content-Transfer-Encoding: quoted-printable
## Header (preview): From onacct50@terra.es  Mon Jun 24 17:03:17 2002; Return-Path: onacct50@terra.es; Delivery-Date: Sun May 12 15:11:37 2002
## Body (preview): <HTML>; <body bgcolor=#FFFFFF>; <font color=#ff00ff>LIMITED Time OFFER!! <BR>
## Header (preview): From girjdlsn@wam.co.za  Mon Jun 24 17:03:15 2002; Return-Path: girjdlsn@wam.co.za; Delivery-Date: Sun May 12 10:53:35 2002
## Body (preview): <HTML><HEAD>; <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html; charset=3Dus-ascii=; ">
## Header (preview): From miaj@close2you.net  Mon Jun 24 17:03:12 2002; Return-Path: miaj@close2you.net; Delivery-Date: Sun May 12 09:05:47 2002
## Body (preview): <HTML><FONT  COLOR=3D"#ff00ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: =; #ffffff" SIZE=3D3 PTSIZE=3D12><B>Instantly </FONT><FONT  COLOR=3D"#ff0000"=;  BACK=3D"#ff80ff" style=3D"BACKGROUND-COLOR: #ff80ff" SIZE=3D3 PTSIZE=3D12=
## Header (preview): From roster@insurancemail.net  Mon Jun 24 17:03:21 2002; Return-Path: roster@insurancemail.net; Delivery-Date: Sun May 12 21:38:21 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0007_01C1F9BE.12E451A0
## Header (preview): From ruler888@yahoo.com  Mon Jun 24 17:03:13 2002; Return-Path: ruler888@yahoo.com; Delivery-Date: Sun May 12 09:21:29 2002
## Body (preview): <html>; <body bgcolor=3D"#003300">; <P align=3Dcenter><FONT color=3D#ffffff size=3D5>Congratulations,
## Header (preview): From ehbzk@371.net  Mon Jun 24 17:03:26 2002; Return-Path: ehbzk@371.net; Delivery-Date: Mon May 13 06:32:36 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From 987A4642@eudoramail.com  Mon Jun 24 17:03:22 2002; Return-Path: 987A4642@eudoramail.com; Delivery-Date: Mon May 13 00:59:21 2002
## Body (preview): The Ultimate Traditional & Internet Marketing Tool, Introducing the "MasterDisc 2002" version 4.00, now released its MASSIVE 11 disc set with over 145 Million database records (18-20 gigabytes of databases) for marketing to companies, people, via email, fax, phone and mailing addresses Worldwide!; ; COMPLETE 11 DISC SET IS ALL OF THE MARKETING DATA YOU WILL NEED FOR 2002!!! EARN BIG PROFITS THIS YEAR!!!
## Header (preview): From sandy_rusher7@yahoo.co.uk  Mon Jun 24 17:03:23 2002; Return-Path: social-admin@linux.ie; Delivery-Date: Mon May 13 03:32:38 2002
## Body (preview): We offer some of the best bulk e-mail prices on the Internet. We do all the mailing for you. ; You just provide us with the ad! It's that simple!;
## Header (preview): From PsychicCenter@MAIL5.INB-PRODUCTIONS.COM  Mon Jun 24 17:03:25 2002; Return-Path: root@MAIL5.INB-PRODUCTIONS.COM; Delivery-Date: Mon May 13 05:28:14 2002
## Body (preview): <html>; ; <head>
## Header (preview): From mort239o@689.six86.com  Mon Jun 24 17:03:27 2002; Return-Path: mort239o@689.six86.com; Delivery-Date: Mon May 13 11:08:58 2002
## Body (preview): Protect yourself with an extended warranty for your car, minivan, truck or SUV. Rates can be as much as 60% cheaper than at the dealer!;        ; Extend your existing Warranty.
## Header (preview): From ohiqgsmq@juserve.com  Mon Jun 24 17:03:23 2002; Return-Path: ohiqgsmq@juserve.com; Delivery-Date: Mon May 13 02:07:02 2002
## Body (preview): Attention Homeowners, ; ; "Now is the time to take advantage of falling interest rates!  There is no advantage in waiting any longer."
## Header (preview): From ann49345267707r734871x04@iinet.net.au  Mon Jun 24 17:03:26 2002; Return-Path: ann49345267707r734871x04@iinet.net.au; Delivery-Date: Mon May 13 08:36:06 2002
## Body (preview): The World's #1 On-line Pharmacy; ; Order from the convenience of your home!
## Header (preview): From Polaroid@optinat.com  Mon Jun 24 17:03:31 2002; Return-Path: Polaroid@optinat.com; Delivery-Date: Mon May 13 17:43:54 2002
## Body (preview): <HTML>; ; <body BGCOLOR=#FFFFFF>
## Header (preview): From jos_ed@mail.com  Mon Jun 24 17:03:27 2002; Return-Path: jos_ed@mail.com; Delivery-Date: Mon May 13 12:33:42 2002
## Body (preview): I PRESUME THIS MAIL WILL NOT BE A SURPRISE TO YOU.; I AM AN ACCOUNTANT WITH THE MINISTRY OF MINERAL; RESOURCES AND ENERGY IN SOUTH AFRICA AND ALSO A MEMBER
## Header (preview): From warena@freemail.hu  Mon Jun 24 17:03:27 2002; Return-Path: warena@freemail.hu; Delivery-Date: Mon May 13 12:05:11 2002
## Body (preview): <html>; <head>; </head>
## Header (preview): From 4s@insurancemail.net  Mon Jun 24 17:03:34 2002; Return-Path: 4s@insurancemail.net; Delivery-Date: Tue May 14 02:02:01 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0007_01C1FAAC.4A47E870
## Header (preview): From returnacctr5391@yahoo.com  Mon Jun 24 17:03:11 2002; Return-Path: returnacctr5391@yahoo.com; Delivery-Date: Sun May 12 04:31:42 2002
## Body (preview): <html>; <head>; <title>Watch full length movies in full screen complete we collection! </t=
## Header (preview): From joder33@yahoo.com  Mon Jun 24 17:03:33 2002; Return-Path: joder33@yahoo.com; Delivery-Date: Tue May 14 00:42:54 2002
## Body (preview): I'm making $3000 to $7000 a day, EACH AND EVERY DAY ; and YOU CAN TOO!;
## Header (preview): From hupunohu@jimi.net  Mon Jun 24 17:03:30 2002; Return-Path: hupunohu@jimi.net; Delivery-Date: Mon May 13 15:27:02 2002
## Body (preview): <html>; <body bgcolor=3D"#003300">; <P align=3Dcenter><FONT color=3D#ffffff size=3D5>Congratulations,
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From qesdft2678532617@yahoo.com  Mon Jun 24 17:03:35 2002; Return-Path: qesdft2678@yahoo.com; Delivery-Date: Tue May 14 08:01:07 2002
## Body (preview): <html>; ; <body>
## Header (preview): From lefty@spl.at  Mon Jun 24 17:03:38 2002; Return-Path: lefty@spl.at; Delivery-Date: Tue May 14 11:54:32 2002
## Body (preview): Unbelievable Prices On Cell Phones And Accessories:; ; http://65.218.171.48
## Header (preview): From lmmil@mail.ru  Mon Jun 24 17:04:22 2002; Return-Path: lmmil@mail.ru; Delivery-Date: Thu May 16 11:07:04 2002
## Body (preview): Guaranteed to increase, lift and firm your; breasts in 60 days or your money back!!;
## Header (preview): From mort239o@688.six86.com  Mon Jun 24 17:03:45 2002; Return-Path: mort239o@688.six86.com; Delivery-Date: Tue May 14 16:31:48 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From ab16@mail.gr  Mon Jun 24 17:03:39 2002; Return-Path: ab16@mail.gr; Delivery-Date: Tue May 14 14:32:42 2002
## Body (preview): <html>; <body>; <p>Rape Sex!<br>
## Header (preview): From usa_hgh@Flashmail.com  Mon Jun 24 17:03:45 2002; Return-Path: usa_hgh@Flashmail.com; Delivery-Date: Tue May 14 17:05:05 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From registration05@qudsmail.com  Mon Jun 24 17:03:35 2002; Return-Path: registration05@qudsmail.com; Delivery-Date: Tue May 14 05:14:01 2002
## Body (preview): To remove see below.; ; I work with a company that submits
## Header (preview): From abgon@au.ru  Mon Jun 24 17:03:36 2002; Return-Path: abgon@au.ru; Delivery-Date: Tue May 14 08:58:58 2002
## Body (preview): On the topic of; ;
## Header (preview): From sl@insurancemail.net  Mon Jun 24 17:03:46 2002; Return-Path: sl@insurancemail.net; Delivery-Date: Wed May 15 00:28:45 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_4365A_01C1FB64.2F304B00
## Header (preview): From CopyMyDVDcom@permissionpass.com  Mon Jun 24 17:03:47 2002; Return-Path: tppn@ftu-13.permissionpass.com; Delivery-Date: Wed May 15 00:39:57 2002
## Body (preview): --##########; ; See below for your Exit Information.
## Header (preview): From miaj@close2you.net  Mon Jun 24 17:03:39 2002; Return-Path: miaj@close2you.net; Delivery-Date: Tue May 14 13:06:20 2002
## Body (preview): *This message was transferred with a trial version of CommuniGate(tm) Pro*; <HTML><FONT  BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: #ffffff" SIZE=3D2 =; PTSIZE=3D10><B width=3D"163" height=3D"255"></b></FONT><B width=3D"163" he=
## Warning in strsplit(email_text, "\n"): unable to translate 'From StopSearching@fuse.net  Mon Jun 24 17:03:48 2002
## Return-Path: StopSearching@fuse.net
## Delivery-Date: Wed May 15 07:53:42 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00311.176626eb0ec0de8f451a079083104975 - missing value where TRUE/FALSE needed
## Header (preview): From hgh5833@Flashmail.com  Mon Jun 24 17:04:18 2002; Return-Path: hgh5833@Flashmail.com; Delivery-Date: Thu May 16 10:56:11 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@neteze.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From aladen@postino.ch  Mon Jun 24 17:03:48 2002; Return-Path: aladen@postino.ch; Delivery-Date: Wed May 15 04:56:22 2002
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From christine@trafficmagnet.net  Mon Jun 24 17:03:54 2002; Return-Path: christine@trafficmagnet.net; Delivery-Date: Wed May 15 16:11:08 2002
## Body (preview): This is a multi-part message in MIME format; --6b68a94d-e09d-4085-9e4a-425d259a6579; Content-Type: text/html; charset=iso-8859-1
## Header (preview): From DebtRelief@mail5.domainset  Mon Jun 24 17:04:09 2002; Return-Path: root@MAIL5.INB-INTERNATIONAL.COM; Delivery-Date: Wed May 15 17:24:19 2002
## Body (preview): <HTML><HEAD><TITLE>Untitled Document</TITLE>; <META content="text/html; charset=iso-8859-1" http-equiv=Content-Type>; <META content="MSHTML 5.00.3315.2870" name=GENERATOR></HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'From register_support@e.register.com  Mon Jun 24 17:04:10 2002
## Return-Path: bouncer-yyyy-register-com=spamassassin.taint.org@bounce.e.register.com
## Delivery-Date: Wed May 15 17:31:03 2002
## Received: from mta112.cheetahmail.com (mta112.cheetahmail.com
##    ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00316.6127940652124130611907ee0c20ab5e - missing value where TRUE/FALSE needed
## Header (preview): From trimlife@offer888.net  Mon Jun 24 17:04:21 2002; Return-Path: trimlife-3444431.13@offer888.net; Delivery-Date: Thu May 16 11:06:36 2002
## Body (preview): <html>; <head>; <title>Untitled Document</title>
## Header (preview): From marcehaye@netscape.net  Mon Jun 24 17:04:11 2002; Return-Path: marcehaye@netscape.net; Delivery-Date: Wed May 15 17:53:04 2002
## Body (preview): Some opportunities only come around every 30; years or so. This is one of those. Why?;
## Warning in strsplit(email_text, "\n"): unable to translate 'From Emailcenter@cmmail.com  Mon Jun 24 17:04:11 2002
## Return-Path: Emailcenter@cmmail.com
## Delivery-Date: Wed May 15 18:24:55 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00319.2702ee4100f722328afc52a1a6f1dc26 - missing value where TRUE/FALSE needed
## Header (preview): From Market_Research@spcu.spb.su  Mon Jun 24 17:04:12 2002; Return-Path: Market_Research@spcu.spb.su; Delivery-Date: Wed May 15 18:58:40 2002
## Body (preview): <=21DOCTYPE HTML PUBLIC =22-//W3C//DTD HTML 4.0 Transitional//EN=22>; <HTML><HEAD><TITLE></TITLE>; <META http-equiv=3DContent-Type content=3D=22text/html; charset=3Dwindows-1=
## Header (preview): From guardian4602@hotmail.com  Mon Jun 24 17:03:50 2002; Return-Path: guardian4602@hotmail.com; Delivery-Date: Wed May 15 09:21:18 2002
## Body (preview): <html>; ; <head>
## Header (preview): From jhzyi@ece.concordia.ca  Mon Jun 24 17:03:51 2002; Return-Path: jhzyi@ece.concordia.ca; Delivery-Date: Wed May 15 10:01:10 2002
## Body (preview): <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=3Diso-8859-1=; ">; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">
## Header (preview): From larry_brennan@yahoo.com  Mon Jun 24 17:04:19 2002; Return-Path: larry_brennan@yahoo.com; Delivery-Date: Thu May 16 11:01:48 2002
## Body (preview): <html>; <body bgcolor=3D"#003300">; <P align=3Dcenter><FONT color=3D#ffffff size=3D5>Congratulations,
## Header (preview): From merchantsworld2001@juno.com  Mon Jun 24 17:04:16 2002; Return-Path: merchantsworld2001@juno.com; Delivery-Date: Thu May 16 05:07:53 2002
## Body (preview): <html>; <body>; <center>
## Header (preview): From tba@insurancemail.net  Mon Jun 24 17:04:15 2002; Return-Path: tba@insurancemail.net; Delivery-Date: Thu May 16 03:33:13 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_8A2A7_01C1FC44.0A86D9F0
## Header (preview): From mojoq@mail.slip.net  Mon Jun 24 17:04:19 2002; Return-Path: mojoq@mail.slip.net; Delivery-Date: Thu May 16 11:03:00 2002
## Body (preview): <html>; <body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; Hello, jm@neteze.com<BR>
## Header (preview): From leadsales400042@yahoo.com  Mon Jun 24 17:03:55 2002; Return-Path: leadsales400042@yahoo.com; Delivery-Date: Wed May 15 16:24:17 2002
## Body (preview): <html>; HEY, I AM FORWARDING YOU THE AD THEY SENT ME.; I TRIED THE LEADS AND THINK WE SHOULD USE THEM FOR OUR TEAM.
## Warning in strsplit(email_text, "\n"): unable to translate 'From aastavast@pacbell.net  Mon Jun 24 17:04:18 2002
## Return-Path: aastavast@pacbell.net
## Delivery-Date: Thu May 16 10:46:32 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4G9...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00328.47ba83d868220761b2ff71ce39d91a37 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From mailings@ticketmaster.co.uk  Mon Jun 24 17:04:22 2002
## Return-Path: mailings@ticketmaster.co.uk
## Delivery-Date: Thu May 16 12:18:46 2002
## Received: from mail1.ticketweb.co.uk ([213.86.56.112]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00329.47e3728483bdcad34227e601eb348836 - missing value where TRUE/FALSE needed
## Header (preview): From lena_taylor@doneasy.com  Mon Jun 24 17:03:53 2002; Return-Path: lena_taylor@doneasy.com; Delivery-Date: Wed May 15 14:18:34 2002
## Body (preview): .BIZ and .INFO Available Here; ; Dear sir/madam,
## Header (preview): From kinson@asiamagic.com  Mon Jun 24 17:04:24 2002; Return-Path: 8wl9wZlmv@seed.net.tw; Delivery-Date: Thu May 16 15:48:20 2002
## Body (preview): Hello! ; ; This is Kinson Wong from Asia Magic (HK) Ltd company.
## Header (preview): From jzlin@art.alcatel.fr  Mon Jun 24 17:04:18 2002; Return-Path: jzlin@art.alcatel.fr; Delivery-Date: Thu May 16 08:22:25 2002
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From h_ennis@hotmail.com  Mon Jun 24 17:04:15 2002; Return-Path: h_ennis@hotmail.com; Delivery-Date: Thu May 16 04:48:45 2002
## Body (preview): <html>; ; <head>
## Header (preview): From Arlean2462904@firemail.de  Mon Jun 24 17:07:57 2002; Return-Path: Arlean2462904@firemail.de; Delivery-Date: Wed May 29 09:05:19 2002
## Body (preview): On January 1st 2002, the European countries began; using the new Euro Dollar.  Never before have so; many countries with such powerful economies united
## Header (preview): From emc@insurancemail.net  Mon Jun 24 17:04:25 2002; Return-Path: emc@insurancemail.net; Delivery-Date: Thu May 16 22:46:46 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_DD23E_01C1FCF4.FA928290
## Header (preview): From erienw9@wam.co.za  Mon Jun 24 17:04:23 2002; Return-Path: erienw9@wam.co.za; Delivery-Date: Thu May 16 13:44:09 2002
## Body (preview): Did you know 4 of the country's 10 richest people never graduated from college?; ; They had the courage to dream, and the wisdom to
## Header (preview): From ReservationDesk@permissionpass.com  Mon Jun 24 17:04:28 2002; Return-Path: tppn@ftu-06.permissionpass.com; Delivery-Date: Fri May 17 05:30:01 2002
## Body (preview): --##########; ; See below for your Exit Information.
## Header (preview): From fabcncnrroumzcsg@yahoo.com  Mon Jun 24 17:04:28 2002; Return-Path: fabcncnrroumzcsg@yahoo.com; Delivery-Date: Fri May 17 05:48:38 2002
## Body (preview): <html>; <CENTER>; <table width=550 cellpadding=2 cellspacing=0 border=0 BGCOLOR=BLACK><TR><TD>
## Header (preview): From lob@cheerful.com  Mon Jun 24 17:04:29 2002; Return-Path: lob@cheerful.com; Delivery-Date: Fri May 17 09:01:58 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From importune@pediatrician.com  Mon Jun 24 17:04:30 2002; Return-Path: importune@pediatrician.com; Delivery-Date: Fri May 17 09:03:13 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From inconsolable@japan.com  Mon Jun 24 17:04:30 2002; Return-Path: inconsolable@japan.com; Delivery-Date: Fri May 17 09:03:17 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From juiblex@registerednurses.com  Mon Jun 24 17:04:30 2002; Return-Path: juiblex@registerednurses.com; Delivery-Date: Fri May 17 09:03:17 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From extensor@paris.com  Mon Jun 24 17:04:31 2002; Return-Path: extensor@paris.com; Delivery-Date: Fri May 17 09:03:12 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From axolotl@madrid.com  Mon Jun 24 17:04:31 2002; Return-Path: axolotl@madrid.com; Delivery-Date: Fri May 17 09:03:15 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From mrchservice522617@aol.com  Mon Jun 24 17:04:31 2002; Return-Path: mrchservice@aol.com; Delivery-Date: Fri May 17 09:48:11 2002
## Body (preview): <html>; A<!--mom and dad-->ccept C<!--grandma and grandpa-->redit C<!--aunt kate-->ards - Everyone A<!--uncle don-->pproved<p>; NO C<!--hi family-->REDIT CH<!--i love you all-->ECKS
## Header (preview): From edum@hkem.com  Mon Jun 24 17:04:26 2002; Return-Path: dcms-dev-admin@eros.cs.jhu.edu; Delivery-Date: Fri May 17 01:53:20 2002
## Body (preview): Dear Sir, ; ; I am Mr.Eduado de Mello, one of the Principal
## Header (preview): From tretewfdsfsd@hotmail.com  Mon Jun 24 17:05:53 2002; Return-Path: tretewfdsfsd@hotmail.com; Delivery-Date: Wed May 22 21:36:30 2002
## Body (preview): <html>; <head>; <title>DEAR HOMEOWNER,</title>
## Header (preview): From msathene@netvigator.com  Mon Jun 24 17:05:41 2002; Return-Path: msathene@netvigator.com; Delivery-Date: Tue May 21 17:12:03 2002
## Body (preview): SHOCKING PAPARRAZZI NUDE CELEBRITY PICS & VIDEOS!; ; Naked Male and Female Stars caught on tape! Real
## Header (preview): From stayhnard@yahoo.com  Mon Jun 24 17:04:26 2002; Return-Path: stayhnard@yahoo.com; Delivery-Date: Fri May 17 01:09:09 2002
## Body (preview): Hi-tech industry leader in an emerging 90 billion dollar ; environmental marketplace seeks U.S. and Canadian ; Entrepreneurs for market expansion. We have an immediate
## Header (preview): From atoffd1@aol.com  Mon Jun 24 17:04:34 2002; Return-Path: atoffd1@aol.com; Delivery-Date: Fri May 17 13:55:12 2002
## Body (preview): <html>; ; <body>
## Header (preview): From m&o@insurancemail.net  Mon Jun 24 17:04:38 2002; Return-Path: m&o@insurancemail.net; Delivery-Date: Sat May 18 00:21:49 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_10C0D9_01C1FDBC.F2389D00
## Header (preview): From WEBMASTER@J-MEDICAL.ORG  Mon Jun 24 17:04:44 2002; Return-Path: mmailco@mail.com; Delivery-Date: Sat May 18 09:34:19 2002
## Body (preview): <HTML><HEAD>; <META http-equiv=Content-Type content="text/html; charset=windows-1252">; <STYLE>BODY {
## Header (preview): From lisa@freightmart.com  Mon Jun 24 17:04:38 2002; Return-Path: lisa@freightmart.com; Delivery-Date: Sat May 18 02:31:11 2002
## Body (preview): <html>; <head>; <title>FREIGHTMART Mail Campaign</title>
## Header (preview): From makelotsofcash@hotmail.com  Mon Jun 24 17:04:36 2002; Return-Path: makelotsofcash@hotmail.com; Delivery-Date: Fri May 17 20:04:34 2002
## Body (preview): Dear Friend,; How would you like to make $50,000 in the next 90 days? Sounds impossible? ; I guarantee that it's true, and YOU can do it. I'm sure you would like an
## Header (preview): From sylow@doglover.com  Mon Jun 24 17:04:41 2002; Return-Path: sylow@doglover.com; Delivery-Date: Sat May 18 07:04:46 2002
## Body (preview): Hello I am your hot lil horny toy.;     I am the one you dream About,;     I am a very open minded person,
## Header (preview): From jeffm_320032564@msn.com  Mon Jun 24 17:04:42 2002; Return-Path: jeffm_320032564@msn.com; Delivery-Date: Sat May 18 07:07:56 2002
## Body (preview): Medial News -- Anti-Aging Breakthrough.; Thousands Grow Biologically Younger. Proven by Laboratory Test Results.;
## Header (preview): From othema2002@hotmail.com  Mon Jun 24 17:04:45 2002; Return-Path: othema2002@hotmail.com; Delivery-Date: Sat May 18 15:20:33 2002
## Body (preview): Thema Ordi; Tel:27 83 6919246; othema2002@37.com
## Header (preview): From greathosting@techie.com  Mon Jun 24 17:04:44 2002; Return-Path: greathosting@techie.com; Delivery-Date: Sat May 18 13:42:25 2002
## Body (preview): <html><title>$7.95 Power Hosting</title>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">; <meta http-equiv=Content-Type content="text/html; charset=iso-8859-1">
## Warning in strsplit(email_text, "\n"): unable to translate 'From mrjoemark@yahoo.com  Mon Jun 24 17:04:45 2002
## Return-Path: mrjoemark@yahoo.com
## Delivery-Date: Sat May 18 14:06:08 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4ID67e2...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00359.90bec90ebeaf05f024f48594e7d7b0d5 - missing value where TRUE/FALSE needed
## Header (preview): From mynetdetectives@offer888.net  Mon Jun 24 17:04:47 2002; Return-Path: mynetdetectives-3444431.13@offer888.net; Delivery-Date: Sat May 18 17:41:18 2002
## Body (preview): <html>; <body>; <table border=0 align="center" width=80%>
## Header (preview): From PermissionPasscom@permissionpass.com  Mon Jun 24 17:04:49 2002; Return-Path: tppn@ftu-08.permissionpass.com; Delivery-Date: Sat May 18 22:34:46 2002
## Body (preview): --##########; ; See below for your Exit Information.
## Header (preview): From finch1@yahoo.com  Mon Jun 24 17:04:49 2002; Return-Path: finch1@yahoo.com; Delivery-Date: Sat May 18 23:14:23 2002
## Body (preview): <html>; <body bgcolor="#99FFCC">; Fix your Bad Credit NOW! Simply <a href="http://61.129.81.99/tbone2/legal.html?marketing_id=jb">Click Here</a> and fill out the form. For only
## Header (preview): From oocuteladyoo@aol.com  Mon Jun 24 17:04:50 2002; Return-Path: oocuteladyoo@aol.com; Delivery-Date: Sun May 19 00:30:37 2002
## Body (preview): <html>; ; <body>
## Header (preview): From reply-56446664-3@william.free4all.com  Mon Jun 24 17:04:50 2002; Return-Path: bounce-56446664-3@mary.free4all.com; Delivery-Date: Sun May 19 02:31:11 2002
## Body (preview): <html><head><title>Joke-A-Day</title></head><body><IMG SRC='http://master2.free4all.com/cgi-bin/sp/final.pl?id=%6A%6D%40%6E%65%74%6E%6F%74%65%69%6E%63%2E%63%6F%6D&o=1&d=1' BORDER=0 WIDTH=0 HEIGHT=0/><center><a href=http://www.vitafactory.com/><img src=http://www.vitafactory.com/images/joke_list.jpg border=0><hr><br> <table align=center bgColor=white border=0 cellPadding=0 cellSpacing=0 width=550><tbody><tr><td><table border=0 cellPadding=0 cellSpacing=5 width=450><tbody> <tr><td><table border=0 cellPadding=0 cellSpacing=5><tbody><tr><td><table border=0 cellPadding=0 cellSpacing=0><tbody><tr><td bgColor=black vAlign=top>&nbsp;</td><td bgColor=#ffffcc width=5></td><td bgColor=#ffffcc><table border=0 cellPadding=5 cellSpacing=0 valign=top><tbody><tr><td bgColor=#ffffcc vAlign=top><p align=left><font size=5><b><span class=storehead><font color=red>Human Growth Hormone Precursor</font></span></b></font></p> <p align=left><font size=3><b><span class=storehead>Receive 2 $89.95 bott!; les of </span>NeoTropin hGH <span class=storehead><font color=red>free</font> as our gift and save $20 dollars on each new bottle!</span></b></font></; p> <p align=center><font color=red><b><font size=4>That's $419.90 total Annual savings!</font></b></font></p> <p align=left><b><font color=maroon>Vitafactory</font>.com</b> cares about the health and well being of you and your family. To help get you started, we're proud to offer 2 free bottles of&nbsp; <b>NeoTropin hGH.</b>&nbsp; As a program member, you will also receive a discount of $20 dollars for each subsequent purchase of NeoTropin&nbsp;&nbsp; <a href=http://www.vitafactory.com/neotropin.html>Click Here For More Information!</a></td></tr></tbody></table></td></tr></tbody></table></td></tr><tr><td><p><font face=Verdana size=2><br><b>Today's Joke</b><br> <b>~~~~~~~~</b></font></p><p><a href=http://www.vitafactory.com/ad-wednesday/><img border=0 src=http://www.vitafactory.com/ad-wednesday/joke1004.gif ></a></p><p><font face=Verdana size=2><br></font><b><font face=Verdana size=2>~~~~~~~~</font></b></td></tr></tbody></table></td></tr></tbody></table></td><td align=right v!
## Header (preview): From rdc7y767@hotmail.com  Mon Jun 24 17:04:46 2002; Return-Path: rdc7y767@hotmail.com; Delivery-Date: Sat May 18 16:27:37 2002
## Body (preview): 8800JWXS6-165kYbB8203GssW1-200otHp6418l36; ; SPRING BLOW OUT SALE
## Header (preview): From billferris@aol.com  Mon Jun 24 17:04:51 2002; Return-Path: billferris@aol.com; Delivery-Date: Sun May 19 08:27:11 2002
## Body (preview): <html>; ; <body>
## Header (preview): From Caridad4771071@newmail.co.il  Mon Jun 24 17:04:48 2002; Return-Path: Caridad4771071@newmail.co.il; Delivery-Date: Sat May 18 22:34:07 2002
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Warning in strsplit(email_text, "\n"): unable to translate 'From robertseviour@totalise.co.uk  Mon Jun 24 17:04:52 2002
## Return-Path: robertseviour@totalise.co.uk
## Delivery-Date: Sun May 19 10:31:59 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00368.64d7f78532bf9b4cd41c8f5bc526af6a - missing value where TRUE/FALSE needed
## Header (preview): From kittyle@freindly.com  Mon Jun 24 17:04:49 2002; Return-Path: kittyle@freindly.com; Delivery-Date: Sat May 18 22:37:34 2002
## Body (preview): <HTML>; <body bgcolor=3D"#FFFFFF">; <FONT  COLOR=3D"#0000ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: #ffff=
## Header (preview): From twoods35@yahoo.com  Mon Jun 24 17:05:08 2002; Return-Path: twoods35@yahoo.com; Delivery-Date: Mon May 20 00:42:14 2002
## Body (preview): <html>; <body bgcolor=3D"#003300">; <P align=3Dcenter><FONT color=3D#ffffff size=3D5>Congratulations,
## Header (preview): From rbqIhateworking@yahoo.com  Mon Jun 24 17:05:00 2002; Return-Path: rbqIhateworking@yahoo.com; Delivery-Date: Sun May 19 15:58:01 2002
## Body (preview): Hello ; THIS E-MAIL AD IS BEING SENT IN FULL COMPLIANCE WITH U.S. SENATE BILL 1618, TITLE #3, SECTION 301;
## Header (preview): From ookrmkdg@yahoo.com  Mon Jun 24 17:05:01 2002; Return-Path: wwwadmin@damaged.passport.ca; Delivery-Date: Sun May 19 17:53:52 2002
## Body (preview): Below is the result of your feedback form.  It was submitted by Pharmacy Online (ookrmkdg@yahoo.com) on Sunday, May 19, 19102 at 12:53:32; ---------------------------------------------------------------------------;
## Header (preview): From ja@insurancemail.net  Mon Jun 24 17:05:02 2002; Return-Path: ja@insurancemail.net; Delivery-Date: Sun May 19 18:12:08 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_152120_01C1FF20.AD02E910
## Warning in strsplit(email_text, "\n"): unable to translate 'From cretepines@tiscalinet.ch  Mon Jun 24 17:05:05 2002
## Return-Path: cretepines@tiscalinet.ch
## Delivery-Date: Sun May 19 22:51:09 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP i...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00374.b174d1e94449f519f3ceba87e7cefea7 - missing value where TRUE/FALSE needed
## Header (preview): From jm@netnoteinc.com  Mon Jun 24 17:05:04 2002; Return-Path: yyyy@netnoteinc.com; Delivery-Date: Sun May 19 21:09:44 2002
## Body (preview): <html>; <body bgcolor="#003300">; <P align=center><FONT color=#ffffff size=5>Congratulations,
## Header (preview): From agw248785g03@hotmail.com  Mon Jun 24 17:05:19 2002; Return-Path: agw248785g03@hotmail.com; Delivery-Date: Mon May 20 16:35:48 2002
## Body (preview): ------=_NextPart_000_00B7_88D77D7B.C7065A48; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From StopSearching@usa.net  Mon Jun 24 17:05:06 2002; Return-Path: StopSearching@usa.net; Delivery-Date: Sun May 19 23:38:48 2002
## Body (preview): <HTML><HEAD><TITLE>A Money Making Home Business for You!</TITLE>; <META HTTP-EQUIV="Content-Type" CONTENT="text/html; charset=iso-8859-1">; </HEAD><BODY BGCOLOR=#000000><center><font color="#FFFFFF">
## Header (preview): From ReservationDesk@permissionpass.com  Mon Jun 24 17:05:08 2002; Return-Path: tppn@ftu-10.permissionpass.com; Delivery-Date: Mon May 20 01:03:48 2002
## Body (preview): --##########; ; See below for your Exit Information.
## Header (preview): From greenman@swbell.net  Mon Jun 24 17:05:13 2002; Return-Path: greenman@swbell.net; Delivery-Date: Mon May 20 11:37:49 2002
## Body (preview): ------=_NextPart_000_00C8_20D83C2D.E4417B07; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From Matthew_Morrow@optinunlimited.com  Mon Jun 24 17:05:21 2002; Return-Path: Matthew_Morrow@optinunlimited.com; Delivery-Date: Mon May 20 18:01:43 2002
## Body (preview): <html>; <head>; <title>About your commissions</title>
## Header (preview): From ly9qowv6r47@hotmail.com  Mon Jun 24 17:05:00 2002; Return-Path: ly9qowv6r47@hotmail.com; Delivery-Date: Sun May 19 15:41:16 2002
## Body (preview): FIND OUT WHO THEY ARE CHATTING/E-MAILING WITH ALL THOSE HOURS!; ; Is your spouse cheating online?
## Header (preview): From super4_31r@pac6.westernbarge.com  Mon Jun 24 17:05:11 2002; Return-Path: super4_31r@pac6.westernbarge.com; Delivery-Date: Mon May 20 08:20:08 2002
## Body (preview): Lower your mortgage rate and/or payment! FREE Quote!; http://hey11.heyyy.com/freeservices/mortgage/;
## Header (preview): From bacraver@imail.ru  Mon Jun 24 17:05:33 2002; Return-Path: bacraver@imail.ru; Delivery-Date: Tue May 21 10:04:08 2002
## Body (preview): ; ;
## Header (preview): From liveq3035@finit.hu  Mon Jun 24 17:05:05 2002; Return-Path: liveq3035@finit.hu; Delivery-Date: Sun May 19 22:52:29 2002
## Body (preview): <HTML><FONT  COLOR=3D"#ff00ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: =; #ffffff" SIZE=3D3 PTSIZE=3D12> &nbsp;<B><!--#rotate>Terific!!   Instantly =; </FONT><FONT  COLOR=3D"#ff0000" BACK=3D"#ff80ff" style=3D"BACKGROUND-COLOR=
## Header (preview): From gymad@olemail.com  Mon Jun 24 17:05:12 2002; Return-Path: gymad@olemail.com; Delivery-Date: Mon May 20 11:17:47 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From jmackenzie@btamail.net.cn  Mon Jun 24 17:05:06 2002; Return-Path: yyyyackenzie@btamail.net.cn; Delivery-Date: Sun May 19 23:56:59 2002
## Body (preview): <html>; <head><title>Doctors Online</title></head><body bgcolor=3D"#ffffff">; <p><font size=3D"+1" face=3D"Arial"><b>Viagra</b></font></p>
## Header (preview): From usa_hgh9543@eudoramail.com  Mon Jun 24 17:05:07 2002; Return-Path: usa_hgh9543@eudoramail.com; Delivery-Date: Mon May 20 00:25:13 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netmore.net<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From mmoon7y767@hotmail.com  Mon Jun 24 17:05:33 2002; Return-Path: mmoon7y767@hotmail.com; Delivery-Date: Tue May 21 12:04:42 2002
## Body (preview): 1075RxOo9-26l11; ; INCREASE YOUR GAS MILEAGE
## Header (preview): From super4_31r@pac6.westernbarge.com  Mon Jun 24 17:05:22 2002; Return-Path: super4_31r@pac6.westernbarge.com; Delivery-Date: Mon May 20 21:04:51 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From lbonnexa@generation.net  Mon Jun 24 17:05:21 2002; Return-Path: lbonnexa@generation.net; Delivery-Date: Mon May 20 17:36:18 2002
## Body (preview): <HTML>; <BODY>; </head>
## Header (preview): From 51198991666@baugeschichte.rwth-aachen.de  Mon Jun 24 17:05:11 2002; Return-Path: 51198991666@baugeschichte.rwth-aachen.de; Delivery-Date: Mon May 20 08:04:06 2002
## Body (preview): <HTML><FONT  COLOR=3D"#0000ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR: =; #ffffff" SIZE=3D3 PTSIZE=3D12 FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"=; 0">Thank you for your interest!<BR>
## Header (preview): From jennifer@attorneyconnectionsinc.com  Mon Jun 24 17:05:28 2002; Return-Path: jennifer@attorneyconnectionsinc.com; Delivery-Date: Tue May 21 04:32:45 2002
## Body (preview): <html>; <head>; <title>MCLE Seminars</title>
## Header (preview): From mort239o@pac5.westernbarge.com  Mon Jun 24 17:05:24 2002; Return-Path: mort239o@pac5.westernbarge.com; Delivery-Date: Tue May 21 01:01:28 2002
## Body (preview): Protect yourself with an extended warranty for your car, minivan, truck or SUV. Buy DIRECT and SAVE money!;            ; Extend your existing Warranty.
## Header (preview): From super4_31r@pac9.westernbarge.com  Mon Jun 24 17:05:24 2002; Return-Path: super4_31r@pac9.westernbarge.com; Delivery-Date: Tue May 21 01:49:58 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From rose_xu@email.com  Mon Jun 24 17:05:19 2002
## Return-Path: rose_xu@email.com
## Delivery-Date: Mon May 20 16:19:52 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4KFJoe14245...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00395.74aee42fac915ca758047506ec59a21f - missing value where TRUE/FALSE needed
## Header (preview): From ltca@insurancemail.net  Mon Jun 24 17:05:24 2002; Return-Path: ltca@insurancemail.net; Delivery-Date: Tue May 21 01:00:43 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_197EA3_01C2001F.877BF830
## Warning in strsplit(email_text, "\n"): unable to translate 'From esiroomkozucxfpo@netscape.net  Mon Jun 24 17:05:26 2002
## Return-Path: esiroomkozucxfpo@netscape.net
## Delivery-Date: Tue May 21 02:47:01 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) wi...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00397.dc85d97361fbed3637f8db56d4c9c92d - missing value where TRUE/FALSE needed
## Header (preview): From kingofspan2@hotmail.com  Mon Jun 24 17:05:27 2002; Return-Path: kingofspan2@hotmail.com; Delivery-Date: Tue May 21 03:57:01 2002
## Body (preview): --------------6778712SOS1; Content-Type: multipart/alternative;;  boundary="------------712SOS1SOS2"
## Header (preview): From efocLOOKYOUNGNOW2000@yahoo.com  Mon Jun 24 17:05:27 2002; Return-Path: efocLOOKYOUNGNOW2000@yahoo.com; Delivery-Date: Tue May 21 04:19:58 2002
## Body (preview): THIS E-MAIL AD IS BEING SENT IN FULL COMPLIANCE WITH U.S. SENATE BILL 1618, TITLE #3, SECTION 301; ; TO REMOVE YOURSELF SEND A BLANK E-MAIL TO:removal992002@yahoo.com
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From seseko7@worldemail.com  Mon Jun 24 17:05:28 2002; Return-Path: seseko7@worldemail.com; Delivery-Date: Tue May 21 05:02:56 2002
## Body (preview): FROM=SEKO MOSHOOD MOBUTU; ; Tel=234-1-776-2397
## Header (preview): From yana_korshun@mail.ru  Mon Jun 24 17:05:31 2002; Return-Path: yana_korshun@mail.ru; Delivery-Date: Tue May 21 07:51:57 2002
## Body (preview): Dear Sir/Madam; ; Our company is designer and manufacturer of digital voice recorders (DVR) Edic-mini http://www.telesys.ru/english/edic-mini.shtml with extraordinary characteristics:
## Header (preview): From seseko1@worldemail.com  Mon Jun 24 17:05:29 2002; Return-Path: seseko1@worldemail.com; Delivery-Date: Tue May 21 06:39:30 2002
## Body (preview): FROM=SEKO MOSHOOD MOBUTU; ; Tel=234-1-776-2397
## Header (preview): From knb4menu@charter.net  Mon Jun 24 17:05:33 2002; Return-Path: knb4menu@charter.net; Delivery-Date: Tue May 21 08:57:09 2002
## Body (preview):   by mx12.cluster1.charter.net (CommuniGate Pro SMTP 3.5.9);   with ESMTP id 4992751 for knb4menu@charter.net; Fri, 26 Apr 2002 08:09:39 -0400; Received: from es-wmstage1 [216.35.187.6] by webmillion.com with ESMTP
## Header (preview): From jhane8euj3kjdoij3@aol.com  Mon Jun 24 17:05:34 2002; Return-Path: jhane8euj3kjdoij3@aol.com; Delivery-Date: Tue May 21 12:10:29 2002
## Body (preview): FUTURE TECH INTERNATIONAL; ; SPECIAL OFFER that "BLOWS AWAY TRADITIONAL MARKETING" - Advertising Age.
## Header (preview): From cre-repair@china.com  Mon Jun 24 17:05:28 2002; Return-Path: cre-repair@china.com; Delivery-Date: Tue May 21 05:00:09 2002
## Body (preview): <HTML><P ALIGN=3DCENTER><FONT  COLOR=3D"#ff0000" SIZE=3D3 PTSIZE=3D12 FAMIL=; Y=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"0"><B>Is Your Credit A Mess?</b></F=; ONT><B><FONT  COLOR=3D"#000000" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR=
## Header (preview): From jm@news4.inlink.com  Mon Jun 24 17:05:34 2002; Return-Path: nobody@newweb.surfclear.com; Delivery-Date: Tue May 21 14:38:06 2002
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (jm@news4.inlink.com) on Tuesday, May 21, 2002 at 09:22:41; ---------------------------------------------------------------------------
## Header (preview): From duax@aol.com  Mon Jun 24 17:05:35 2002; Return-Path: duax@aol.com; Delivery-Date: Tue May 21 15:16:13 2002
## Body (preview): <html>; ; <body>
## Header (preview): From gbarcoe@netnation.ie  Mon Jun 24 17:05:41 2002; Return-Path: gbarcoe@netnation.ie; Delivery-Date: Tue May 21 16:40:35 2002
## Body (preview): Dear Justin, ;                   ;
## Header (preview): From Prosextra@optinunlimited.com  Mon Jun 24 17:05:43 2002; Return-Path: Prosextra@optinunlimited.com; Delivery-Date: Tue May 21 19:05:53 2002
## Body (preview): <HTML>  ; <HEAD>; <style type="text/css">
## Header (preview): From rathcairn@eircom.net  Mon Jun 24 17:05:37 2002; Return-Path: rathcairn@eircom.net; Delivery-Date: Tue May 21 16:22:21 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_00AF_01C200E1.C5BDFF40
## Header (preview): From _rebeccallewellyn1__@yahoo.com  Mon Jun 24 17:05:40 2002; Return-Path: _rebeccallewellyn1__@yahoo.com; Delivery-Date: Tue May 21 16:36:12 2002
## Body (preview): <HTML><P ALIGN=CENTER><FONT  SIZE=5 PTSIZE=18 FAMILY="SANSSERIF" FACE="Arial" LANG="0"><B>Mortgage Rates Are About To Rise</FONT><FONT  COLOR="#000000" BACK="#ffffff" style="BACKGROUND-COLOR: #ffffff" SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0"></B><BR>; </FONT><FONT  COLOR="#000000" BACK="#ffffff" style="BACKGROUND-COLOR: #ffffff" SIZE=5 PTSIZE=18 FAMILY="SANSSERIF" FACE="Arial" LANG="0"><B>Cash In Now!</FONT><FONT  COLOR="#000000" BACK="#ffffff" style="BACKGROUND-COLOR: #ffffff" SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0"></B><BR>; <P ALIGN=LEFT><BR>
## Warning in strsplit(email_text, "\n"): unable to translate 'From cretepines@tiscalinet.ch  Mon Jun 24 17:05:45 2002
## Return-Path: cretepines@tiscalinet.ch
## Delivery-Date: Tue May 21 21:18:28 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP i...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00412.2498d35d4ac806f77e31a17839d5c4c2 - missing value where TRUE/FALSE needed
## Header (preview): From julie344188@mail.ru  Mon Jun 24 17:05:45 2002; Return-Path: julie344188@mail.ru; Delivery-Date: Tue May 21 22:05:29 2002
## Body (preview): I just got a webcam and computer for my birthday and I just finished; my first homepage. I added some of my modeling pictures there so if you; think you can help my career please let me know. I could also use some
## Header (preview): From mrchservice126432@aol.com  Mon Jun 24 17:05:45 2002; Return-Path: mrchservice@aol.com; Delivery-Date: Tue May 21 22:42:45 2002
## Body (preview): <html>; A<!--mom and dad-->ccept C<!--grandma and grandpa-->redit C<!--aunt kate-->ards - Everyone A<!--uncle don-->pproved<p>; NO C<!--hi family-->REDIT CH<!--i love you all-->ECKS
## Header (preview): From amfin@insurancemail.net  Mon Jun 24 17:05:46 2002; Return-Path: amfin@insurancemail.net; Delivery-Date: Wed May 22 00:07:28 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1DD90E_01C200E4.C0E7B7B0
## Header (preview): From connie.bester@fresnomail.com  Mon Jun 24 17:05:29 2002; Return-Path: connie.bester@fresnomail.com; Delivery-Date: Tue May 21 06:45:13 2002
## Body (preview): IMPORTANT INFORMATION:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From itcolarryspaypal@yahoo.com  Mon Jun 24 17:05:48 2002; Return-Path: itcolarryspaypal@yahoo.com; Delivery-Date: Wed May 22 02:14:09 2002
## Body (preview): THIS E-MAIL AD IS BEING SENT IN FULL COMPLIANCE WITH U.S. SENATE BILL 1618, TITLE #3, SECTION 301; ; TO REMOVE YOURSELF SEND A BLANK E-MAIL TO:removal992002@yahoo.com
## Header (preview): From Alatron1@aol.com  Mon Jun 24 17:05:51 2002; Return-Path: Alatron1@aol.com; Delivery-Date: Wed May 22 14:06:55 2002
## Body (preview): <html>; ; <body>
## Header (preview): From lo4kirt7q37@hotmail.com  Mon Jun 24 17:05:48 2002; Return-Path: lo4kirt7q37@hotmail.com; Delivery-Date: Wed May 22 03:23:08 2002
## Body (preview): FIND OUT WHO THEY ARE CHATTING/E-MAILING WITH ALL THOSE HOURS!; ; Is your spouse cheating online?
## Header (preview): From cgarnett@airfrance.fr  Mon Jun 24 17:05:51 2002; Return-Path: cgarnett@airfrance.fr; Delivery-Date: Wed May 22 15:39:51 2002
## Body (preview): <html>; <head>;   <title>Secured Investements
## Warning in strsplit(email_text, "\n"): unable to translate 'From Andrea_Martinae@hotmail.com  Mon Jun 24 17:05:53 2002
## Return-Path: Andrea_Martinae@hotmail.com
## Delivery-Date: Wed May 22 20:36:26 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with E...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00421.540f120cafbc8a068fcc7f8a372a37b8 - missing value where TRUE/FALSE needed
## Header (preview): From nqtfr@sunpoint.net  Mon Jun 24 17:05:55 2002; Return-Path: nqtfr@sunpoint.net; Delivery-Date: Thu May 23 01:16:06 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From promos@famtriptours.com  Mon Jun 24 17:05:55 2002; Return-Path: promos@famtriptours.com; Delivery-Date: Thu May 23 01:51:44 2002
## Body (preview): This is an HTML email message.  If you see this, your mail client does not support HTML messages.; ; ------=_NextPart_CMIDKJHJKO
## Header (preview): From pfn@insurancemail.net  Mon Jun 24 17:05:54 2002; Return-Path: pfn@insurancemail.net; Delivery-Date: Thu May 23 00:30:09 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_223205_01C201AE.0A589530
## Header (preview): From sepstein0855n21@msn.com  Mon Jun 24 17:05:48 2002; Return-Path: sepstein0855n21@msn.com; Delivery-Date: Wed May 22 03:40:24 2002
## Body (preview): ------=_NextPart_000_00A6_48E31A8D.D6335E14; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From MegFromMars@aol.com  Mon Jun 24 17:05:55 2002; Return-Path: MegFromMars@aol.com; Delivery-Date: Thu May 23 02:13:13 2002
## Body (preview): <html>; ; <body>
## Warning in strsplit(email_text, "\n"): unable to translate 'From Jessica_Parker@hotmail.com  Mon Jun 24 17:05:56 2002
## Return-Path: Jessica_Parker@hotmail.com
## Delivery-Date: Thu May 23 03:02:25 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESM...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00427.c3d316b9e7fefe87329d31b09c1601fe - missing value where TRUE/FALSE needed
## Header (preview): From 1asave-ins1@catcha.com  Mon Jun 24 17:05:52 2002; Return-Path: 1asave-ins1@catcha.com; Delivery-Date: Wed May 22 20:18:26 2002
## Body (preview): <HTML><HEAD><TITLE>Insurance</TITLE><STYLE>td {font-family: arial}</STYLE><=; /HEAD>; <BODY BGCOLOR=3D#FDF5E6><DIV ALIGN=3DCENTER STYLE=3DFONT-FAMILY:TIMES><FON=
## Header (preview): From elizibeth-bradley@allexecs.org  Mon Jun 24 17:05:57 2002; Return-Path: elizibeth-bradley@allexecs.org; Delivery-Date: Thu May 23 03:45:27 2002
## Body (preview): Hi There,; ; I recently came across a copy of your resume I found on the
## Header (preview): From Kathrin1127q33@newmail.ru  Mon Jun 24 17:06:06 2002; Return-Path: Kathrin1127q33@newmail.ru; Delivery-Date: Thu May 23 16:07:44 2002
## Body (preview): ------=_NextPart_000_00E4_86E61E0A.B5488E11; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From super4_31r@pac24.westernbarge.com  Mon Jun 24 17:06:06 2002; Return-Path: super4_31r@pac24.westernbarge.com; Delivery-Date: Thu May 23 16:59:20 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From cr-fixer@caramail.com  Mon Jun 24 17:05:56 2002; Return-Path: cr-fixer@caramail.com; Delivery-Date: Thu May 23 02:27:57 2002
## Body (preview): <HTML><P ALIGN=3DCENTER><FONT  COLOR=3D"#ff0000" SIZE=3D3 PTSIZE=3D12 FAMIL=; Y=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"0"><B>Is Your Credit A Mess?</b></F=; ONT><B><FONT  COLOR=3D"#000000" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR=
## Header (preview): From investmentalert@freenet.co.uk  Mon Jun 24 17:06:06 2002; Return-Path: investmentalert@freenet.co.uk; Delivery-Date: Thu May 23 16:52:04 2002
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html;">
## Header (preview): From investmentalert@freenet.co.uk  Mon Jun 24 17:06:14 2002; Return-Path: investmentalert@freenet.co.uk; Delivery-Date: Fri May 24 10:13:10 2002
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html;">
## Header (preview): From hock@EASYCALL.NET.PH  Mon Jun 24 17:05:59 2002; Return-Path: hock@EASYCALL.NET.PH; Delivery-Date: Thu May 23 13:35:10 2002
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From gsl@insurancemail.net  Mon Jun 24 17:06:12 2002; Return-Path: gsl@insurancemail.net; Delivery-Date: Fri May 24 01:43:17 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_268694_01C20276.CCE3E8C0
## Header (preview): From one5367178543@netscape.com  Mon Jun 24 17:06:16 2002; Return-Path: one5367@netscape.com; Delivery-Date: Fri May 24 14:14:50 2002
## Body (preview): <html>; <body bgcolor="#FFFFFF" text="#000000" link="#6666CC" vlink="#999999" alink="#663333">; <table border="0" cellpadding="0" cellspacing="0" width="84%">
## Header (preview): From ecredit356281@yahoo.com  Mon Jun 24 17:06:15 2002; Return-Path: ecredit356281@yahoo.com; Delivery-Date: Fri May 24 12:54:28 2002
## Body (preview):     Do you have bad credit and want to have good credit?; ; You can now access and clear up your credit online!
## Header (preview): From bannedcd@btamail.net.cn  Mon Jun 24 17:06:10 2002; Return-Path: bannedcd@btamail.net.cn; Delivery-Date: Thu May 23 21:42:30 2002
## Body (preview): **************************************BULKER CD**********************; ************************MAY 22 2002*********************************************************************; **************************************************************************************************************
## Header (preview): From customerservice2217p83@spc.com  Mon Jun 24 17:06:15 2002; Return-Path: customerservice2217p83@spc.com; Delivery-Date: Fri May 24 12:51:52 2002
## Body (preview): ------=_NextPart_000_00D1_42B32C7D.B8655D52; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From Marlene8582x31@godisenga.com  Mon Jun 24 17:06:33 2002; Return-Path: Marlene8582x31@godisenga.com; Delivery-Date: Sat May 25 07:40:27 2002
## Body (preview): ------=_NextPart_000_00B0_58C75D0E.A4523D08; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From director@thk.jtb.co.jp  Mon Jun 24 17:06:15 2002; Return-Path: director@thk.jtb.co.jp; Delivery-Date: Fri May 24 12:47:44 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY leftmargin=3D=220=22 topmargin=3D=220=; =22 marginwidth=3D=220=22 marginheight=3D=220=22 bgcolor=3D=22=23FFFFFF=22><CENTER>=; <TABLE width=3D=22700=22 border=3D=221=22 cellspacing=3D=220=22 cellpadding=3D=2215=
## Header (preview): From sdfrenc@andrax.dk  Mon Jun 24 17:06:12 2002; Return-Path: sdfrenc@andrax.dk; Delivery-Date: Fri May 24 02:13:48 2002
## Body (preview): SHOCKING PAPARRAZZI NUDE CELEBRITY PICS & VIDEOS!; ; Naked Male and Female Stars caught on tape! Real
## Header (preview): From aaustin1306@aol.com  Mon Jun 24 17:06:17 2002; Return-Path: aaustin1306@aol.com; Delivery-Date: Fri May 24 14:17:57 2002
## Body (preview): <html>; ; <body>
## Header (preview): From ce4pagv9i07@hotmail.com  Mon Jun 24 17:06:12 2002; Return-Path: ce4pagv9i07@hotmail.com; Delivery-Date: Fri May 24 03:09:05 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>ViaPro</TITLE>
## Header (preview): From 20001a1856c25@excite.com  Mon Jun 24 17:06:11 2002; Return-Path: 20001a1856c25@excite.com; Delivery-Date: Thu May 23 22:35:22 2002
## Body (preview): ------=_NextPart_000_00B5_88C04C4C.B3167C81; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From dus@insurancemail.net  Mon Jun 24 17:06:30 2002; Return-Path: dus@insurancemail.net; Delivery-Date: Fri May 24 22:31:17 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_2AD835_01C20333.3B11C170
## Header (preview): From fast91gi@pac20.westernbarge.com  Mon Jun 24 17:06:30 2002; Return-Path: fast91gi@pac20.westernbarge.com; Delivery-Date: Sat May 25 03:18:00 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From malalad@mail.ru  Mon Jun 24 17:06:29 2002; Return-Path: malalad@mail.ru; Delivery-Date: Fri May 24 21:34:32 2002
## Body (preview): <html><head></head><body bgcolor=3D#FFFFFF text=3D#000000 leftmargin=3D0 to=; pmargin=3D0 marginwidth=3D0 marginheight=3D0 link=3D#008080 vlink=3D#00CCF=; F alink=3D#00FFFF><HR color=3D#050C87 noshade width=3D531><table cellpaddi=
## Header (preview): Received: from www.scmm.com.cn (IDENT:qmailr@[211.95.129.151]);    by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6IAmLt25648;    for <gibbs@midrange.com>; Thu, 18 Jul 2002 05:48:22 -0500
## Body (preview): <html>; ; <head>
## Header (preview): From hgh4616@eudoramail.com  Mon Jun 24 17:06:34 2002; Return-Path: hgh4616@eudoramail.com; Delivery-Date: Sat May 25 12:46:23 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Warning in strsplit(email_text, "\n"): unable to translate 'From 20143p85@yahoo.com  Mon Jun 24 17:06:23 2002
## Return-Path: 20143p85@yahoo.com
## Delivery-Date: Fri May 24 16:48:20 2002
## Received: from yahoo.com ([211.114.54.185]) by dogma.slashnull.org
##     (8.11.6/8.11.6) with SMTP id g4OFmBe13686 for <jm@jmason.or...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00452.f13574a4582c94daf2bd6668c1683eed - missing value where TRUE/FALSE needed
## Header (preview): From 102646c1737aaa002@email.com  Mon Jun 24 17:06:36 2002; Return-Path: 102646c1737aaa002@email.com; Delivery-Date: Sat May 25 16:44:32 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat, without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ; ; Click below to enter our web site:
## Header (preview): From Luhmaklein20@aol.com  Mon Jun 24 17:06:37 2002; Return-Path: Luhmaklein20@aol.com; Delivery-Date: Sat May 25 22:35:07 2002
## Body (preview): <html>; ; <body>
## Header (preview): From mort239o@pac25.westernbarge.com  Mon Jun 24 17:06:38 2002; Return-Path: mort239o@pac25.westernbarge.com; Delivery-Date: Sun May 26 01:37:53 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From qxeye@home.se  Mon Jun 24 17:06:37 2002; Return-Path: qxeye@home.se; Delivery-Date: Sun May 26 00:34:36 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From bmt988b@netscape.net  Mon Jun 24 17:06:38 2002; Return-Path: bmt988b@netscape.net; Delivery-Date: Sun May 26 04:15:26 2002
## Body (preview): This is a MIME Message; ; ------=_NextPart_000_007F_01BDF6C7.FABAC1B0
## Header (preview): From ge3pysk2d17@hotmail.com  Mon Jun 24 17:06:35 2002; Return-Path: ge3pysk2d17@hotmail.com; Delivery-Date: Sat May 25 16:34:10 2002
## Body (preview): <html>; <head>; </head>
## Header (preview): From gvyandreamadison55382@hotmail.com  Mon Jun 24 17:06:39 2002; Return-Path: gvyandreamadison55382@hotmail.com; Delivery-Date: Sun May 26 05:33:01 2002
## Body (preview): We are desperately looking for 100 lazy people ;             who wish to make lots of money without working.;
## Header (preview): From st4t6p42@prodigy.net  Mon Jun 24 17:06:39 2002; Return-Path: st4t6p42@prodigy.net; Delivery-Date: Sun May 26 07:49:51 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY BGCOLOR="WHITE" TEXT="BLACK">; <TABLE WIDTH=600><TR><TD><FONT SIZE=4 FACE="VERDANA">;
## Header (preview): From coleh_@hotmail.com  Mon Jun 24 17:06:29 2002; Return-Path: coleh_@hotmail.com; Delivery-Date: Fri May 24 20:27:32 2002
## Body (preview): <html>; ; <head>
## Header (preview): From drugstore7432e78@btamail.net.cn  Mon Jun 24 17:06:32 2002; Return-Path: drugstore7432e78@btamail.net.cn; Delivery-Date: Sat May 25 04:21:47 2002
## Body (preview): <html>; <head>;    <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): From fchestnut@eudoramail.com  Mon Jun 24 17:06:40 2002; Return-Path: fchestnut@eudoramail.com; Delivery-Date: Sun May 26 10:13:49 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jlnax@yahoo.com<BR><BR>; </div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Hum<!--jlnax-->an
## Warning in strsplit(email_text, "\n"): unable to translate 'From bjwbv@exite.com  Mon Jun 24 17:06:41 2002
## Return-Path: bjwbv@exite.com
## Delivery-Date: Sun May 26 18:57:30 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4QHvOe29701 for...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00464.d2f719c667d192af860572b1c858cc11 - missing value where TRUE/FALSE needed
## Header (preview): From sophia_komar@eudoramail.com  Mon Jun 24 17:06:45 2002; Return-Path: sophia_komar@eudoramail.com; Delivery-Date: Mon May 27 05:46:10 2002
## Body (preview): IMPORTANT INFORMATION:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From mnason7y7672826e06@hotmail.com  Mon Jun 24 17:06:53 2002; Return-Path: mnason7y7672826e06@hotmail.com; Delivery-Date: Tue May 28 01:30:48 2002
## Body (preview): ------=_NextPart_000_00D0_60C23C5B.C2145E20; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From freeerisa@insurancemail.net  Mon Jun 24 17:06:44 2002; Return-Path: freeerisa@insurancemail.net; Delivery-Date: Mon May 27 01:40:15 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_4A62C_01C204E3.5E68D0D0
## Warning in strsplit(email_text, "\n"): unable to translate 'From honey9531@btamail.net.cn  Mon Jun 24 17:06:43 2002
## Return-Path: honey9531@btamail.net.cn
## Delivery-Date: Mon May 27 01:35:03 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP i...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00468.fb2222cc49228bd3dac5481e670f208f - missing value where TRUE/FALSE needed
## Header (preview): From WebOffers@7a6a.net  Mon Jun 24 17:06:43 2002; Return-Path: WebOffers@7a6a.net; Delivery-Date: Mon May 27 01:37:31 2002
## Body (preview): <html>; <head>; <title>ReliaQuote - Save Up To 70% On Life Insurance</title>
## Header (preview): From ukjanewills@yahoo.com  Mon Jun 24 17:06:44 2002; Return-Path: ukjanewills@yahoo.com; Delivery-Date: Mon May 27 05:11:14 2002
## Body (preview): ==========================================================================================; THIS E-MAIL AD IS BEING SENT IN FULL COMPLIANCE WITH U.S. SENATE BILL 1618, TITLE #3, SECTION 301; TO REMOVE YOURSELF SEND A BLANK E-MAIL TO: removal992002@yahoo.com
## Warning in strsplit(email_text, "\n"): unable to translate 'From info@ipogea.com  Mon Jun 24 17:06:46 2002
## Return-Path: info@ipogea.com
## Delivery-Date: Mon May 27 10:46:30 2002
## Received: from smtp.sender.com (APastourelles-106-1-2-250.abo.wanadoo.fr
##     [80.14.235.250]) by dogma.slashnull.org (8.11.6/8.11.6) wit...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00471.df77fa930951f79466c195052ff56816 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From cweqx@fast.net.au  Mon Jun 24 17:06:42 2002
## Return-Path: cweqx@fast.net.au
## Delivery-Date: Mon May 27 00:28:39 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4QNSce10318...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00472.3c51cf86307bc98c54d856887a81e9ac - missing value where TRUE/FALSE needed
## Header (preview): From vqamntpaf@falconsoft.be  Mon Jun 24 17:06:48 2002; Return-Path: vqamntpaf@falconsoft.be; Delivery-Date: Mon May 27 12:56:55 2002
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 3.2//EN">; <HTML>;
## Header (preview): From vafyjerryoil2002@yahoo.co.uk  Mon Jun 24 17:06:48 2002; Return-Path: vafyjerryoil2002@yahoo.co.uk; Delivery-Date: Mon May 27 14:55:16 2002
## Body (preview): How would you like a 100% tax free Investment in Oil and Gas wells? ; Make over 100% annually and receive monthly tax free Income with ; very low risk. If you are liquid for a $10,000 investment, email your
## Warning in strsplit(email_text, "\n"): unable to translate 'From nzyndzcu@aol.com  Mon Jun 24 17:06:49 2002
## Return-Path: nzyndzcu@aol.com
## Delivery-Date: Mon May 27 16:01:39 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g4RF1Ie17362 f...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00475.3d497c7d96c51986316db566756ff35a - missing value where TRUE/FALSE needed
## Header (preview): From JBar204612@aol.com  Mon Jun 24 17:06:49 2002; Return-Path: JBar204612@aol.com; Delivery-Date: Mon May 27 17:23:51 2002
## Body (preview): <html>; ; <body>
## Header (preview): From jzlin@carmen.se  Mon Jun 24 17:06:45 2002; Return-Path: jzlin@carmen.se; Delivery-Date: Mon May 27 09:08:12 2002
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From WEBMASTER@theperfumebox.ie  Mon Jun 24 17:06:58 2002; Return-Path: mmailco@mail.com; Delivery-Date: Tue May 28 07:13:22 2002
## Body (preview): <HTML><HEAD>; <META http-equiv=Content-Type content="text/html; charset=windows-1252">; <STYLE>BODY {
## Header (preview): From B.Collin@dt.co.kr  Mon Jun 24 17:06:47 2002; Return-Path: B.Collin@dt.co.kr; Delivery-Date: Mon May 27 11:11:58 2002
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From cvru@hotmail.com  Mon Jun 24 17:06:48 2002; Return-Path: cvru@hotmail.com; Delivery-Date: Mon May 27 11:44:59 2002
## Body (preview): <html>; ; <head>
## Header (preview): From rw@insurancemail.net  Mon Jun 24 17:06:54 2002; Return-Path: rw@insurancemail.net; Delivery-Date: Tue May 28 02:16:26 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_281518_01C205B4.F6FEA190
## Header (preview): From mort239o@pac21.westernbarge.com  Mon Jun 24 17:06:56 2002; Return-Path: mort239o@pac21.westernbarge.com; Delivery-Date: Tue May 28 06:37:14 2002
## Body (preview): Protect yourself with an extended warranty for your car, minivan, truck or SUV. Buy DIRECT and SAVE money!;            ; Extend your existing Warranty.
## Header (preview): From ga4tabi8l67@hotmail.com  Mon Jun 24 17:06:50 2002; Return-Path: ga4tabi8l67@hotmail.com; Delivery-Date: Mon May 27 18:16:38 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>ViaPro</TITLE>
## Header (preview): From County-Origin.?@dogma.slashnull.org  Mon Jun 24 17:06:53 2002; Return-Path: inquiresto@yahoo.com; Delivery-Date: Tue May 28 01:59:57 2002
## Body (preview): ------=_NextPart_000_0066_62CFF34B.9C652FBA; Content-Type: text/html; Content-Transfer-Encoding: base64
## Header (preview): From Babyface72987@aol.com  Mon Jun 24 17:06:59 2002; Return-Path: Babyface72987@aol.com; Delivery-Date: Tue May 28 08:26:54 2002
## Body (preview): <html>; ; <body>
## Header (preview): From malalad@mail.ru  Mon Jun 24 17:06:55 2002; Return-Path: malalad@mail.ru; Delivery-Date: Tue May 28 04:58:04 2002
## Body (preview): <html><head></head><body bgcolor=3D#FFFFFF text=3D#000000 leftmargin=3D0 to=; pmargin=3D0 marginwidth=3D0 marginheight=3D0 link=3D#008080 vlink=3D#00CCF=; F alink=3D#00FFFF><HR color=3D#050C87 noshade width=3D531><table cellpaddi=
## Header (preview): From qulilehregsarr@hotmail.com  Mon Jun 24 17:06:50 2002; Return-Path: qulilehregsarr@hotmail.com; Delivery-Date: Mon May 27 21:45:30 2002
## Body (preview): <html>; <head>; <title>DEAR HOMEOWNER,</title>
## Header (preview): From kqpfs@switzerland.org  Mon Jun 24 17:07:03 2002; Return-Path: kqpfs@switzerland.org; Delivery-Date: Tue May 28 14:16:04 2002
## Body (preview): SPECIAL SITUATION ALERTS HOT PICK OF THE YEAR; ; Environmental Remediation Holding Corp. (OTCBB: ERHC)
## Header (preview): From asturo1265r24@msn.com  Mon Jun 24 17:06:50 2002; Return-Path: asturo1265r24@msn.com; Delivery-Date: Mon May 27 21:35:55 2002
## Body (preview): ------=_NextPart_000_00C3_53C41C0D.A0367D12; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From md2002@datacommarketing.com  Mon Jun 24 17:07:06 2002; Return-Path: md2002@datacommarketing.com; Delivery-Date: Tue May 28 14:49:41 2002
## Body (preview): <<< SPECIAL REVISED PRICE AS OF 5/24/2002 - HURRY QUANITIES WILL BE LIMITED >>>; ;
## Warning in strsplit(email_text, "\n"): unable to translate 'From sej3451840n22@excite.com  Mon Jun 24 17:07:53 2002
## Return-Path: sej3451840n22@excite.com
## Delivery-Date: Wed May 29 03:57:36 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP i...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00492.3052cad36d423e60195ce706c7bc0e6f - missing value where TRUE/FALSE needed
## Header (preview): From oa1t@mailexcite.com  Mon Jun 24 17:07:33 2002; Return-Path: oa1t@mailexcite.com; Delivery-Date: Tue May 28 18:21:20 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY BGCOLOR="WHITE" TEXT="BLACK">; <TABLE WIDTH=600><TR><TD><FONT SIZE=4 FACE="VERDANA">;
## Header (preview): From judithsteele@asean-mail.com  Mon Jun 24 17:07:00 2002; Return-Path: judithsteele@asean-mail.com; Delivery-Date: Tue May 28 10:59:11 2002
## Body (preview): <HTML> ; <BODY BGCOLOR="#ffffff" link="#0000FF" vlink="#0000FF" alink="#0000FF">; <table width="69%" border="1" cellspacing="2" cellpadding="25" height="345" align="center">
## Header (preview): From Sheila7316x53@hotmail.com  Mon Jun 24 17:07:36 2002; Return-Path: Sheila7316x53@hotmail.com; Delivery-Date: Tue May 28 21:01:35 2002
## Body (preview): Learn How To Make $8,000 within 7-14 days!; ; Get out of Debt in 60 days!
## Header (preview): From corina-toma@webmail.co.za  Mon Jun 24 17:07:39 2002; Return-Path: corina-toma@webmail.co.za; Delivery-Date: Tue May 28 22:06:35 2002
## Body (preview): PUBLIC ANNOUNCEMENT:; ; The new .NAME domain extension is currently being released to the general public. Unlike the original .COM and .NET domain names, the new .NAME domain was specifically created for individuals such as yourself. The .NAME domain appears in the format: FirstName.LastName.NAME For example, if your name is Monica Smith, then you can register a name such as monica.smith.name Technology experts predict that personalized domain names will soon be used as international identifiers much the same was that phone numbers are used today. For a limited time, you can pre-register your unique .NAME domain for only $10 (plus applicable registry fees) at: http://www.namesforeveryone.com
## Header (preview): From usafin@insurancemail.net  Mon Jun 24 17:07:50 2002; Return-Path: usafin@insurancemail.net; Delivery-Date: Wed May 29 02:04:04 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_385302_01C20675.6F2940B0
## Header (preview): From plhn242211075@yahoo.com  Mon Jun 24 17:48:29 2002; Return-Path: plhn242@yahoo.com; Delivery-Date: Wed Jun  5 21:05:17 2002
## Body (preview): PROMOTE YOUR PRODUCT OR SERVICE TO MILLIONS TODAY!; ; E-MAIL MARKETING
## Header (preview): From xo9qugs0v47@hotmail.com  Mon Jun 24 17:07:31 2002; Return-Path: xo9qugs0v47@hotmail.com; Delivery-Date: Tue May 28 17:53:35 2002
## Body (preview): <html>; <head>; </head>
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From aestrike@post.sk  Mon Jun 24 17:07:35 2002; Return-Path: aestrike@post.sk; Delivery-Date: Tue May 28 19:36:15 2002
## Body (preview): As to; ;
## Header (preview): From gjmy@public.ayptt.ha.cn  Mon Jun 24 17:08:00 2002; Return-Path: gyyyyy@public.ayptt.ha.cn; Delivery-Date: Wed May 29 10:49:10 2002
## Body (preview): Dear Sirs,; We know your esteemed company in beach towels from Internet, and pleased to introduce us as a leading producer of high quality 100% cotton velour printed towels in China, we sincerely hope to establish a long-term business relationship with your esteemed company in this field.;
## Header (preview): From gjmy@public.ayptt.ha.cn  Mon Jun 24 17:08:01 2002; Return-Path: gyyyyy@public.ayptt.ha.cn; Delivery-Date: Wed May 29 10:57:35 2002
## Body (preview): Dear Sirs,; We know your esteemed company in beach towels from Internet, and pleased to introduce us as a leading producer of high quality 100% cotton velour printed towels in China, we sincerely hope to establish a long-term business relationship with your esteemed company in this field.;
## Header (preview): From yovizopprus@excite.com  Mon Jun 24 17:08:04 2002; Return-Path: yovizopprus@excite.com; Delivery-Date: Wed May 29 13:33:11 2002
## Body (preview): <html>; ; <BODY onLoad="(window.open('http://81.9.8.38/bdvs/'))">
## Header (preview): From JobGal@Adsini.com  Mon Jun 24 17:08:03 2002; Return-Path: JobGal@Adsini.com; Delivery-Date: Wed May 29 12:20:44 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0108_01C206E1.3013D6D0
## Header (preview): From jyoung@btamail.net.cn  Mon Jun 24 17:08:41 2002; Return-Path: jyoung@btamail.net.cn; Delivery-Date: Thu May 30 22:32:02 2002
## Body (preview): <html>; <head><title>Doctors Online</title></head><body bgcolor=3D"#ffffff">; <p><font size=3D"+1" face=3D"Arial"><b>Viagra</b></font></p>
## Header (preview): From miononwifeil@hotmail.com  Mon Jun 24 17:07:43 2002; Return-Path: miononwifeil@hotmail.com; Delivery-Date: Wed May 29 01:17:30 2002
## Body (preview): <html>; <head>; <title>DEAR HOMEOWNER,</title>
## Header (preview): From morindin176@association.co.uk  Mon Jun 24 17:07:48 2002; Return-Path: morindin176@association.co.uk; Delivery-Date: Wed May 29 01:54:37 2002
## Body (preview): <HTML><FONT  COLOR=3D"#0000ff" BACK=3D"#ffffff" =; style=3D"BACKGROUND-COLOR: #ffffff" SIZE=3D3 PTSIZE=3D12 =; FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"0"><B><BR><BR>Thank you for =
## Header (preview): From abl1l1l231ink@btamail.net.cn  Mon Jun 24 17:08:45 2002; Return-Path: abl1l1l231ink@btamail.net.cn; Delivery-Date: Fri May 31 03:03:55 2002
## Body (preview): We offer a product that will let you develop a customer base for your business in no time. We have compiled information over the Internet on every US business. One single CD contains data on 12 million US companies - sorted by Yellow Pages Categories and SIC Codes.; ; Accuracy? Freshness? We have sold thousands of CDs, and haven't had one complaint. We are committed to deliver the best quality data that is highly rewarding to your business. How?
## Header (preview): From abl1l1l231ink@btamail.net.cn  Mon Jun 24 17:08:08 2002; Return-Path: abl1l1l231ink@btamail.net.cn; Delivery-Date: Wed May 29 19:36:31 2002
## Body (preview): We offer a product that will let you develop a customer base for your business in no time. We have compiled information over the Internet on every US business. One single CD contains data on 12 million US companies - sorted by Yellow Pages Categories and SIC Codes.; ; Accuracy? Freshness? We have sold thousands of CDs, and haven't had one complaint. We are committed to deliver the best quality data that is highly rewarding to your business. How?
## Header (preview): From info@resumevalet.com  Mon Jun 24 17:08:09 2002; Return-Path: info@resumevalet.com; Delivery-Date: Wed May 29 19:53:39 2002
## Body (preview): Dear Candidate,; ; We recently came across a posting of your resume on the Internet.   After our
## Header (preview): From hgh8728@polbox.com  Mon Jun 24 17:08:15 2002; Return-Path: hgh8728@polbox.com; Delivery-Date: Wed May 29 23:48:14 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From amc@insurancemail.net  Mon Jun 24 17:08:16 2002; Return-Path: amc@insurancemail.net; Delivery-Date: Thu May 30 00:37:02 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_3C9CE7_01C2072F.40093DC0
## Header (preview): From turnkeyim@hotmail.com  Mon Jun 24 17:08:21 2002; Return-Path: turnkeyim@hotmail.com; Delivery-Date: Thu May 30 03:31:52 2002
## Body (preview): I am sending you this message because we have communicated in the past about business opportunities. I hope you will enjoy this one as much as I do.; Turn Your PayPal Account Into A Non-Stop Cash Machine!; Re-Occurring 100% Commissions Paid Directly To Your PayPal Account!
## Header (preview): From gwvizopprus@excite.com  Mon Jun 24 17:08:22 2002; Return-Path: gwvizopprus@excite.com; Delivery-Date: Thu May 30 06:44:37 2002
## Body (preview): <html>; ; <BODY onLoad="(window.open('http://81.9.8.38/bdvs/'))">
## Header (preview): From twagar32t@aol.com  Mon Jun 24 17:08:15 2002; Return-Path: twagar32t@aol.com; Delivery-Date: Wed May 29 23:17:30 2002
## Body (preview): <html>; ; <head>
## Header (preview): From fvgdouiqvg@vol.com.ar  Mon Jun 24 17:08:22 2002; Return-Path: fvgdouiqvg@vol.com.ar; Delivery-Date: Thu May 30 09:05:43 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From lando0mau@netscape.net  Mon Jun 24 17:08:24 2002; Return-Path: lando0mau@netscape.net; Delivery-Date: Thu May 30 10:14:36 2002
## Body (preview): Certain chances only come around every few; decades or so. This is one. Why you ask?;
## Header (preview): From mrchservice189@aol.com  Mon Jun 24 17:48:36 2002; Return-Path: mrchservice@aol.com; Delivery-Date: Thu Jun  6 12:24:52 2002
## Body (preview): <html>; A<!--mom and dad-->ccept C<!--grandma and grandpa-->redit C<!--aunt kate-->ards - Everyone A<!--uncle don-->pproved<p>; NO C<!--hi family-->REDIT CH<!--i love you all-->ECKS
## Header (preview): From d4lf@yahoo.com  Mon Jun 24 17:08:27 2002; Return-Path: d4lf@yahoo.com; Delivery-Date: Thu May 30 15:46:59 2002
## Body (preview): <HTML>; <HEAD>;
## Header (preview): From tesco.ie@emv2.com  Mon Jun 24 17:08:39 2002; Return-Path: tesco.ie@emv2.com; Delivery-Date: Thu May 30 19:21:32 2002
## Body (preview): --1715101671.1022782885778.JavaMail.root.smtp4; Content-Type: text/plain; charset=iso-8859-1; Content-Transfer-Encoding: 7bit
## Header (preview): From sPVF2.zzdEHsQ_VS@emarketinggurus.com  Mon Jun 24 17:08:40 2002; Return-Path: sPVF2.zzdEHsQ_VS@emarketinggurus.com; Delivery-Date: Thu May 30 22:17:29 2002
## Body (preview): BUY 2 ADULT DVDs AT REGULAR PRICE AND GET A THIRD XXX DVD FOR FREE!!; ; VISIT US AT http://www.hotdvds.org
## Header (preview): From mail0206@btamail.net.cn  Mon Jun 24 17:08:42 2002; Return-Path: mail0206@btamail.net.cn; Delivery-Date: Thu May 30 22:48:40 2002
## Body (preview): Hotels Etc. is giving away 10,000 of our $495 Travel Packages FREE, to help the USA in the promotion of the travel business. The first 10,000 customers who sign up will receive over $5000 worth of other free products.;  ; This includes:
## Header (preview): From hotkoarohlopme@hotmail.com  Mon Jun 24 17:08:45 2002; Return-Path: hotkoarohlopme@hotmail.com; Delivery-Date: Fri May 31 03:14:45 2002
## Body (preview): <html>; <head>; <title>DEAR HOMEOWNER,</title>
## Header (preview): From hok_stein3380@eudoramail.com  Mon Jun 24 17:08:47 2002; Return-Path: hok_stein3380@eudoramail.com; Delivery-Date: Fri May 31 03:43:10 2002
## Body (preview): <html><body><table border="3" width="83%" height="186" cellspacing="4" cellpadding="4" bordercolor="#000080">;   <tr><td width="100%" height="1" colspan="2" bgcolor="#FFFF00">;       <p align="center"><b><font size="5" face="Arial Black"><img border="0" src="http://81.9.8.40/images/nozzle.jpg" align="left"></font></b><p align="center">&nbsp;<p align="center"><b><font size="5" face="Arial Black">Increase
## Header (preview): From mort239o@xum2.xumx.com  Mon Jun 24 17:08:50 2002; Return-Path: mort239o@xum2.xumx.com; Delivery-Date: Fri May 31 06:02:33 2002
## Body (preview): Save thousands by refinancing now. Apply from the privacy of your home and receive a FREE no-obligation loan quote.; http://211.78.96.11/acct/morquote/;
## Header (preview): From mojos@ccp.com  Mon Jun 24 17:08:46 2002; Return-Path: mojos@ccp.com; Delivery-Date: Fri May 31 03:31:08 2002
## Body (preview): <html>; <body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; Hello, jm@netnoteinc.com<BR>
## Header (preview): From vbi@insurancemail.net  Mon Jun 24 17:08:47 2002; Return-Path: vbi@insurancemail.net; Delivery-Date: Fri May 31 03:52:23 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_40E492_01C20813.27572AA0
## Warning in strsplit(email_text, "\n"): unable to translate 'From sje726@aol.com  Mon Jun 24 17:08:48 2002
## Return-Path: knoshaug@host13.christianwebhost.com
## Delivery-Date: Fri May 31 05:08:12 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00528.a7b02c9abd9fb303615a956bbc4af548 - missing value where TRUE/FALSE needed
## Header (preview): From dscfahy@eircom.net  Mon Jun 24 17:08:53 2002; Return-Path: dscfahy@eircom.net; Delivery-Date: Fri May 31 09:53:45 2002
## Body (preview): Hello you two,; ; I am so sorry Catherine for not writing recently. I have just been vv busybeing a working mother and sometimes it all gets too much you know!! i cannot wait to see you both although we may meet at the airport on the 16/6 as that's the day we're going to france but i will see you both at Bronagh's house for her 30th which we're going to on the way back from the airport. I am so excited about seeing you!!! liitle Eva ( Aine) was born on Tuesday
## Header (preview): From GreatStockOpportunity@itera.ru  Mon Jun 24 17:08:54 2002; Return-Path: GreatStockOpportunity@itera.ru; Delivery-Date: Fri May 31 11:24:16 2002
## Body (preview): <=21DOCTYPE HTML PUBLIC =22-//W3C//DTD HTML 4.0 Transitional//EN=22>; <HTML><HEAD><TITLE></TITLE>; <META http-equiv=3DContent-Type content=3D=22text/html; charset=3Dwindows-1=
## Header (preview): From moneymaker@yahoo.com  Mon Jun 24 17:08:44 2002; Return-Path: moneymaker@yahoo.com; Delivery-Date: Thu May 30 23:41:43 2002
## Body (preview): <html>; ;
## Header (preview): From research_package@nan.ne.jp  Mon Jun 24 17:08:55 2002; Return-Path: research_package@nan.ne.jp; Delivery-Date: Fri May 31 12:22:40 2002
## Body (preview): <=21DOCTYPE HTML PUBLIC =22-//W3C//DTD HTML 4.0 Transitional//EN=22>; <HTML><HEAD><TITLE></TITLE>; <META http-equiv=3DContent-Type content=3D=22text/html; charset=3Dwindows-1=
## Header (preview): From fdg4a84@yahoo.com  Mon Jun 24 17:08:05 2002; Return-Path: fdg4a84@yahoo.com; Delivery-Date: Wed May 29 14:50:12 2002
## Body (preview): PEPPER SPRAY SELF DEFENSE SYSTEM...THIS SMALL INVESTMENT COULD; SAVE YOUR LIFE!;
## Header (preview): From a1insure101a@altavista.se  Mon Jun 24 17:08:33 2002; Return-Path: a1insure101a@altavista.se; Delivery-Date: Thu May 30 18:02:13 2002
## Body (preview): <html>; <head>; <body>
## Header (preview): From begjy0PwN@homebusiness.com  Mon Jun 24 17:09:11 2002; Return-Path: begjy0PwN@homebusiness.com; Delivery-Date: Fri May 31 20:29:41 2002
## Body (preview): Fighting a Traffic Ticket?  Going through a Divorce?; ; You need an Attorney!
## Header (preview): From masterpc@carolina.rr.com  Mon Jun 24 17:08:37 2002; Return-Path: masterpc@carolina.rr.com; Delivery-Date: Thu May 30 19:08:05 2002
## Body (preview): Dear fellow eBay user,; ; I listed this CD on eBay a few months ago and here's
## Header (preview): From webmaster@youwin2.net  Mon Jun 24 17:08:53 2002; Return-Path: webmaster@youwin2.net; Delivery-Date: Fri May 31 10:01:17 2002
## Body (preview): Hi,;    ;   I would like you to enjoy the same success
## Header (preview): From jjc7y7676668t04@hotmail.com  Mon Jun 24 17:08:42 2002; Return-Path: jjc7y7676668t04@hotmail.com; Delivery-Date: Thu May 30 23:16:37 2002
## Body (preview): ------=_NextPart_000_00C3_00C72E6D.E0387B16; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From noonelists8387@eudoramail.com  Mon Jun 24 17:09:03 2002; Return-Path: noonelists8387@eudoramail.com; Delivery-Date: Fri May 31 15:41:20 2002
## Body (preview): Dear Consumers, Increase your Business Sales! ; ; How??
## Header (preview): From arquisgrp@post.sk  Mon Jun 24 17:50:23 2002; Return-Path: arquisgrp@post.sk; Delivery-Date: Sat Jun  1 23:48:34 2002
## Body (preview): With regards to; ;
## Header (preview): From pekerhead@postino.ch  Mon Jun 24 17:09:04 2002; Return-Path: pekerhead@postino.ch; Delivery-Date: Fri May 31 15:47:15 2002
## Body (preview): <HTML><HEAD></HEAD><BODY text=3D#000000 bgColor=3D#ffffff><DIV align=3Dcent=; er><TABLE borderColor=3D#0066cc cellSpacing=3D0 cellPadding=3D0 width=3D69=; 0 border=3D1><TBODY><TR><TD><TABLE cellSpacing=3D0 cellPadding=3D0 width=3D=
## Header (preview): From qa4wudt5x333@hotmail.com  Mon Jun 24 17:08:58 2002; Return-Path: qa4wudt5x333@hotmail.com; Delivery-Date: Fri May 31 14:48:32 2002
## Body (preview): FIND OUT WHO THEY ARE CHATTING/E-MAILING WITH ALL THOSE HOURS!; ; Is your spouse cheating online?
## Header (preview): From ltcc@insurancemail.net  Mon Jun 24 17:48:58 2002; Return-Path: ltcc@insurancemail.net; Delivery-Date: Sat Jun  1 03:09:50 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_18A46D_01C208DC.75F3BB50
## Header (preview): From mort239o@xum9.xumx.com  Mon Jun 24 17:48:23 2002; Return-Path: mort239o@xum9.xumx.com; Delivery-Date: Sat Jun  1 06:39:56 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From vret21v2137@yahoo.com  Mon Jun 24 17:49:10 2002; Return-Path: vret21v2137@yahoo.com; Delivery-Date: Sat Jun  8 17:01:59 2002
## Body (preview): <html>; <div bgcolor=3D"#FFFFCC">;
## Header (preview): From gymad@olemail.com  Mon Jun 24 17:51:53 2002; Return-Path: gymad@olemail.com; Delivery-Date: Sun Jun  2 12:18:27 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From targetemailextractor@btamail.net.cn  Mon Jun 24 17:49:40 2002; Return-Path: targetemailextractor@btamail.net.cn; Delivery-Date: Sat Jun  1 17:51:09 2002
## Body (preview): =3CHTML=3E=3CHEAD=3E; =3CBODY bgColor=3D#ffccff=3E; =3CTABLE border=3D0 cellPadding=3D0 cellSpacing=3D0 width=3D475=3E
## Header (preview): From jonas.greutert@netmodule.com  Mon Jun 24 17:50:12 2002; Return-Path: jimmiester@hanmesoft.co.kr; Delivery-Date: Sat Jun  1 23:10:57 2002
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; ; <html>
## Header (preview): From Emailcentre@up369.com  Mon Jun 24 17:49:51 2002; Return-Path: Emailcentre@up369.com; Delivery-Date: Sat Jun  1 18:45:24 2002
## Body (preview): <html>; ; <head>
## Header (preview): From Emailcentre@up369.com  Mon Jun 24 17:49:58 2002; Return-Path: Emailcentre@up369.com; Delivery-Date: Sat Jun  1 18:45:32 2002
## Body (preview): <html>; ; <head>
## Header (preview): From death_71@hotmail.com  Mon Jun 24 17:08:51 2002; Return-Path: death_71@hotmail.com; Delivery-Date: Fri May 31 07:49:46 2002
## Body (preview): <html>; ; <head>
## Header (preview): From n19616@i-france.com  Mon Jun 24 17:50:47 2002; Return-Path: n19616@i-france.com; Delivery-Date: Sun Jun  2 01:11:05 2002
## Body (preview): <html>; ; <body>
## Header (preview): From freequote@2x12.2xthemoney.com  Mon Jun 24 17:50:56 2002; Return-Path: freequote@2x12.2xthemoney.com; Delivery-Date: Sun Jun  2 02:21:55 2002
## Body (preview): How would you like a Top Rated Law Firm working for you, your family and your business for only pennies a day?;    ; CLICK HERE
## Warning in strsplit(email_text, "\n"): unable to translate 'From bebkokori@eircom.net  Mon Jun 24 17:51:10 2002
## Return-Path: bebkokori@eircom.net
## Delivery-Date: Sun Jun  2 02:23:19 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g521NI...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00554.c325ab7400fb7e3f053ed0cac4ed7545 - missing value where TRUE/FALSE needed
## Header (preview): From daniele94@hotmail.com  Mon Jun 24 17:48:05 2002; Return-Path: daniele94@hotmail.com; Delivery-Date: Sat Jun  1 02:47:17 2002
## Body (preview): <html>; ; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From beginner@linux.org  Mon Jun 24 17:51:19 2002
## Return-Path: beginner@linux.org
## Delivery-Date: Sun Jun  2 04:03:42 2002
## Received: from linux.org ([210.204.162.254]) by dogma.slashnull.org
##     (8.11.6/8.11.6) with SMTP id g5233XO09773 for <webmaster@e...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00556.098b57f5108ba34d21825f176e492786 - missing value where TRUE/FALSE needed
## Header (preview): From News@no.hostname.supplied  Tue Jul  2 13:05:50 2002; Return-Path: <News@no.hostname.supplied>; Delivered-To: yyyy@localhost.labs.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <html>; <body bgcolor="#FFFFFF" marginwidth="0" marginheight="0" topmargin="0" leftmargin="0">
## Header (preview): From hgh_usa@Flashmail.com  Mon Jun 24 17:51:36 2002; Return-Path: hgh_usa@Flashmail.com; Delivery-Date: Sun Jun  2 07:51:55 2002
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From nebula_orange2000@lycos.com  Mon Jun 24 17:51:40 2002; Return-Path: nebula_orange2000@lycos.com; Delivery-Date: Sun Jun  2 10:33:33 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>Learch</TITLE>
## Header (preview): From hok_stein5772@eudoramail.com  Mon Jun 24 17:51:44 2002; Return-Path: hok_stein5772@eudoramail.com; Delivery-Date: Sun Jun  2 11:27:29 2002
## Body (preview): <html><body><table border="3" width="83%" height="186" cellspacing="4" cellpadding="4" bordercolor="#000080">;   <tr><td width="100%" height="1" colspan="2" bgcolor="#FFFF00">;       <p align="center"><b><font size="5" face="Arial Black"><img border="0" src="http://81.9.8.40/images/nozzle.jpg" align="left"></font></b><p align="center">&nbsp;<p align="center"><b><font size="5" face="Arial Black">Increase
## Header (preview): From kuouh@kali.com.cn  Mon Jun 24 17:51:47 2002; Return-Path: kuouh@kali.com.cn; Delivery-Date: Sun Jun  2 12:10:47 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): From georgiana_sprott@aemail4u.com  Mon Jun 24 17:52:21 2002; Return-Path: georgiana_sprott@aemail4u.com; Delivery-Date: Sun Jun  2 16:48:25 2002
## Body (preview): PUBLIC ANNOUNCEMENT:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From conucong@yahoo.com  Mon Jun 24 17:51:27 2002; Return-Path: conucong@yahoo.com; Delivery-Date: Sun Jun  2 04:08:34 2002
## Body (preview): Newest Universal Cable Descrambler Box:  ViewMaster 4000 +;  ; *** Watch ALL channels your local cable company offer.
## Header (preview): From mg@insurancemail.net  Mon Jun 24 17:52:29 2002; Return-Path: mg@insurancemail.net; Delivery-Date: Sun Jun  2 22:01:24 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_49E3B3_01C20A41.97599E20
## Header (preview): From egtan@yahoo.com  Mon Jun 24 17:51:57 2002; Return-Path: egtan@yahoo.com; Delivery-Date: Sun Jun  2 14:22:16 2002
## Body (preview): Hi There,; ; I wanted to spread this good karma to you.
## Header (preview): From egtan@yahoo.com  Mon Jun 24 17:52:08 2002; Return-Path: egtan@yahoo.com; Delivery-Date: Sun Jun  2 14:23:08 2002
## Body (preview): Hi There,; ; I wanted to spread this good karma to you.
## Header (preview): From ko0vugq3z833@hotmail.com  Mon Jun 24 17:52:25 2002; Return-Path: ko0vugq3z833@hotmail.com; Delivery-Date: Sun Jun  2 17:37:37 2002
## Body (preview): FIND OUT WHO THEY ARE CHATTING/E-MAILING WITH ALL THOSE HOURS!; ; Is your spouse cheating online?
## Header (preview): From reply@seekercenter.net  Mon Jun 24 17:52:41 2002; Return-Path: reply@seekercenter.net; Delivery-Date: Mon Jun  3 06:15:58 2002
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From return@trafficmagnet.net  Mon Jun 24 17:52:44 2002; Return-Path: return@trafficmagnet.net; Delivery-Date: Mon Jun  3 08:59:00 2002
## Body (preview): --297430269.1023090993312.JavaMail.SYSTEM.emaserver; Content-Type: text/plain; charset=utf-8; Content-Transfer-Encoding: 7bit
## Header (preview): From hdtrade@dreamwiz.com  Mon Jun 24 17:52:50 2002; Return-Path: hdtrade@dreamwiz.com; Delivery-Date: Mon Jun  3 09:02:07 2002
## Body (preview): <html>; ; <head>
## Header (preview): From vag7pu@worldnet.att.net  Mon Jun 24 17:53:36 2002; Return-Path: vag7pu@worldnet.att.net; Delivery-Date: Mon Jun  3 15:58:21 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY BGCOLOR="WHITE" TEXT="BLACK">; <TABLE WIDTH=600><TR><TD><FONT SIZE=4 FACE="VERDANA">;
## Header (preview): From WEBMASTER@TAIONE.ORG  Mon Jun 24 17:54:23 2002; Return-Path: mmailco@mail.com; Delivery-Date: Tue Jun  4 07:39:11 2002
## Body (preview): 1) Let's say you... Sell a $24.95 PRODUCT or SERVICE.; 2) Let's say you... Broadcast Email FREE to 500,000 PEOPLE DAILY.; 3) Let's say you... Receive JUST 1 ORDER for EVERY 2,500 EMAILS.
## Header (preview): From ong@litou.com  Mon Jun 24 17:53:04 2002; Return-Path: ong@litou.com; Delivery-Date: Mon Jun  3 12:18:39 2002
## Body (preview): ------=_NextPart_84815C5ABAF209EF376268C8; Content-type: text/plain; charset="iso-8859-1";
## Header (preview): From majee270@excite.com  Mon Jun 24 17:53:15 2002; Return-Path: majee270@excite.com; Delivery-Date: Mon Jun  3 13:34:58 2002
## Body (preview): You are receiving this email because you have expressed an interest in receiving information about online business opportunities. If this is erroneous then please accept my most sincere apology. If you wish to be removed from this list then simply reply to this message and put "remove" in the subject line - Thank you.; ; - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
## Header (preview): From hfcfyouroffers676@hotmail.com  Mon Jun 24 17:53:22 2002; Return-Path: hfcfyouroffers676@hotmail.com; Delivery-Date: Mon Jun  3 13:55:40 2002
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Header (preview): From hfcfyouroffers676@hotmail.com  Mon Jun 24 17:53:27 2002; Return-Path: hfcfyouroffers676@hotmail.com; Delivery-Date: Mon Jun  3 13:55:56 2002
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Header (preview): From wiwwyouroffers676@hotmail.com  Mon Jun 24 17:53:31 2002; Return-Path: wiwwyouroffers676@hotmail.com; Delivery-Date: Mon Jun  3 13:58:14 2002
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'From targetemailextractor@btamail.net.cn  Mon Jun 24 17:53:41 2002
## Return-Path: targetemailextractor@btamail.net.cn
## Delivery-Date: Mon Jun  3 16:23:10 2002
## Received: from c-excellence.com ([61.135.129.160]) by dogma.slashnull.org
##     (8.11.6/8.11.6) wi...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00579.d94454f0e596c00bf22ce1f315427143 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From targetemailextractor@btamail.net.cn  Mon Jun 24 17:53:11 2002
## Return-Path: targetemailextractor@btamail.net.cn
## Delivery-Date: Mon Jun  3 13:00:57 2002
## Received: from mail.GREENMETRO.COM ([61.129.121.193]) by
##     dogma.slashnull.org (8.11.6/8.11.6)...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00580.c3b23134b4767f5e796d0df997fede33 - missing value where TRUE/FALSE needed
## Header (preview): From amolebolle@aol.com  Mon Jun 24 17:54:03 2002; Return-Path: amolebolle@aol.com; Delivery-Date: Mon Jun  3 21:20:35 2002
## Body (preview): <html>; ; <body>
## Header (preview): From jennifer@attorneyconnectionsinc.com  Mon Jun 24 17:54:23 2002; Return-Path: jennifer@attorneyconnectionsinc.com; Delivery-Date: Tue Jun  4 08:30:48 2002
## Body (preview): <html>; <head>; <title>MCLE Seminars</title>
## Header (preview): From blease@insurancemail.net  Mon Jun 24 17:54:18 2002; Return-Path: blease@insurancemail.net; Delivery-Date: Tue Jun  4 02:39:46 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_4E25A6_01C20B30.71108900
## Header (preview): From andramariehuaa@mail.com  Mon Jun 24 17:52:38 2002; Return-Path: andramariehuaa@mail.com; Delivery-Date: Mon Jun  3 04:49:51 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat, without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ; ; Click below to enter our web site:
## Header (preview): From pwuek@personal.ro  Mon Jun 24 17:54:26 2002; Return-Path: pwuek@personal.ro; Delivery-Date: Tue Jun  4 10:24:25 2002
## Body (preview): <html>; ; <body>
## Header (preview): From terrychan@aviareps.co.ru  Mon Jun 24 17:54:09 2002; Return-Path: terrychan@aviareps.co.ru; Delivery-Date: Mon Jun  3 21:41:03 2002
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From pharmacy5566s12@yahoo.com  Mon Jun 24 17:48:07 2002; Return-Path: pharmacy5566s12@yahoo.com; Delivery-Date: Tue Jun  4 23:51:02 2002
## Body (preview): <html>; <head>;    <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N8n5hY089726
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Tue, 23 Jul 2002 03:49:0...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00588.44b644374b89ba4885f91f0ed836e622 - missing value where TRUE/FALSE needed
## Header (preview): From D.Black@cbs.dk  Mon Jun 24 17:54:18 2002; Return-Path: D.Black@cbs.dk; Delivery-Date: Tue Jun  4 00:52:17 2002
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From mdtlamp2231@posithiv.ch  Mon Jun 24 17:54:19 2002; Return-Path: mdtlamp2231@posithiv.ch; Delivery-Date: Tue Jun  4 04:13:49 2002
## Body (preview): <HTML><FONT  COLOR=3D"#0000ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COLOR:=;  #ffffff" SIZE=3D3 PTSIZE=3D12 FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D=; "0"><marquee><B><center><font color=3Dwhite size=3D2 face=3Darioso><i>xXxX=
## Header (preview): From curazyrdng@263.net  Mon Jun 24 17:54:28 2002; Return-Path: curazyrdng@263.net; Delivery-Date: Tue Jun  4 15:26:54 2002
## Body (preview): <html>; ; <body>
## Header (preview): From gort44@excite.com  Mon Jun 24 17:54:21 2002; Return-Path: gort44@excite.com; Delivery-Date: Tue Jun  4 05:31:16 2002
## Body (preview): Mortgage Lenders & Brokers Are Ready to;         compete for your business.;
## Header (preview): From ether@buttonpushers.com  Mon Jun 24 17:48:34 2002; Return-Path: ether@buttonpushers.com; Delivery-Date: Thu Jun  6 06:31:05 2002
## Body (preview): <html><body>; <p align=3D"left"><b><font size=3D"3" face=3D"Arial">; Lose weight while building lean muscle mass<br>
## Header (preview): From sabrina1119@msn.com  Mon Jun 24 17:54:31 2002; Return-Path: sabrina1119@msn.com; Delivery-Date: Tue Jun  4 19:39:10 2002
## Body (preview): <html><body>; ; <table bgcolor=3D"663399" border=3D"2" width=3D"999" cellspacing=3D"0" cel=
## Header (preview): From SpecialBuy@tuxtla.com  Mon Jun 24 17:54:27 2002; Return-Path: SpecialBuy@tuxtla.com; Delivery-Date: Tue Jun  4 12:37:05 2002
## Body (preview): <html>; ; <head>
## Header (preview): From hothorn@concentric.net  Mon Jun 24 17:48:15 2002; Return-Path: hothorn@concentric.net; Delivery-Date: Wed Jun  5 12:57:02 2002
## Body (preview): <html>; <head>; <title>Have a BLAST in bed</title>
## Header (preview): From webranking05@desertmail.com  Mon Jun 24 17:48:16 2002; Return-Path: webranking05@desertmail.com; Delivery-Date: Wed Jun  5 13:42:39 2002
## Body (preview): To remove see below.; ; I work with a company that submits
## Header (preview): From am@insurancemail.net  Mon Jun 24 17:48:08 2002; Return-Path: am@insurancemail.net; Delivery-Date: Wed Jun  5 01:23:46 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_529F67_01C20BE4.AE80C980
## Header (preview): From blatin281841@mikes.ca  Mon Jun 24 17:54:30 2002; Return-Path: blatin281841@mikes.ca; Delivery-Date: Tue Jun  4 19:09:39 2002
## Body (preview): <HTML><BR><FONT  COLOR=3D"#ff00ff" BACK=3D"#ffffff" style=3D"BACKGROUND-COL=; OR: #ffffff" SIZE=3D3 PTSIZE=3D12><center>x=3D=3Dx*x=3D=3Dxx=3D=3Dx*x=3D=3D=; xx=3D=3Dx*x=3D=3Dxx=3D=3Dx*x=3D=3Dxx=3D=3Dx*x=3D=3Dxx=3D=3Dx*x=3D=3Dx</cen=
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From cali@coinet.com  Mon Jun 24 17:54:29 2002; Return-Path: cali@coinet.com; Delivery-Date: Tue Jun  4 16:55:34 2002
## Body (preview): Dear fellow eBay user,; ; I listed this CD on eBay a few months ago and here's
## Header (preview): From opminee123123@yahoo.com  Mon Jun 24 17:48:13 2002; Return-Path: opminee123123@yahoo.com; Delivery-Date: Wed Jun  5 12:16:05 2002
## Body (preview): <html>; ; <body onLoad="(window.open('http://66.231.133.201/nationwide/'))" link="#0000FF" vlink="#0000FF" alink="#0000FF">
## Header (preview): From cgarnett@bording.dk  Mon Jun 24 17:48:07 2002; Return-Path: cgarnett@bording.dk; Delivery-Date: Wed Jun  5 00:23:50 2002
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From hok_stein6877@Flashmail.com  Mon Jun 24 17:50:42 2002; Return-Path: hok_stein6877@Flashmail.com; Delivery-Date: Thu Jun 13 00:15:15 2002
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From babegirl2u473666p42@z.com  Mon Jun 24 17:48:37 2002; Return-Path: babegirl2u473666p42@z.com; Delivery-Date: Thu Jun  6 12:57:17 2002
## Body (preview): ------=_NextPart_000_00D2_37D32C7A.E3536A81; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From pwicnaedrist@hotmail.com  Mon Jun 24 17:48:08 2002; Return-Path: pwicnaedrist@hotmail.com; Delivery-Date: Wed Jun  5 04:23:29 2002
## Body (preview): <html>; <head>; <title>DEAR HOMEOWNER,</title>
## Header (preview): From hrefyrbafo@hotmail.com  Mon Jun 24 17:48:09 2002; Return-Path: hrefyrbafo@hotmail.com; Delivery-Date: Wed Jun  5 05:01:15 2002
## Body (preview): <html>; <HEAD>; <TITLE>webCREDIT</TITLE>
## Header (preview): From WebConference@ananzi.co.za  Mon Jun 24 17:48:09 2002; Return-Path: WebConference@ananzi.co.za; Delivery-Date: Wed Jun  5 07:44:39 2002
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Warning in strsplit(email_text, "\n"): unable to translate 'From cristobal6@hotmail.com  Mon Jun 24 17:48:10 2002
## Return-Path: cristobal6@hotmail.com
## Delivery-Date: Wed Jun  5 08:08:50 2002
## Received: from executive01.amerecruitment.com.au (eth1771.sa.adsl.on.net
##     [150.101.235.234]) by dogma.slashnull.org (8....' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00609.4dfe7912017772587dc62fecc3cf6553 - missing value where TRUE/FALSE needed
## Header (preview): From moreinformation@btamail.net.cn  Mon Jun 24 17:48:28 2002; Return-Path: moreinformation@btamail.net.cn; Delivery-Date: Wed Jun  5 20:45:31 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_257750315551863
## Header (preview): From rom2002@justice.com  Mon Jun 24 17:48:30 2002; Return-Path: rom2002@justice.com; Delivery-Date: Wed Jun  5 23:41:13 2002
## Body (preview): DEAR SIR/MADAM; ; RE: BUSINESS ASSISTANCE
## Header (preview): From tonyanenih@mail.com  Mon Jun 24 17:48:29 2002; Return-Path: tonyanenih@mail.com; Delivery-Date: Wed Jun  5 23:11:29 2002
## Body (preview): Dear,sir;  ; I am Chief Tony Anenih,the minister of Works and Housing under
## Header (preview): From ppmg@insurancemail.net  Mon Jun 24 17:48:31 2002; Return-Path: ppmg@insurancemail.net; Delivery-Date: Thu Jun  6 00:27:08 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_571220_01C20CB0.79D206A0
## Header (preview): From get.xenical@mail.com  Mon Jun 24 17:48:31 2002; Return-Path: get.xenical@mail.com; Delivery-Date: Thu Jun  6 01:16:49 2002
## Body (preview): If anyone has called you names because you're overweight,; or you are looking to make a positive change in your life,; then you can do something now!
## Header (preview): From al_mat21@mail.com  Mon Jun 24 17:48:32 2002; Return-Path: al_mat21@mail.com; Delivery-Date: Thu Jun  6 02:57:46 2002
## Body (preview): --===_SecAtt_000_1fuklemuttfusq; Content-Type: text/plain; charset="us-ascii"; Content-Transfer-Encoding: quoted-printable
## Header (preview): From al_mat21@mail.com  Mon Jun 24 17:48:32 2002; Return-Path: al_mat21@mail.com; Delivery-Date: Thu Jun  6 03:00:34 2002
## Body (preview): --===_SecAtt_000_1fuklemuttfusq; Content-Type: text/plain; charset="us-ascii"; Content-Transfer-Encoding: quoted-printable
## Header (preview): From 7878khb87bb7b8@msn.com  Mon Jun 24 17:48:25 2002; Return-Path: 7878khb87bb7b8@msn.com; Delivery-Date: Wed Jun  5 18:24:46 2002
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 Transitional//EN">; ; <html>
## Header (preview): From dcm123@btamail.net.cn  Mon Jun 24 17:49:23 2002; Return-Path: dcm123@btamail.net.cn; Delivery-Date: Mon Jun 10 04:13:11 2002
## Body (preview): <HTML><HEAD><TITLE>Free Card Search</TITLE>; <META HTTP-EQUIV="Content-Type" CONTENT="text/html; charset=iso-8859-1">; </HEAD><BODY BGCOLOR="#000000"><div align="center">
## Header (preview): From ketey@postino.ch  Mon Jun 24 17:49:00 2002; Return-Path: ketey@postino.ch; Delivery-Date: Fri Jun  7 20:52:17 2002
## Body (preview): <HTML><HEAD></HEAD><BODY><b><FONT SIZE=3D4>In a recent survey conducted by =; <FONT COLOR=3D#0033FF><B>Durex</B>; </FONT>condoms, <FONT COLOR=3D#FF0033>6=
## Header (preview): From djohnson@allexecs.com  Mon Jun 24 17:48:33 2002; Return-Path: djohnson@allexecs.com; Delivery-Date: Thu Jun  6 06:18:43 2002
## Body (preview): ===========================================================; ;                   PROVEN WAY TO GET A JOB!
## Header (preview): From GenuineLogHome@yahoo.com  Mon Jun 24 17:48:35 2002; Return-Path: GenuineLogHome@yahoo.com; Delivery-Date: Thu Jun  6 07:03:08 2002
## Body (preview): There is a Genuine Log Home in Your Future!; ;
## Header (preview): From webdeals@7a6a.net  Mon Jun 24 17:48:34 2002; Return-Path: webdeals@7a6a.net; Delivery-Date: Thu Jun  6 06:32:28 2002
## Body (preview): <html>; ; <head>
## Header (preview): From arry532@post.sk  Mon Jun 24 17:48:26 2002; Return-Path: arry532@post.sk; Delivery-Date: Wed Jun  5 19:57:38 2002
## Body (preview): ; ;
## Header (preview): From bobba5161465sdy@yahoo.com  Mon Jun 24 17:48:30 2002; Return-Path: bobba5161465sdy@yahoo.com; Delivery-Date: Wed Jun  5 23:26:29 2002
## Body (preview): If your home is served by a septic system, you will be; able to receive invaluable information on how to; eliminate pump outs, maintain the system properly for FREE !!!
## Header (preview): From nikkid890@aol.com  Mon Jun 24 17:48:37 2002; Return-Path: nikkid890@aol.com; Delivery-Date: Thu Jun  6 12:39:09 2002
## Body (preview): <html>; ; <body>
## Header (preview): From mbth--VEOIcnVgFY3XnRY7FknMtTaGt3I7--@cyabadcredit.com  Mon Jun 24 17:48:23 2002; Return-Path: mbth--VEOIcnVgFY3XnRY7FknMtTaGt3I7--@cyabadcredit.com; Delivery-Date: Wed Jun  5 17:07:21 2002
## Body (preview): <p align=center>I will show you HOW you can <u>quickly</u> and <u>easily</u> improve YOUR credit to a <b>PERFECT</b> rating!<br><b>; <a href="http://resellers.cyabadcredit.com/YKGT/1/VEOIcnVgFY3XnRY7FknMtTaGt3I7/">Click here NOW for full FREE details!</a></b></p>; <img src="http://resellers.cyabadcredit.com/YKGT/1/VEOIcnVgFY3XnRY7FknMtTaGt3I7/clogo.gif"><a href="http://remove.cyabadcredit.com"></a>
## Header (preview): From Promotions@ebay.com  Mon Jun 24 17:48:45 2002; Return-Path: Promotions@ebay.com; Delivery-Date: Fri Jun  7 10:36:54 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>bizmagoffer</TITLE>
## Header (preview): From fast91gi@xum4.xumx.com  Mon Jun 24 17:48:42 2002; Return-Path: fast91gi@xum4.xumx.com; Delivery-Date: Fri Jun  7 00:12:16 2002
## Body (preview): Low-Cost Term-Life Insurance!; SAVE up to 70% or more on your term life insurance policy now.;
## Header (preview): From makemoneyathome@btamail.net.cn  Mon Jun 24 17:48:36 2002; Return-Path: makemoneyathome@btamail.net.cn; Delivery-Date: Thu Jun  6 11:47:56 2002
## Body (preview): **********************************banned cd***********************************************; *******************************June 5 2002************************************************;
## Header (preview): From lowerpymt@2x12.2xthemoney.com  Mon Jun 24 17:48:43 2002; Return-Path: lowerpymt@2x12.2xthemoney.com; Delivery-Date: Fri Jun  7 03:38:19 2002
## Body (preview): How would you like a Top Rated Law Firm working for you, your family and your business for only pennies a day?;    ; CLICK HERE
## Header (preview): From synjan@ecis.com  Mon Jun 24 17:48:37 2002; Return-Path: synjan@ecis.com; Delivery-Date: Thu Jun  6 12:42:39 2002
## Body (preview): <html><center><p><b><font color=3D"red" size=3D"4">Up to $80 per hour &#150=; ; Satisfaction Guaranteed! </font></b></p>;        <p>You can actually start today. You&#x2019;re paid daily or weekly<br>
## Header (preview): From bobt@freshairadv.com  Mon Jun 24 17:49:08 2002; Return-Path: bobt@freshairadv.com; Delivery-Date: Sat Jun  8 16:10:35 2002
## Body (preview): Hey there,; ; If you're like me, you've tried EVERYTHING to lose
## Header (preview): From gsl@insurancemail.net  Mon Jun 24 17:48:43 2002; Return-Path: gsl@insurancemail.net; Delivery-Date: Fri Jun  7 02:32:49 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_5B81AF_01C20D87.4EEF5910
## Header (preview): From super4_31r@xum5.xumx.com  Mon Jun 24 17:48:45 2002; Return-Path: super4_31r@xum5.xumx.com; Delivery-Date: Fri Jun  7 10:47:31 2002
## Body (preview): Protect yourself with an extended warranty for your car, minivan, truck or SUV. Buy DIRECT and SAVE money 40% to 60%!; http://211.78.96.11/extended/warranty.htm;
## Header (preview): From vefzx@sapo.pt  Mon Jun 24 17:48:44 2002; Return-Path: vefzx@sapo.pt; Delivery-Date: Fri Jun  7 08:25:50 2002
## Body (preview): INTERNATIONAL DRIVER'S LICENSE; ; Need a new driver's license?
## Header (preview): From dermitage@hotmail.com  Mon Jun 24 17:48:31 2002; Return-Path: dermitage@hotmail.com; Delivery-Date: Thu Jun  6 00:45:19 2002
## Body (preview): <html>; ; <head>
## Header (preview): From bkmpt@virtual-mail.com  Mon Jun 24 17:48:46 2002; Return-Path: bkmpt@virtual-mail.com; Delivery-Date: Fri Jun  7 13:06:07 2002
## Body (preview): *Earn $2000 - $5000 weekly-starting within 1-4 weeks; *78% Profit Paid Daily; *No Selling
## Header (preview): From gendersa00@yahoo.com  Mon Jun 24 17:49:01 2002; Return-Path: gendersa00@yahoo.com; Delivery-Date: Sat Jun  8 02:34:16 2002
## Body (preview): When Economy goes down, WE go UP !; ; $3000 COMMISSION per Sale for YOU !!
## Header (preview): From dave@netnautics.com  Mon Jun 24 17:48:59 2002; Return-Path: ldumas3@lbc.pvtnet.cz; Delivery-Date: Fri Jun  7 20:27:26 2002
## Body (preview): _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/ _/; ;  S   P   E   C   I   A   L         R   E   P   O   R   T
## Header (preview): From sbello3@caramail.com  Mon Jun 24 17:48:50 2002; Return-Path: sbello3@caramail.com; Delivery-Date: Fri Jun  7 15:55:42 2002
## Body (preview): This message is in MIME format. Since your mail reader does not understand; this format, some or all of this message may not be legible.;
## Header (preview): From sbello3@caramail.com  Mon Jun 24 17:48:51 2002; Return-Path: sbello3@caramail.com; Delivery-Date: Fri Jun  7 15:57:38 2002
## Body (preview): This message is in MIME format. Since your mail reader does not understand; this format, some or all of this message may not be legible.;
## Warning in strsplit(email_text, "\n"): unable to translate 'From ihjkhangel92470@yahoo.com  Mon Jun 24 17:48:56 2002
## Return-Path: ihjkhangel92470@yahoo.com
## Delivery-Date: Fri Jun  7 18:43:20 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00642.f213f657ab630999a8d34c26060d79fc - missing value where TRUE/FALSE needed
## Header (preview): From ceu@insurancemail.net  Mon Jun 24 17:49:00 2002; Return-Path: ceu@insurancemail.net; Delivery-Date: Fri Jun  7 23:19:22 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_128E33_01C20E3D.F1BEC340
## Header (preview): From intr0519c@bk.ru  Mon Jun 24 17:49:01 2002; Return-Path: intr0519c@bk.ru; Delivery-Date: Sat Jun  8 00:28:53 2002
## Body (preview): <html>; <head>; <title></title>
## Warning in strsplit(email_text, "\n"): unable to translate 'From hitingitonthehead36@yahoo.co.uk  Mon Jun 24 17:49:05 2002
## Return-Path: hitingitonthehead36@yahoo.co.uk
## Delivery-Date: Sat Jun  8 07:07:09 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00645.dd7d8ec1eb687c5966c516b720fcc3d5 - missing value where TRUE/FALSE needed
## Header (preview): From andrea76259huaa@rocketmail.com  Mon Jun 24 17:48:42 2002; Return-Path: andrea76259huaa@rocketmail.com; Delivery-Date: Fri Jun  7 01:02:43 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat, without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ; ; Click below to enter our web site:
## Header (preview): From bjchadwick@eudoramail.com  Mon Jun 24 17:48:59 2002; Return-Path: bjchadwick@eudoramail.com; Delivery-Date: Fri Jun  7 19:28:33 2002
## Body (preview): <html>; <body bgcolor=3D"#FFFFFF" text=3D"#000000">; <table width=3D"500" border=3D"0" cellspacing=3D"0" cellpadding=3D"0" alig=
## Header (preview): From kxufYourChicagoOffice@hotmail.com  Mon Jun 24 17:49:07 2002; Return-Path: kxufYourChicagoOffice@hotmail.com; Delivery-Date: Sat Jun  8 13:51:29 2002
## Body (preview): <html><head><title>"Your Fully Staffed office"</title><meta http-equiv=Content-Type content="text/html; charset=iso-8859-1"></head><body bgcolor=#003399 text=#000000 link=#FFFFFF vlink=#FFFFFF alink=#FFFFFF>; <p align=center>&nbsp;</p>; <p align=center>&nbsp;</p>
## Header (preview): From cassel@veritechpilot.org  Mon Jun 24 17:49:19 2002; Return-Path: cassel@veritechpilot.org; Delivery-Date: Sun Jun  9 15:23:34 2002
## Body (preview): Unbelievable Prices On Cell Phones And Accessories:; ; http://www.chinaniconline.com/sales/
## Header (preview): From normave@mla.nifty.ne.jp  Mon Jun 24 17:49:10 2002; Return-Path: normave@mla.nifty.ne.jp; Delivery-Date: Sat Jun  8 17:03:25 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY leftmargin=3D=220=22 topmargin=3D=220=; =22 marginwidth=3D=220=22 marginheight=3D=220=22 bgcolor=3D=22=23FFFFFF=22><CENTER>=; <TABLE width=3D=22700=22 border=3D=221=22 cellspacing=3D=220=22 cellpadding=3D=2215=
## Header (preview): From a_fardeen@sciofw.scio.co.jp  Mon Jun 24 17:49:10 2002; Return-Path: a_fardeen@sciofw.scio.co.jp; Delivery-Date: Sat Jun  8 17:46:34 2002
## Body (preview): <HTML><HEAD><TITLE></TITLE></HEAD><BODY leftmargin=3D=220=22 topmargin=3D=220=; =22 marginwidth=3D=220=22 marginheight=3D=220=22 bgcolor=3D=22=23FFFFFF=22><CENTER>=; <TABLE width=3D=22700=22 border=3D=221=22 cellspacing=3D=220=22 cellpadding=3D=2215=
## Header (preview): From adalzheimbln@msn.com  Mon Jun 24 17:49:12 2002; Return-Path: adalzheimbln@msn.com; Delivery-Date: Sat Jun  8 19:40:19 2002
## Body (preview): Obtain a prosperous future, money earning power,; and the admiration of all.;
## Header (preview): From andrabowershuaa@mail.com  Mon Jun 24 17:48:52 2002; Return-Path: andrabowershuaa@mail.com; Delivery-Date: Fri Jun  7 17:01:07 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat,;  without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ;
## Header (preview): From anibpetmaetrysl@hotmail.com  Mon Jun 24 17:49:05 2002; Return-Path: anibpetmaetrysl@hotmail.com; Delivery-Date: Sat Jun  8 10:00:53 2002
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 Transitional//EN">; <html>
## Header (preview): From intr519c@bk.ru  Mon Jun 24 17:49:13 2002; Return-Path: intr519c@bk.ru; Delivery-Date: Sat Jun  8 23:26:48 2002
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From cxqrpw@aol.com  Mon Jun 24 17:49:14 2002; Return-Path: cxqrpw@aol.com; Delivery-Date: Sun Jun  9 01:36:52 2002
## Body (preview): <html>; <head>;    <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): From makemoneyathome@btamail.net.cn  Mon Jun 24 17:49:08 2002; Return-Path: makemoneyathome@btamail.net.cn; Delivery-Date: Sat Jun  8 14:27:51 2002
## Body (preview): HI ,  ; ; As a professional bulk mailer for 5 years. I made over $200,000 last 12 months selling only one product, "The Banned CD".
## Header (preview): From vera_coletti@email.com  Mon Jun 24 17:49:19 2002; Return-Path: vera_coletti@email.com; Delivery-Date: Sun Jun  9 12:29:18 2002
## Body (preview): PUBLIC ANNOUNCEMENT:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From ustw@aol.com  Mon Jun 24 17:49:15 2002; Return-Path: ustw@aol.com; Delivery-Date: Sun Jun  9 03:29:51 2002
## Body (preview): Welcome to Viagra Express!; ; http://www.universalmeds.com/main2.php?rx=16863
## Header (preview): From bpbo@aol.com  Mon Jun 24 17:49:15 2002; Return-Path: bpbo@aol.com; Delivery-Date: Sun Jun  9 04:26:31 2002
## Body (preview): <HTML>; <HEAD>; <TITLE>Make Money Now!!</TITLE>
## Header (preview): From lomlaguatatuobrasrer@hotmail.com  Mon Jun 24 17:49:09 2002; Return-Path: lomlaguatatuobrasrer@hotmail.com; Delivery-Date: Sat Jun  8 16:36:40 2002
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 Transitional//EN">; <html>
## Header (preview): From internetoffers@7a6a.net  Mon Jun 24 17:49:16 2002; Return-Path: internetoffers@7a6a.net; Delivery-Date: Sun Jun  9 06:11:54 2002
## Body (preview): <html>; ; <head>
## Header (preview): From latb@aol.com  Mon Jun 24 17:49:17 2002; Return-Path: latb@aol.com; Delivery-Date: Sun Jun  9 08:54:37 2002
## Body (preview): Welcome to Viagra Express!; ; http://www.universalmeds.com/main2.php?rx=16863
## Header (preview): From stepany427@aol.com  Mon Jun 24 17:49:18 2002; Return-Path: stepany427@aol.com; Delivery-Date: Sun Jun  9 11:12:56 2002
## Body (preview): <html>; ;
## Header (preview): From urpymoadnaogto@hotmail.com  Mon Jun 24 17:49:12 2002; Return-Path: urpymoadnaogto@hotmail.com; Delivery-Date: Sat Jun  8 22:32:24 2002
## Body (preview): <HTML>; ; <BODY BGCOLOR=3D#FFFFFF TEXT=3D#000000 LINK=3D#000000 VLINK=3D#000000 ALIN=
## Header (preview): From indykkt952@fietz.de  Mon Jun 24 17:49:16 2002; Return-Path: indykkt952@fietz.de; Delivery-Date: Sun Jun  9 04:39:25 2002
## Body (preview): <HTML><FONT  COLOR=3D"#ff0000" BACK=3D"#ffff00" style=3D"BACKGROUND-COLOR: =; #ffff00" SIZE=3D3 PTSIZE=3D12 FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"=; 0"><B>Become your own Boss</FONT></FONT><FONT  COLOR=3D"#0000ff" BACK=3D"#=
## Header (preview): From mando@insurancemail.net  Mon Jun 24 17:49:21 2002; Return-Path: mando@insurancemail.net; Delivery-Date: Sun Jun  9 19:49:02 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_646288_01C20FAE.3A8A1810
## Header (preview): From dr_tomeke10@spinfinder.com  Mon Jun 24 17:49:27 2002; Return-Path: dr_tomeke10@spinfinder.com; Delivery-Date: Mon Jun 10 10:59:56 2002
## Body (preview): FROM THE DESK OF: Dr tom eke.; E-Mail:dr_tomeke@spinfinder.com; LAGOS - NIGERIA.
## Header (preview): From marcela_coman536048@lycos.com  Mon Jun 24 17:49:21 2002; Return-Path: marcela_coman536048@lycos.com; Delivery-Date: Sun Jun  9 22:53:29 2002
## Body (preview): ------=_NextPart_000_00C3_60B88E3C.B6533E22; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Warning in strsplit(email_text, "\n"): unable to translate 'From developers@palmgear.com  Mon Jun 24 17:49:22 2002
## Return-Path: developers@palmgear.com
## Delivery-Date: Mon Jun 10 02:36:57 2002
## Received: from appereto.com (mail2.intelenet.net [209.80.45.9]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00670.a3175dd0b4a1e1a26822c5fee6d6837b - missing value where TRUE/FALSE needed
## Header (preview): From a1itraffic1@web.de  Mon Jun 24 17:49:18 2002; Return-Path: a1itraffic1@web.de; Delivery-Date: Sun Jun  9 09:09:12 2002
## Body (preview): <html>; ; <head>
## Header (preview): From deqttx@aol.com  Mon Jun 24 17:49:24 2002; Return-Path: deqttx@aol.com; Delivery-Date: Mon Jun 10 06:11:37 2002
## Body (preview): <html>; <head>; <title>Nasty Farm Girls!</title>
## Header (preview): From loans@thezs.com  Mon Jun 24 17:49:25 2002; Return-Path: loans@thezs.com; Delivery-Date: Mon Jun 10 08:09:33 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_186_75347104803485215881
## Header (preview): From dave650@altavista.com  Mon Jun 24 17:49:45 2002; Return-Path: dave650@altavista.com; Delivery-Date: Mon Jun 10 23:43:10 2002
## Body (preview): <html>; <head>; <title>Have a BLAST in bed</title>
## Header (preview): From mcbride17377u48@horizonbiz.com  Mon Jun 24 17:49:30 2002; Return-Path: mcbride17377u48@horizonbiz.com; Delivery-Date: Mon Jun 10 13:42:43 2002
## Body (preview): ------=_NextPart_000_00C5_18C07A8D.E1271B68; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From makemoneyathome@btamail.net.cn  Mon Jun 24 17:49:21 2002; Return-Path: makemoneyathome@btamail.net.cn; Delivery-Date: Mon Jun 10 01:08:27 2002
## Body (preview): *****************BANNEDCD::::::::::::::::::::::::::::::::::>NET******************; ; I have been receiving emails saying that I'm contributing to the "moral decay of society" by selling the Banned CD.  That may be, but I feel strongly that you have a right to benefit from
## Header (preview): From fjxhx@au.ru  Mon Jun 24 17:49:32 2002; Return-Path: spamassassin-sightings-admin@example.sourceforge.net; Delivery-Date: Mon Jun 10 14:18:05 2002
## Body (preview): " <nsfsae@alltel.net>; Content-Type: text/plain; charset="us-ascii";format=flowed; Content-Transfer-Encoding: 7bit
## Header (preview): From jmjm@yahoo.com  Mon Jun 24 17:49:33 2002; Return-Path: yyyyyyyy@yahoo.com; Delivery-Date: Mon Jun 10 14:36:31 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_550_78375233847568
## Header (preview): From hitingitonthehead45@yahoo.co.uk  Mon Jun 24 17:49:41 2002; Return-Path: hitingitonthehead45@yahoo.co.uk; Delivery-Date: Mon Jun 10 22:14:32 2002
## Body (preview): Come claim your 2 free signups.  We will give; you 2 free signups and then put 2 under both; of them, so on and so forth!  We will in essence
## Warning in strsplit(email_text, "\n"): unable to translate 'From saul5310wi@grenet.fr  Mon Jun 24 17:49:48 2002
## Return-Path: saul5310wi@grenet.fr
## Delivery-Date: Tue Jun 11 03:44:18 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g5B2iC...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00680.e8df67f239cb166c5a8a78401eeeb1ba - missing value where TRUE/FALSE needed
## Header (preview): From francop@aol.com  Mon Jun 24 17:50:14 2002; Return-Path: francop@aol.com; Delivery-Date: Wed Jun 12 09:38:27 2002
## Body (preview): <html>; ;
## Header (preview): From cgibson@btamail.net.cn  Mon Jun 24 17:49:24 2002; Return-Path: cgibson@btamail.net.cn; Delivery-Date: Mon Jun 10 05:22:12 2002
## Body (preview): This is a multipart message in MIME format.; ; --051BAE1A473A4B5C87F4200EB48BA2FC
## Warning in strsplit(email_text, "\n"): unable to translate 'From ebfme@playful.com  Mon Jun 24 17:49:39 2002
## Return-Path: ebfme@playful.com
## Delivery-Date: Mon Jun 10 19:11:40 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g5AIBXG23717...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00683.41038a20d4763e8042a811a03612bae4 - missing value where TRUE/FALSE needed
## Header (preview): From Red_olga7045@eudoramail.com  Mon Jun 24 17:49:40 2002; Return-Path: Red_olga7045@eudoramail.com; Delivery-Date: Mon Jun 10 19:42:30 2002
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!-- saved from url=(0022)http://internet.e-mail -->; <html>
## Header (preview): From abcd7453b80@yahoo.com  Mon Jun 24 17:49:46 2002; Return-Path: abcd7453b80@yahoo.com; Delivery-Date: Tue Jun 11 00:22:52 2002
## Body (preview): I saw your email on a website I visited yesterday, and thought; you might be interested in this. ;
## Header (preview): From foundmoney@consumerpackage.net  Mon Jun 24 17:49:43 2002; Return-Path: foundmoney-3444431.13@consumerpackage.net; Delivery-Date: Mon Jun 10 22:36:33 2002
## Body (preview): <html>; <body bgcolor="#FFFFFF">; <TABLE cellSpacing=0 cellPadding=0 width="100%" bgColor=#005000 border=0>
## Header (preview): From Emailcentre@up369.com  Mon Jun 24 17:49:42 2002; Return-Path: Emailcentre@up369.com; Delivery-Date: Mon Jun 10 22:36:23 2002
## Body (preview): <html>; ; <head>
## Header (preview): From mojomoose@usa.pipeline.com  Mon Jun 24 17:49:47 2002; Return-Path: mojomoose@usa.pipeline.com; Delivery-Date: Tue Jun 11 03:38:31 2002
## Body (preview): <html>; <body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; Hello, jm@netexplorer.com<BR>
## Header (preview): From 57yrhsryrs5y@msn.com  Mon Jun 24 17:49:28 2002; Return-Path: 57yrhsryrs5y@msn.com; Delivery-Date: Mon Jun 10 12:34:27 2002
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 Transitional//EN">;
## Header (preview): From sli@insurancemail.net  Mon Jun 24 17:49:47 2002; Return-Path: sli@insurancemail.net; Delivery-Date: Tue Jun 11 01:20:30 2002
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_68D343_01C210A5.CE2C4050
## Header (preview): From andrea334huaa@rocketmail.com  Mon Jun 24 17:49:23 2002; Return-Path: andrea334huaa@rocketmail.com; Delivery-Date: Mon Jun 10 04:42:24 2002
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat, without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ; ; Click below to enter our web site:
## Warning in strsplit(email_text, "\n"): unable to translate 'From peter5445@aol.com  Mon Jun 24 17:49:55 2002
## Return-Path: peter5445@aol.com
## Delivery-Date: Tue Jun 11 10:01:23 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g5B91NG32559...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00692.e886bd6ece727e1c1fdbae4dc4b60bb5 - missing value where TRUE/FALSE needed
## Header (preview): From slisa@compuserve.com  Mon Jun 24 17:49:49 2002; Return-Path: slisa@compuserve.com; Delivery-Date: Tue Jun 11 06:16:06 2002
## Body (preview): <html>; <head>; <title>New amazing incest show on Hot-Babies-Live.Com</title>
## Header (preview): From andrea_tedrickhuaa@hotmail.com  Mon Jun 24 17:49:41 2002; Return-Path: andrea_tedrickhuaa@hotmail.com; Delivery-Date: Mon Jun 10 22:19:35 2002
## Body (preview): Guaranteed to increase, lift and firm your; breasts in 60 days or your money back!!;
## Warning in strsplit(email_text, "\n"): unable to translate 'From service@thezs.com  Mon Jun 24 17:49:56 2002
## Return-Path: service@thezs.com
## Delivery-Date: Tue Jun 11 10:33:29 2002
## Received: from mandark.labs.netnoteinc.com ([213.105.180.140]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g5B9XTG01575...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00695.f79afe1f94217d0a2e6f983caf011b49 - missing value where TRUE/FALSE needed
## Header (preview): Return-Path: <saxvv@frankfurt.netsurf.de>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);    by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6L5xBCT075738
## Body (preview): <HTML><BODY bgcolor=3D"#FFFFFF">; <table width=3D"389" align=3D"center" cellspacing=3D"0" cellpadding=3D"0" =; border=3D"0">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OFvphY024658;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <html>; <body bgcolor="#FFFFFF" marginwidth="0" marginheight="0" topmargin="0" leftmargin="0">
## Header (preview): From twagar32t@aol.com  Mon Jul 29 11:22:11 2002; Return-Path: <twagar32t@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Aug  8 14:36:41 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id A7253441F8
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00699.46c52d8e3b9db13ea2e9816f1c919961 - missing value where TRUE/FALSE needed
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From ross9917@Flashmail.com  Mon Jul 29 11:21:14 2002; Return-Path: <ross9917@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Dietary Supplement</title>
## Header (preview): From frothery3815u23@24horas.com  Tue Aug  6 11:03:39 2002; Return-Path: <frothery3815u23@24horas.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><STYLE>; BODY {font-family="Arial"}; TT {font-family="Courier New"}
## Header (preview): From donnaryder7@hotmail.com  Tue Aug  6 11:04:56 2002; Return-Path: <donnaryder7@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From vixinte1563o74@24horas.com  Tue Aug  6 11:04:25 2002; Return-Path: <vixinte1563o74@24horas.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><STYLE>; BODY {font-family="Arial"}; TT {font-family="Courier New"}
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-sightings-admin@lists.sourceforge.net  Wed Jul 17 17:24:46 2002
## Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00704.30306e2e506ca198fe8dea2b3c11346a - missing value where TRUE/FALSE needed
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Wed Jul 17 17:24:52 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (SafeInvestments@NiceReturns12.com) on Saturday, July 13, 2002 at 03:46:17; ---------------------------------------------------------------------------
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-sightings-admin@lists.sourceforge.net  Wed Jul 17 17:24:50 2002
## Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00706.5116018237368c3633823b2d24f8ac86 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:41:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Warning in strsplit(email_text, "\n"): unable to translate 'From spamassassin-sightings-admin@lists.sourceforge.net  Wed Jul 17 17:24:49 2002
## Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00708.89f1f9108884517148fdbd744e18ec1e - missing value where TRUE/FALSE needed
## Header (preview): From jim342u47@saintmail.net  Wed Jul 17 08:59:07 2002; Return-Path: <jim342u47@saintmail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><FONT  SIZE=3D2 PTSIZE=3D10 FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D=; "0">Congratulations! Your mortgage<BR>; <BR>
## Header (preview): From martenb@aol.com  Wed Jul 17 14:13:39 2002; Return-Path: <martenb@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi,; ; I'm a college dropout.  I work about two hours a day.
## Header (preview): From webmaster@bidstogo.biz  Tue Jul 16 20:07:03 2002; Return-Path: <webmaster@bidstogo.biz>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): X-Status: ; X-Keywords: ; X-Persona: <Fallingrock>
## Body (preview): <x-html>; <html>; <head>
## Header (preview): From nbc@insurancemail.net  Wed Jul 17 00:07:19 2002; Return-Path: <nbc@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_266701_01C22CE6.6C78C6F0
## Header (preview): Received: from uuout14smtp1.uu.flonetwork.com (uuout14smtp1.uu.flonetwork.com [205.150.6.121]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6GNEjn19542;   for <gibbs@midrange.com>; Tue, 16 Jul 2002 18:14:48 -0500
## Body (preview): ------000000000000000000000000000000000000000000000000000000000000000; Content-Type: text/plain; charset="us-ascii"; Content-Transfer-Encoding: 7bit
## Header (preview): From powersource2fg7@lycos.com  Wed Jul 17 00:28:16 2002; Return-Path: <powersource2fg7@lycos.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ;
## Header (preview): X-Status: ; X-Keywords: ; X-Persona: <Fallingrock>
## Body (preview): During these tough economic times, how do you help a salesperson, a custo=; mer service representative, or ANY employee improve his or her effectiven=; ess and productivity if you don't know which SPECIFIC skills, habits or a=
## Header (preview): From fork-admin@xent.com  Wed Jul 17 08:27:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <style type=text/css>; a { text-decoration: none; color:#ffcccc }; </style>
## Header (preview): From lowprices861@Flashmail.com  Sat Jul 20 01:37:16 2002; Return-Path: <lowprices861@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From zaida30281548599@hotmail.com  Wed Jul 17 10:53:36 2002; Return-Path: <zaida30281548599@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body bgcolor="#FFFFFF" text="#000000">; <div align="left"><font size="6" face="Times New Roman, Times, serif"><b><font color="#FF0000">You're
## Header (preview): From MoreInks@netscape.net  Wed Jul 17 08:48:39 2002; Return-Path: <MoreInks@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Untitled Document</title>
## Header (preview): From earn_1000_per_week@btamail.net.cn  Wed Jul 17 08:59:06 2002; Return-Path: <earn_1000_per_week@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>; <META http-equiv=Content-Type content="text/html;
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Wed Jul 17 18:29:40 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Dr. Schaefer:; ; I would greatly appreciate a reprint of your article entitled
## Header (preview): From fork-admin@xent.com  Wed Jul 17 20:20:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; --Z_MULTI_PART_MAIL_BOUNDAEY_S
## Header (preview): From ilug-admin@linux.ie  Wed Jul 17 19:24:24 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):                    Urgent Concern Pls.; ; I am a serious officer with one of our main branches of CITI BANK,
## Header (preview): From tn@Pitching.com  Wed Jul 17 20:20:11 2002; Return-Path: <tn@Pitching.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ############################################; #                                          #; #       Adult Online Super Store           #
## Header (preview): From zo3jaqc7p572@hotmail.com  Wed Jul 17 10:43:09 2002; Return-Path: <zo3jaqc7p572@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From leads&sales3642@Flashmail.com  Thu Jul 18 01:30:02 2002; Return-Path: <leads&sales3642@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Consumers, Increase your Business Sales! ; ; How??
## Header (preview): From looking4money@imkit.com  Thu Jul 18 00:12:17 2002; Return-Path: <looking4money@imkit.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Greetings! ; ; You are receiving this letter because you have expressed an interest in
## Header (preview): From lp@insurancemail.net  Thu Jul 18 00:23:23 2002; Return-Path: <lp@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0007_01C22DB1.C4B80210
## Header (preview): From webmake-talk-admin@lists.sourceforge.net  Thu Jul 18 00:56:29 2002; Return-Path: <webmake-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WANT TO MAKE MONEY?;  ; $$$$$$$$$$$$$$$$$$$$$$$$$$$$$$$$$$
## Header (preview): From hc@TomGreen.com  Thu Jul 18 02:57:08 2002; Return-Path: <hc@TomGreen.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ############################################; #                                          #; #       Adult Online Super Store           #
## Header (preview): From aos_Jbfun8575@mail.com  Thu Jul 18 03:08:14 2002; Return-Path: <aos_Jbfun8575@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Email marketing - if done right - is both highly effective and amazingly cost effective.  OK, it can be ; downright PROFITABLE.  If done right.;
## Header (preview): From vjli_Jbfun8575@mail.com  Thu Jul 18 03:08:16 2002; Return-Path: <vjli_Jbfun8575@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Email marketing - if done right - is both highly effective and amazingly cost effective.  OK, it can be ; downright PROFITABLE.  If done right.;
## Header (preview): From steveadler@allexecs.com  Mon Jul 22 18:43:50 2002; Return-Path: <steveadler@allexecs.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------ack1234; Content-Type: multipart/alternative; boundary="----alt_border_1";
## Header (preview): From danaims@hotmail.com  Wed Jul 17 20:31:20 2002; Return-Path: <danaims@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=windows-1252">
## Header (preview): From hxjinks1for1you@yahoo.com  Thu Jul 18 05:42:28 2002; Return-Path: <hxjinks1for1you@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): go..  jm@netnoteinc.com; <html>; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Fri Jul 19 02:50:52 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 5429243F90
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00737.af5f503fe444ae773bfeb4652d122349 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Fri Jul 19 08:46:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_400_3100263864853684046
## Header (preview): From linda_blatt857875@address.com  Thu Jul 18 10:13:17 2002; Return-Path: <linda_blatt857875@address.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00A5_78B53E6C.B7678D60; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From fork-admin@xent.com  Thu Jul 18 10:13:14 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_943_7386722343340587207363271782623
## Warning in strsplit(email_text, "\n"): unable to translate 'From fddgl@dcs.rhbnc.ac.uk  Wed Jul 17 23:38:51 2002
## Return-Path: <fddgl@dcs.rhbnc.ac.uk>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 6F24843F90
##  fo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00741.00c61b5577b6fa232434c2ae62d52394 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From fddgl@dcs.rhbnc.ac.uk  Thu Jul 18 14:16:26 2002
## Return-Path: <fddgl@dcs.rhbnc.ac.uk>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 915CC43F90
##  fo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00742.2700b00dc2dcc121ee0a1322040de188 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From d_akh@hotmail.com  Thu Jul 18 01:29:57 2002
## Return-Path: <d_akh@hotmail.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 655BA43F90
##  for <jm@lo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00743.7889a6b188891a33c088f3d29d48251a - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Jul 18 14:15:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <style type="text/css">; <!--; a {  text-decoration: none }
## Header (preview): From fork-admin@xent.com  Thu Jul 18 15:29:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Thu Jul 18 16:13:30 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hello,; ; I was recently browsing the internet and came accross some guys that are making really good job.
## Header (preview): Received: from linux.midrange.com (dial-62-64-223-40.access.uk.tiscali.com [62.64.223.40]);    by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6IDvRt21715;    for <gibbs@midrange.com>; Thu, 18 Jul 2002 08:57:28 -0500
## Body (preview): Hi we are luke's secret following we love luke fictitious!; ; We are also your long lost friend! Hi
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Jul 18 04:47:37 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id CE6B243F90
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00748.2b1fcd8621caf857e9ec0b08555ae5db - missing value where TRUE/FALSE needed
## Header (preview): From ubpby@aol.com  Thu Jul 18 18:15:03 2002; Return-Path: <ubpby@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!doctype html public "-//w3c//dtd html 4.0 transitional//en">; <html>; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Jul 18 18:49:18 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 7B78643F9E
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00750.dfc392478300e11189d61d29bed9cecc - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Jul 18 21:22:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <style type="text/css">; <!--; a {  text-decoration: none }
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Fri Jul 19 08:33:46 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is the worst job market we've seen in over 30 years.  ; ; The recent corporate scandals have further deepened the lack
## Header (preview): From inquiresto@yahoo.com  Thu Jul 18 20:06:21 2002; Return-Path: <inquiresto@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_001D_53B46E59.C27024C0; Content-Type: text/html; Content-Transfer-Encoding: base64
## Header (preview): Received: from ent-exchange.stanford.edu (ENT-EXCHANGE.Stanford.EDU [171.65.86.24]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6IN29t12788;   for <gibbs@midrange.com>; Thu, 18 Jul 2002 18:02:09 -0500
## Body (preview): <HTML><FONT  SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0">HAS YOUR MORTGAGE SEARCH GOT YOU DOWN?<BR>; <BR>; Win a $30,000 mortgage just for trying to get your mortgage rates down, and a little cash in your pocket!!<BR>
## Header (preview): From aa@insurancemail.net  Fri Jul 19 00:17:29 2002; Return-Path: <aa@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_436A1_01C22E78.6D2241B0
## Header (preview): From owner-melbwireless@wireless.org.au  Fri Jul 19 00:55:29 2002; Return-Path: <owner-melbwireless@wireless.org.au>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format; ; --=_NextPart_2rfkindysadvnqw3nerasdf
## Header (preview): From ilug-admin@linux.ie  Fri Jul 19 01:52:24 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We offer some of the best bulk e-mail prices on the Internet. We do all ; the mailing for you. ; You just provide us with the ad! It's that simple!
## Header (preview): From fork-admin@xent.com  Fri Jul 19 03:09:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>; <META content="text/html; charset=iso-8859-1" http-equiv=Content-Type>
## Header (preview): From ronardtony@mail.com  Fri Jul 19 04:24:36 2002; Return-Path: <ronardtony@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): MR.RONARD TONY; WEMA BANK PLC. ; LAGOS/NIGERIA
## Header (preview): From JohnRobertson@terra.es  Fri Jul 19 13:51:12 2002; Return-Path: <JohnRobertson@terra.es>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Are creditors hassling you about your debts? ; ; We are a non-profit organization that can help you
## Header (preview): From mnereetcaenure@msn.com  Thu Jul 18 19:34:22 2002; Return-Path: <mnereetcaenure@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From fork-admin@xent.com  Thu Jul 18 20:43:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): Received: from mail.cmcmax.com (168-215-137-36.cmcsmart.com [168.215.137.36] (may be forged));     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6ILm7t07056;;  Thu, 18 Jul 2002 16:48:07 -0500
## Body (preview): <HTML><HEAD></HEAD><BODY><b><FONT SIZE=3D4>In a recent survey conducted by =; <FONT COLOR=3D#0033FF><B>Durex</B>; </FONT>condoms, <FONT COLOR=3D#FF0033>6=
## Header (preview): Received: from mail.vthomes.com (bianchi.vermontel.net [216.66.109.36] (may be forged));   by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6OIKqe32231;;   Wed, 24 Jul 2002 13:20:52 -0500
## Body (preview): <HTML><HEAD></HEAD><BODY><b><FONT SIZE=3D4>In a recent survey conducted by =; <FONT COLOR=3D#0033FF><B>Durex</B>; </FONT>condoms, <FONT COLOR=3D#FF0033>6=
## Header (preview): Received: from mail.northcove.com (232.47.252.64.snet.net [64.252.47.232]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6N82De21984;   for <ftp@midrange.com>; Tue, 23 Jul 2002 03:02:13 -0500
## Body (preview): <HTML><HEAD></HEAD><BODY><b><FONT SIZE=3D4>In a recent survey conducted by =; <FONT COLOR=3D#0033FF><B>Durex</B>; <
## Header (preview): From abv@coulam1.freeserve.co.uk  Fri Jul 19 13:09:52 2002; Return-Path: <abv@coulam1.freeserve.co.uk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <html>; <SCRIPT>
## Header (preview): From ubbowidmoefkuan@msn.com  Fri Jul 19 01:14:15 2002; Return-Path: <ubbowidmoefkuan@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From 71554.54dlx@dtk.com.tw  Fri Jul 19 16:02:30 2002; Return-Path: <71554.54dlx@dtk.com.tw>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>;     <TITLE>
## Header (preview): From mynetdetectives-3444431.13@offer888.net  Fri Jul 19 17:20:53 2002; Return-Path: <mynetdetectives-3444431.13@offer888.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <table border=0 align="center" width=80%>
## Header (preview): From uktfu@eei.ericsson.se  Fri Jul 19 02:11:31 2002; Return-Path: <uktfu@eei.ericsson.se>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Fri Jul 19 18:21:31 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):  Aren't Asian Pacfic Americans (APAs) accorded equal ; opportunity already?  Unfortunately, no.  APAs are not accorded ; equal opportunity in workplaces presently.
## Header (preview): From gtts@cable.net.co  Fri Jul 19 19:15:01 2002; Return-Path: <gtts@cable.net.co>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <x-tab>;
## Header (preview): From ztoYSfJLcsupA@microsoft.com  Fri Jul 19 16:02:26 2002; Return-Path: <ztoYSfJLcsupA@microsoft.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_HAubnVEDr9lCVFKk0
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Fri Jul 19 15:05:58 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 09DA443FB7
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00774.bb00990ae11efeabd677cc2935f2281f - missing value where TRUE/FALSE needed
## Header (preview): From mailroom@speededelivery.com  Fri Jul 19 16:12:56 2002; Return-Path: <mailroom@speededelivery.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): In 1957, a monastery in Thailand was being relocated and a group of monks; was put in charge of moving a giant clay Buddha. In the midst of the move; one of the monks noticed a crack in the Buddha. Concerned about damaging the
## Header (preview): From jim342u47@bboy.com  Mon Jul 22 18:34:42 2002; Return-Path: <jim342u47@bboy.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><FONT  SIZE=3D2 PTSIZE=3D10 FAMILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D=; "0">Congratulations! Your mortgage<BR>; <BR>
## Header (preview): From spamassassin-sightings-admin@lists.sourceforge.net  Fri Jul 19 18:21:31 2002; Return-Path: <spamassassin-sightings-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_002D_01C22F7E.50ED29E0
## Header (preview): From two_naomi091667@excite.com  Fri Jul 19 08:07:23 2002; Return-Path: <two_naomi091667@excite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <body>
## Header (preview): Received: from ns2.sevenway.net ([62.0.17.12]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6O7P4e06842;   for <lynn.dietz@midrange.com>; Wed, 24 Jul 2002 02:25:05 -0500
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): Received: from canic.com.cn ([210.13.254.194]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6JI8FH26913;   for <mitch@midrange.com>; Fri, 19 Jul 2002 13:08:16 -0500
## Body (preview): <p align=3D"left"><font size=3D"2"=20; face=3D"Arial"><br>;   </font><font size=3D"+1"color=3D"brown"  face=3D"Verdana, Arial, Helvet=
## Header (preview): From fork-admin@xent.com  Fri Jul 19 13:36:56 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From targetemailextractor@btamail.net.cn  Fri Jul 19 22:02:47 2002; Return-Path: <targetemailextractor@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3CBODY bgColor=3D#ffffff=3E; =3CDIV=3E=3CFONT size=3D2=3E; =3CDIV=3E=3CFONT face=3DArial=3E&nbsp=3B=3C=2FFONT=3E =3C=2FDIV=3E
## Header (preview): From pitster267540871@hotmail.com  Fri Jul 19 23:17:51 2002; Return-Path: <pitster267540871@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Computer User jm8675309 ,; ; <html>
## Header (preview): From insurmark@insurancemail.net  Fri Jul 19 23:44:34 2002; Return-Path: <insurmark@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_86B25_01C22F3F.3AF11B40
## Header (preview): Received: from axses.net (axses.net [216.55.6.58]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6ONvPe02758;   for <mitch@midrange.com>; Wed, 24 Jul 2002 18:57:25 -0500
## Body (preview): Tired of Mounting Credit Card Debt?; Frustrated by Creditor Harrassment?; Bogged down by Medical Expenses?
## Header (preview): Received: from aurora.pres.gob.pe (mail.ctarpuno.pres.gob.pe [200.37.31.29]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6JAtkH28728;   for <lynn.dietz@midrange.com>; Fri, 19 Jul 2002 05:55:47 -0500
## Body (preview): <HTML>; <HEAD>; <STYLE>
## Header (preview): X-Status: ; X-Keywords: ; Return-Path: <anonymous@plesk.rackshack.net>
## Body (preview): Hey,  I just wanted to tell you about a GREAT website.  http://www.metrojokes.com    Features lots of jokes!  Extremly unique features and classified in categories.  I appriciate your time.; ; Thank you
## Header (preview): Received: from actioncouriers.com ([207.225.37.163]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6KDARH26315;;  Sat, 20 Jul 2002 08:10:31 -0500
## Body (preview): <HTML><HEAD></HEAD><BODY><b><FONT SIZE=3D4>In a recent survey conducted by =; <FONT COLOR=3D#0033FF><B>Durex</B>; </FONT>condoms, <FONT COLOR=3D#FF0033>6=
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Tue Jul 30 10:52:20 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 74E88440EF
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00789.ffe4e3c5dc50f5a9ac33a653b5f8b566 - missing value where TRUE/FALSE needed
## Header (preview): From social-admin@linux.ie  Sat Jul 20 03:08:07 2002; Return-Path: <social-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Why Spend Your Hard Earned Cash?; ; Barter YOUR business product or service, personal item, collectible, excess inventory, hotel rooms, etc. for items and services YOU NEED.......SAVE YOUR CASH!!!!!
## Header (preview): From publicservice2002_121@Flashmail.com  Sat Jul 20 02:57:22 2002; Return-Path: <publicservice2002_121@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): If you haven't already read the #1 NY Times Best Seller Rich Dad, ; Poor Dad by Robert T. Kiyosaki...;
## Header (preview): From Ink1899707@teacher.com  Mon Jul 22 18:44:30 2002; Return-Path: <Ink1899707@teacher.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>;  <title>FAST ACTING VIAGRA!!!</title>
## Header (preview): From mrhealth@btamail.net.cn  Mon Jul 22 18:44:05 2002; Return-Path: <mrhealth@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From sky9ex@aol.com  Fri Jul 19 22:24:10 2002; Return-Path: <sky9ex@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ; ; Dare to Compare!
## Header (preview): Return-Path: <bbradee@hotmail.com>; Received: from mail.alringer.com (alringer.com [64.169.239.34]);   by control.unearthed.org (8.11.6/linuxconf) with ESMTP id g6JNkaa06927
## Body (preview): You are receiving this email because you have expressed an interest=20; in making money with eBay and or on the Internet.; =A0
## Header (preview): From bestbuys@hotmail.com  Sat Jul 20 02:19:58 2002; Return-Path: <bestbuys@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body>; <div align=3D"center">;   <center>
## Header (preview): Received: from mail.escorts.co.in (IDENT:root@[203.200.75.75]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6K3rZH01171;   for <mitch@midrange.com>; Fri, 19 Jul 2002 22:53:37 -0500
## Body (preview): <html><HEAD><TITLE>creditfix</TITLE> ; </HEAD><BODY BGCOLOR=3D#FFFFFF TEXT=3D#000000 LINK=3D#FF0000 VLINK=3D#FF00=; 00 ALINK=3D#FF0000><BR><CENTER>
## Header (preview): From jy3dagq6x068@yahoo.com  Sat Jul 20 03:56:12 2002; Return-Path: <jy3dagq6x068@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From akai30@yahoo.com  Mon Jul 22 18:43:57 2002; Return-Path: <akai30@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <BODY BGCOLOR=3D#000000>; <table width=3D"600" align=3D"center"><tr><td align=3D"center">
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From freequote@49.six86.com  Mon Jul 22 18:39:17 2002; Return-Path: <freequote@49.six86.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): INTEREST RATES HAVE JUST BEEN CUT!!!;  ; NOW is the perfect time to think about refinancing your home mortgage! Rates are down! Take a minute and fill out our quick online form.
## Header (preview): Received: from national-adv.com (vns.ne.client2.attbi.com [24.147.130.121]);   by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6KNsN411718;    for <new-list-list@midrange.com>; Sat, 20 Jul 2002 18:54:24 -0500
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=windows-1252">
## Header (preview): From kvlci@gomail.com.ua  Mon Jul 22 18:04:03 2002; Return-Path: <kvlci@gomail.com.ua>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Header (preview): Received: from consumerpackage.net ([65.123.236.7]);   by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6KNHf411331;    for <evie@midrange.com>; Sat, 20 Jul 2002 18:17:41 -0500
## Body (preview): <html>; <HEAD>; <title>Legal Solutions For Pennies A Day</title>
## Header (preview): Return-Path: <root@mail5.aweber.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LLkDCT050797
## Body (preview): <HTML>; <head>; <title>Untitled Document</title>
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Sell your Timeshare!; ; If you're interested in selling or renting
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LLp3CU052733;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00D0_65B52D1A.C4816C13; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From isrealsteedley@netscape.net  Mon Jul 22 18:07:10 2002; Return-Path: <isrealsteedley@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Opportunity is knocking. Why?; ; Because mortgage rates are rising.
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hawaii.ireaye.net ([205.244.94.208])
##  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6L4QH414517
##  for <gibbs@MIDRANGE.COM>; Sat, 20 Jul 2002 23:26:18 -0500
## Message-Id: <200207210426.g6L4QH414517@linux.midrange.com>
## Received: from a...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00808.c072069806eb82f9aaf8d21d39789ea6 - missing value where TRUE/FALSE needed
## Header (preview): Received: from localhost.localdomain ([4.21.157.32]);  by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6L6W9415993;    for <midrjobs-l@midrange.com>; Sun, 21 Jul 2002 01:32:09 -0500
## Body (preview):  midrjobs-l@midrange.com; ; YOU WON A FREE PORN PASSWORD!!
## Header (preview): From money@viplook.net  Mon Jul 22 18:09:50 2002; Return-Path: <money@viplook.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hello ; I was just emailed today from the owners of ; a BRAND NEW program just released TWO WEEKS
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3Chtml=3E=3Cbody ; onload=3D=22window=2Eopen=28'http=3A=2F=2F202=2E101=2E163=2E34=3A81=; =2Fultimatehgh=5F
## Header (preview): From brenda_kwong@fastmail.fm  Mon Jul 22 18:39:21 2002; Return-Path: <brenda_kwong@fastmail.fm>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): PUBLIC ANNOUNCEMENT:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From iccsuuccesss@yahoo.com  Mon Jul 22 18:39:20 2002; Return-Path: <iccsuuccesss@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p align="center"><b><font size="5" color="#FF0000">Fire Your Boss...</font></b><font size="5"><br>
## Header (preview): Received: from InterJet.ceiak.com (209-193-36-206-cdsl-rb1.nwc.acsalaska.net [209.193.36.206]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6L2iv413386;;  Sat, 20 Jul 2002 21:45:01 -0500
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From webmake-talk-admin@lists.sourceforge.net  Mon Jul 22 18:43:41 2002; Return-Path: <webmake-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3CBODY bgColor=3D#ffffff=3E; =3CDIV=3E=3CFONT size=3D2=3E; =3CDIV=3E=3CFONT face=3DArial=3E&nbsp=3B=3C=2FFONT=3E =3C=2FDIV=3E
## Header (preview): From WebOffers@7a6a.net  Mon Jul 22 18:06:18 2002; Return-Path: <WebOffers@7a6a.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): Received: from pdc.clarkgraphicsinc.com (nrm242245.columbus.rr.com [204.210.242.245]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6LAAT426917;   for <lynn.dietz@midrange.com>; Sun, 21 Jul 2002 05:10:29 -0500
## Body (preview): <HTML><FONT  SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0">HAS YOUR MORTGAGE SEARCH GOT YOU DOWN?<BR>; <BR>; Win a $30,000 mortgage just for trying to get your mortgage rates down, and a little cash in your pocket!!<BR>
## Header (preview): X-Status: ; X-Keywords: ; Return-Path: <dealsgreatestdealsonearth4426q45@yahoo.com>
## Body (preview): ------=_NextPart_000_00E6_61E42E2B.C1032A62; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From ugrafromthesky@gt.ca  Mon Jul 22 19:17:59 2002; Return-Path: <ugrafromthesky@gt.ca>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): You Can't Beat This Deal:; ; 200 Million email addresses Database, On 2 CDs!! ==Only $99.95==
## Header (preview): From webmake-talk-admin@lists.sourceforge.net  Mon Jul 22 18:43:39 2002; Return-Path: <webmake-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3CBODY bgColor=3D#ffffff=3E; =3CDIV=3E=3CFONT face=3D&#23435=3B&#20307=3B size=3D2=3E; =3CDIV=3E=3CSTRONG=3E=3CFONT color=3D#ff0080 face=3DArial size=3D4=3EDirect Email
## Header (preview): From lyetr66@uol.com.co  Mon Jul 22 18:39:49 2002; Return-Path: <lyetr66@uol.com.co>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><STYLE>; BODY {font-family=3D"Arial"}; TT {font-family=3D"Courier New"}
## Header (preview): From ilug-admin@linux.ie  Mon Jul 22 18:40:24 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Header (preview): From Programmers@netscape.net  Mon Jul 22 18:39:34 2002; Return-Path: <Programmers@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><head><title></title>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">; <style type="text/css">
## Header (preview): Received: from sender ([211.98.136.25]);   by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6LE6xe31359;    for <gibbs@midrange.com>; Sun, 21 Jul 2002 09:07:02 -0500
## Body (preview): This is NOT spam.=20; Your email is listed as a member of topdollaremaillings.; This is a opt-in service. To be removed see below
## Header (preview): Received: from alphaexchng.Gearboxtoys.com (dsl142.cedar-rapids.net [208.169.8.147] (may be forged));  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6L1pd412792;;  Sat, 20 Jul 2002 20:51:40 -0500
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From Linnea2278102@email.is  Mon Jul 22 19:56:09 2002; Return-Path: <Linnea2278102@email.is>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LGbECU026504;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): 4 kat Daha Hizli & Sinirsiz  baglantiya ne dersiniz???; ; 18.451 adet mpeg video , 248.105 adet resim ar=FEivimize, 48 Canl=FD sohb=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LK9bCU010150;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): 4 kat Daha Hizli & Sinirsiz  baglantiya ne dersiniz???; ; 18.451 adet mpeg video , 248.105 adet resim ar=FEivimize, 48 Canl=FD sohb=
## Header (preview): Received: from eastgate.starhub.net.sg (eastgate.starhub.net.sg [203.116.1.189]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6LF7Je32082;   for <gibbs@midrange.com>; Sun, 21 Jul 2002 10:07:19 -0500
## Body (preview): (See Disclaimer below); ;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LHVTCU048088;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): *** PLEASE READ THIS EMAIL TO THE END ***; =A0; Try it. Just for fun. It will cost you 25$ to earn at least thousands of =
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LJEFCU088070;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; --__________MIMEboundary__________
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LJEJCU088122;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <body bgcolor=#FFFFFF link=blue vlink=blue class="Normal" lang=EN-US>; <table border=0 cellpadding=0 width="100%" bgcolor=white>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LJW3CU095372;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (oceandrive@email.is) on Sunday, July 21, 2002 at 12:29:29; ---------------------------------------------------------------------------
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LJhbCU099754;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LKbgCU021534;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN"><HTML>; <HEAD><TITLE>Home Based Business</TITLE>;   <META NAME="GENERATOR" CONTENT="MSHTML 6.00.2715.400"  >
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LLbBCU047091;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): Received: from post.internext.fr (post.internext.fr [194.79.160.6]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6LMOde06375;   for <gibbs@midrange.com>; Sun, 21 Jul 2002 17:24:40 -0500
## Body (preview): <html><body>; <hr width = "100%">; <center><font size = "+2" color = "#44C300"><b>Government Grants E-Book 2002 edition</font></b><p>
## Header (preview): From legaliq@insurancemail.net  Mon Jul 22 17:45:01 2002; Return-Path: <legaliq@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_C9DC9_01C230C6.21818770
## Header (preview): From cristy_moore@hotmail.com  Mon Jul 22 18:43:33 2002; Return-Path: <cristy_moore@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body>; <center>; <center>
## Header (preview): Received: from maktoob.com ([208.227.137.87]);     by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6LEbje31790;    for <lynn.dietz@midrange.com>; Sun, 21 Jul 2002 09:37:51 -0500
## Body (preview): 20th July, 2002; ; To:    The President
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MFTuhY074269;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): F I N A L    N O T I C E !; NEW PROGRAM pays you IMMEDIATELY!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MFUBhY074405;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Y O U R  last chance for ; ; Y O U R $3000.00 INCOME per WEEK!
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LNeQCU095727;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_75206_01C230D5.32E68290
## Header (preview): From fitnessheaven@optinllc.com  Mon Jul 22 17:56:46 2002; Return-Path: <fitnessheaven@optinllc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>FitnessHeaven.com</title>
## Header (preview): From takinitezathome@yahoo.com  Mon Jul 22 18:35:38 2002; Return-Path: <takinitezathome@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Established Global Network Marketing Opportunity!; ; Our automated sales and marketing system signed up
## Header (preview): From dingonights@mailbox.co.za  Mon Jul 22 18:39:16 2002; Return-Path: <dingonights@mailbox.co.za>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From avkuntz@teleweb.at  Mon Jul 22 18:35:28 2002; Return-Path: <avkuntz@teleweb.at>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Easy 30-50% Return?; ; Learn how you can receive a monthly check for 3, 4, or 5%
## Header (preview): Return-Path: <root@mail9.aweber.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M2IJhX061393
## Body (preview): <HTML>; <HEAD>; <META HTTP-EQUIV="Content-Type" CONTENT="text/html">
## Header (preview): From jm@netnoteinc.com  Mon Jul 22 18:37:00 2002; Return-Path: <yyyy@netnoteinc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_683_88588225468343301146121008774
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M1qihY051371;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): From mraimecoilcipc@msn.com  Mon Jul 22 18:39:25 2002; Return-Path: <mraimecoilcipc@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): Received: from camcolo2-smrly1.gtei.net (camcolo2-smrly1.gtei.net [128.11.173.4]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6M4sse16586;   for <lynn.dietz@midrange.com>; Sun, 21 Jul 2002 23:54:54 -0500
## Body (preview): <html>; <body>; <p>100% Free Porn!<br>
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M47AhY004105
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Sun, 21 Jul 2002 23:07:1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00853.ee1fe2f2d16e8b27be79a670b8597252 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:46 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): !Want to make a million bucks this year?; Me too but it's probably not going happen!;
## Header (preview): From gort44@excite.com  Mon Jul 22 18:39:55 2002; Return-Path: <gort44@excite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Easy 30-50% Return?; ; Learn how you can receive a monthly check for 3, 4, or 5%
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M687hY051946;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title>index.gif</title>
## Header (preview): Return-Path: <root@mail6.aweber.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M8QfhX007054
## Body (preview): <html>; <head>; <title>Foreclosure Toolkit</title>
## Header (preview): From dougw_reply@excite.com  Mon Jul 22 18:39:29 2002; Return-Path: <dougw_reply@excite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ---------------------; Note: Your e-mail address was added to a database by you.; I am sending my advertisement to this database and, if
## Header (preview): From sm@TheFragile.com  Mon Jul 22 18:35:13 2002; Return-Path: <sm@TheFragile.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ############################################; #                                          #; #       Adult Online Super Store           #
## Header (preview): Received: from mail.bestfit2000.com ([63.72.220.138]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6LNLOe07130;;  Sun, 21 Jul 2002 18:21:25 -0500
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): Return-Path: <sdfjlj@msn.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);    by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LKg6CT023318
## Body (preview): *****************BANNEDCD::::::::::::::::::::::::::::::::::>NET******************; ; I have been receiving emails saying that I'm contributing to the "moral decay of society" by selling the Banned CD.  That may be, but I feel strongly that you have a right to benefit from
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M6EPhY054428;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From takinitezathome@yahoo.com  Mon Jul 22 18:33:37 2002; Return-Path: <takinitezathome@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Established Global Network Marketing Opportunity!; ; Our automated sales and marketing system signed up
## Header (preview): Return-Path: <sdlfjl@canada.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LN8KCT082941
## Body (preview): *****************BANNEDCD::::::::::::::::::::::::::::::::::>NET******************; ; I have been receiving emails saying that I'm contributing to the "moral decay of society" by selling the Banned CD.  That may be, but I feel strongly that you have a right to benefit from
## Header (preview): From rory007460171i01@edtnmail.com  Tue Jul 23 11:44:39 2002; Return-Path: <rory007460171i01@edtnmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00A5_72D33D8C.C3665C01; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MAZohY057827;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title>Giveaway Destinations!</title>
## Header (preview): Return-Path: <webmaster2fg7@address.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M1MQhX039501
## Body (preview): <html>; ;
## Header (preview): Return-Path: <tomkelly2fg7@address.com>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6LMqkCT076963
## Body (preview): <html>; ;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MCknhY009175;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <body bgcolor="#ffffff">; <table border="0" cellpadding="0" cellspacing="0" width="747">; <!-- fwtable fwsrc="Untitled" fwbase="viruslandingpagedoneemail_19.jpg" fwstyle="Dreamweaver" fwdocid = "742308039" fwnested="1" -->
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (kazadown@libero.it) on Monday, July 22, 2002 at 04:49:18; ---------------------------------------------------------------------------
## Header (preview): Received: from relay1.primushost.com (poseidon.shore.net [207.244.124.88]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6MCAqe26610;   for <gibbs@midrange.com>; Mon, 22 Jul 2002 07:10:52 -0500
## Body (preview): <HTML><FONT  SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0">HAS YOUR MORTGAGE SEARCH GOT YOU DOWN?<BR>; <BR>; Win a $30,000 mortgage just for trying to get your mortgage rates down, and a little cash in your pocket!!<BR>
## Header (preview): From pitster265483667@hotmail.com  Tue Jul 23 01:49:32 2002; Return-Path: <pitster265483667@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear dhudobenko ,; ; <html>
## Header (preview): From me6cyqi7s6681@hotmail.com  Mon Jul 22 18:36:04 2002; Return-Path: <me6cyqi7s6681@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MD6bhY016914;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): INSIGHT NEWS ALERT!; ; A new issue of Insight on the News is now online
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M4YfhY015080;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ========================================================; ; Now you can have HUNDREDS of lenders compete for your loan!
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MFnHhY081898
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Mon, 22 Jul 2002 10:49:1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00876.f61ec69c2872eb398ba3860a13a17b15 - missing value where TRUE/FALSE needed
## Header (preview): From dave2fg7@address.com  Mon Jul 22 18:39:27 2002; Return-Path: <dave2fg7@address.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ;
## Header (preview): Received: from mail.paulcarneymotors.com.au (117-14.dsl.connexus.net.au [203.222.117.14]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6MFqIe30019;   for <dmgibbs@midrange.com>; Mon, 22 Jul 2002 10:52:18 -0500
## Body (preview): <html><body>; <hr width = "100%">; <center><font size = "+2" color = "#44C300"><b>Government Grants E-Book 2002 edition</font></b><p>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MGLJhY095109;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_ZnkAvjw6_o9xevs6y_MA; Content-Type: text/plain; Content-Transfer-Encoding: quoted-printable
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MIG5hY041141;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MGZNhY000838;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Financial Services Company will pay a minimum of $250.00 (max. of $1000.00) for every lead that results in a sale.  Currently many of our Telemarketers are earning more than $5000.00 a month!; ; For more information call (402) 996-9002 and leave your contact information.  We will get in touch with you within 2-3 business days.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MGbbhY001615;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_MTVdUUF7_CFi9V3vL_MA; Content-Type: text/plain; Content-Transfer-Encoding: quoted-printable
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NDjOhY006172;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Proven 6 Year Old Better Business Registered Company Provides ; A REAL And Legitimate Opportunity To Make Some SERIOUS MONEY!;
## Header (preview): Received: from mail.ilxresorts.com (mail.ilxresorts.com [207.108.153.250]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6MJU8e16448;   for <gibbs@midrange.com>; Mon, 22 Jul 2002 14:30:09 -0500
## Body (preview): --#DM659823986#; Content-Type: text/plain; charset=us-ascii; Content-Transfer-Encoding: quoted-printable
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MHmfhY030050;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Hi Friend,;  ; ezDebtConsolidationInfo.com
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Mon Jul 22 18:12:16 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 418CC440C8
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00886.9bd2063c3d984a66958a6195ffb97849 - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MIENhY040297;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Want to make a million bucks this year?; Me too but it's probably not going happen!;
## Header (preview): From mrhealth@btamail.net.cn  Mon Jul 22 21:41:39 2002; Return-Path: <mrhealth@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): IMPORTANT NOTICE:  Regarding your domain name; ; * If you own a .com/.net/.org, you are advised to register
## Header (preview): From gtts@cable.net.co  Tue Jul 23 00:07:52 2002; Return-Path: <gtts@cable.net.co>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <x-tab>;
## Header (preview): From fv@Movieland.com  Mon Jul 22 20:07:59 2002; Return-Path: <fv@Movieland.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ############################################; #                                          #; #       Adult Online Super Store           #
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NBWdhY054045;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Gooday,; ; With warm heart my friend, I send you my greetings, and I hope this letter meets you in good time.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M7vChY094812;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): From theshyswm@hotmail.com  Tue Jul 23 02:59:03 2002; Return-Path: <theshyswm@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <div align="center">;   <center>;   <table border="3" cellspacing="3" width="80%" cellpadding="3" bgcolor="#800000" bordercolor="#C0C0C0">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MKW9hY095677;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; --__________MIMEboundary__________
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M1TAhY042161;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): BARRISTER ADEWALE COKER CHAMBERS; Legal Practitioners / Notary Public; Blk 804- Law House Building
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M1NYhY039893;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): BARRISTER ADEWALE COKER CHAMBERS; Legal Practitioners / Notary Public; Blk 804- Law House Building
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MA41hY045136;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:24 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): BARRISTER ADEWALE COKER CHAMBERS; Legal Practitioners / Notary Public; Blk 804- Law House Building
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:13:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): BARRISTER ADEWALE COKER CHAMBERS; Legal Practitioners / Notary Public; Blk 804- Law House Building
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MNnRhY075986;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; ; <html>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N9XdhY007742;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Y O U R  last chance for ; ; Y O U R $3000.00 INCOME per WEEK!
## Header (preview): From andrea_ofchuaa@hotmail.com  Mon Jul 22 18:34:49 2002; Return-Path: <andrea_ofchuaa@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging ; while burning fat, without dieting or exercise! This provendiscovery has even been reported ; on by the New England Journal of Medicine.Forget aging and dieting forever! And it's
## Header (preview): From sh@insurancemail.net  Tue Jul 23 00:02:08 2002; Return-Path: <sh@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_10CEB1_01C2319D.21A2F770
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N0CEhY085084;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <!-- saved from url=(0061)http://www.weginc.com/la/misc/IDS%20cellular/ids06/ids06.html -->; <HTML><HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Jul 25 11:10:22 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id A193E440DB
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00905.8dcb590481d3e3c04d03506100c59497 - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N22phY029096;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): IMPORTANT NOTICE:  Regarding your domain name; ; * If you own a .com/.net/.org, you are advised to register
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N0UthY092729;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview):       NEW IMPROVED reports; ; Dear Friend,
## Header (preview): From fork-admin@xent.com  Tue Jul 23 01:01:42 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_17_618511768207
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N1NehY013635
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Mon, 22 Jul 2002 20:23:4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00909.be44baf9966a96b2154b207cc56fe558 - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N1MWhY013295;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N1qWhY025053;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>;     <TITLE>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N6lxhY041419;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): FIND PROSPECTS FOR YOUR BIZ/PRODUCTS...FAST !!; ; DO YOU KNOW HOW TO USE E-MAIL?  Of course,
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N3UbhY063676;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear me ,; ; <!-- saved from url=(0022)http://internet.e-mail -->
## Header (preview): Received: from drghaz-s002.emirates.net.ae ([213.42.118.56]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6N3Qae12491;   for <gibbs@midrange.com>; Mon, 22 Jul 2002 22:26:37 -0500
## Body (preview): =============================================; Brand-New VERSION 7.0 Just Released:; Astounding New Software Lets You Find
## Header (preview): Received: from uuout14smtp10.uu.flonetwork.com (uuout14smtp10.uu.flonetwork.com [205.150.6.130]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6N43ae14008;   for <gibbs@midrange.com>; Mon, 22 Jul 2002 23:03:36 -0500
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; ; <html>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N4hthY092275;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Give me 5 minutes and I will show you how; to turn your computer into a cash machine!!!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6MHVlhY023443;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML><HEAD></HEAD><BODY><center><FONT SIZE=3D4 COLOR=3D#FF3300><B>Protect =; your financial well-being.<BR>Purchase an Extended Auto Warranty for your =; Vehicle TODAY.</B></FONT><BR><BR><BR><FONT FACE=3DArial SIZE=3D4 COLOR=3D#=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M8vphY019126;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <font color="#FFFFFF"><i>It costs nothing!</i></font>; <BODY TEXT="#000000" LINK="#0000ff" BGCOLOR="#ffffff">
## Header (preview): From fork-admin@xent.com  Mon Jul 22 18:14:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): FROM THE DESK OF:DR.OLUFEMI COKER,; ECONOMIC RECOVERY COMMITTEE,; FEDERAL SECRETARIAT,
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N6pDhY042891;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N6mBhY041520
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Tue, 23 Jul 2002 01:48:1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00921.548fb6dd2244c2fe87079df9652ddc2c - missing value where TRUE/FALSE needed
## Header (preview): Received: from mail.sunnyville.com.tw (Host5-224-99.pagic.net [211.73.224.99] (may be forged));    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6N7MUe20080;   for <gibbs@midrange.com>; Tue, 23 Jul 2002 02:22:32 -0500
## Body (preview): Do you have a product or service to offer?; Would you like to reach Hundreds of Thousands of clients?; Want more sales or leads?
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6M8LkhY005052;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head></head>; <body bgcolor = pink>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N8RbhY081370;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): CashIC.com =DDnternetten para kazandiran, en onemlisi Turkiye ye de odeme=;  yapan bir sponsor. Uye olmak icin internetsitenizin olmas=FD da gerekmiy=; or, herkes uye olup para kazanabilir.
## Header (preview): From submit27@desertmail.com  Wed Jul 24 02:48:09 2002; Return-Path: <submit27@desertmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): To remove see below.; ; I work with a company that submits
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NEOkhY021592;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <body bgcolor="#FFFFFF" text="#CC3333">; <p><font face="Arial, Helvetica, sans-serif"><b><font size="3">Hi: <br>;   </font></b></font></p>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N6gRhY039278;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <!-- saved from url=(0199)http://64.4.22.250/cgi-bin/getmsg?curmbox=F000000001&a=ff4bcc6372ee5e1b398defa168faf49d&msg=MSG1023911025.63&start=2053843&len=381107&mimepart=6&disk=64.4.22.67_d581&login=brianho3&domain=hotmail.com -->; <HTML xmlns="http://www.w3.org/TR/REC-html40" xmlns:o =
## Header (preview): From cheapdentists8715@Flashmail.com  Tue Jul 23 00:34:57 2002; Return-Path: <cheapdentists8715@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N09lhY083930;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>; <META content=3D"text/html; charset=3Diso-8859-1" http-equiv=3DContent-Typ=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N09khY083911;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML>; <BODY>
## Header (preview): From dadrnt@hotmail.com  Tue Jul 23 01:12:22 2002; Return-Path: <dadrnt@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NCMjhY073583;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; </head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N0VwhY093085;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD><TITLE>Online Marketing Strategies</TITLE><META http-equiv=3DContent=; -Type content=3D"text/html;
## Header (preview): X-Status: ; X-Keywords: ; X-Persona: <Fallingrock>
## Body (preview): <x-html>; <html>;
## Header (preview): Received: from [67.32.39.130] ([67.32.39.130]);    by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6N0Yee05828;;   Mon, 22 Jul 2002 19:34:46 -0500
## Body (preview): <HTML><HEAD></HEAD><BODY><center><FONT SIZE=3D4 COLOR=3D#FF3300><B>Protect =; your financial well-being.<BR>Purchase an Extended Auto Warranty for your =; Vehicle TODAY.</B></FONT><BR><BR><BR><FONT FACE=3DArial SIZE=3D4 COLOR=3D#=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NCHIhY071382;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): (Fax) to  my direct confidential  Fax No: 234 1 7591666  ; ; Dr. Kataga Bakori
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NCEjhY070202;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): (Fax) to  my direct confidential  Fax No: 234 1 7591666  ; ; Dr. Kataga Bakori
## Header (preview): From contractor@goldenbay.com.cy  Tue Jul 23 23:33:11 2002; Return-Path: <contractor@goldenbay.com.cy>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD><TITLE>Online Marketing Strategies</TITLE><META http-equiv=3DContent=; -Type content=3D"text/html;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NEkmhY030813;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <> Get up to 4 receivers installed in 4 rooms! ; <> No Equipment To Buy. ; <> Fist 3 Months of Free Service! -
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NCxqhY087719;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear Sir/Ma, ; I am HAJIYA MARYAM ABACHA, wife of the late Nigeria Head of State,General Sanni Abacha who died on the 8th of June, 1998 while still on active duty. l am contacting you in view of the fact that we will be of great assistance to each other likeness developing a cordial relationship. I currently have within my reach the sum of THIRTY FIVE MILLION US Dollars (US$35,000,000.00) cash which l intend to use for investment, like Real Estate Development or import/export business specifically in your country. This money came as a payback contract deal between my late husband and a Russian Firm on our countries multi-billion dollars Ajaokuta Steel Plant Project. The Russian Partners returned my husband's share of USD$35,000,000.00 after the death of my husband and lodged in my husband's security company of which l am director right now, the new Civilian Government have intensified their probe on my husband's financial and oil company. In view of these, l acted fast to withdraw the US$3!;  5,000,000.00 from the company's vault and deposited in another private security company vault within the country. I have since declared the Security Company bankrupt. No record ever existed concerning the money traceable by the government because there is no documentation showing that we received the money from the Russian. Due to the current situation in the country concerning government attitude towards my family, it has become quite impossible for me to make use of this money within. Let me refer you to the front page of This Day Newspapers of 10th March 2001. You can check it through their website : www.thisdayonline.com , click on archives,8th. june, 2001) The present government in Nigeria had frozen and seized all my bank accounts both here in Nigeria and abroad. Thus consent l shall expect you to contact me urgently to enable us discuss in detail about this transaction. Bearing in mind that your assistance is needed to transfer this fund, l proposed a percentage of 3!
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NLn7hY097248;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): GET READY FOR A DEAL YOU'VE NEVER SEEN BEFORE!; 10 million hot fresh email addresses and much more!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O9KDhY068565;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00C5_80C76A1D.C6068D13; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From mrhealth@btamail.net.cn  Tue Jul 23 18:03:21 2002; Return-Path: <mrhealth@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From mrhealth@btamail.net.cn  Fri Jul 26 12:50:12 2002; Return-Path: <mrhealth@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From mrhealth@btamail.net.cn  Fri Aug  2 09:05:04 2002; Return-Path: <mrhealth@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NFQHhY046384;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Do you want to make money from home?  Are you tired; of working for someone else? Then welcome to the ; future.
## Header (preview): From fork-admin@xent.com  Tue Jul 23 04:50:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From trade1944@eudoramail.com  Tue Jul 23 17:04:41 2002; Return-Path: <trade1944@eudoramail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): LazyTraders,; ; Even when the Market takes a 300 odd point dive you can still make money
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NH2GhY084090;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_BkymKzPF_EOQL8qx8_MR; Content-Type: text/html; Content-Transfer-Encoding: 8bit
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NH2EhY084072;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_BkymKzPF_EOQL8qx8_MR; Content-Type: text/html; Content-Transfer-Encoding: 8bit
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Jul 23 17:31:16 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 2AB70440CC
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00951.f7044a1b178dc3dcff44932f840b8805 - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NHHmhY090453;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): --DeathToSpamDeathToSpamDeathToSpam--; ;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NHHphY090509;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): --DeathToSpamDeathToSpamDeathToSpam--; ;
## Header (preview): From fork-admin@xent.com  Tue Jul 23 18:28:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): >>From the Desk of Mr. Kenneth Uba;  ; Union Bank of Nigeria,
## Header (preview): Received: from hook.helix.sk (bb207.isternet.sk [195.72.0.207]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6NKTpe18014;   for <gibbs@midrange.com>; Tue, 23 Jul 2002 15:29:53 -0500
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From printpal-3444431.13@marketingontarget.net  Tue Jul 23 18:20:20 2002; Return-Path: <printpal-3444431.13@marketingontarget.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NJo7hY050395;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N7MLhY055353;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NIbXhY022145;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=3Dbig5">; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NItnhY029228
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Tue, 23 Jul 2002 13:55:4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/00960.ae114c0b717c866b821efe032780a8e5 - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6N6xLhY045980;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <html>; <HEAD>
## Header (preview): From vi1teri6d3682@hotmail.com  Tue Jul 23 09:52:44 2002; Return-Path: <vi1teri6d3682@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NLFvhY084395;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Want to make a million bucks this year?; Me too but it's probably not going happen!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NMBUhY006400;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear cpunks =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NMDfhY007121;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear cpunks =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NMEahY007518;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>; <TITLE>whole ad</TITLE>
## Header (preview): Received: from mrmime.airsat.com.ar ([200.69.212.161]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6NA7me28749;   for <gibbs@midrange.com>; Tue, 23 Jul 2002 05:07:49 -0500
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NMXdhY014986;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; --__________MIMEboundary__________
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NMZJhY015758;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear cypherpunks =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): Received: from sv-01.ipa-imec.br ([200.182.176.130]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6NMdNe05289;   for <new-list-list@midrange.com>; Tue, 23 Jul 2002 17:39:24 -0500
## Body (preview): *****************BANNEDCD::::::::::::::::::::::::::::::::::>NET******************; ; I have been receiving emails saying that I'm contributing to the "moral decay of society" by selling the Banned CD.  That may be, but I feel strongly that you have a right to benefit from
## Header (preview): From aig@insurancemail.net  Wed Jul 24 00:05:34 2002; Return-Path: <aig@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_14FD9B_01C23266.747F2DA0
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6ONivi5014615;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; Hello, <br><br>; <div align="center"><font size=5><u>Premium Phone Qualified <br>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O0Q1hY059503;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): START A BUSINESS OR FUND YOUR CHILD'S COLLEGE WITHOUT DEBT.; ; Get the money you need and NEVER have to pay it back.
## Header (preview): From 5475yuy@msn.com  Mon Jul 29 11:21:24 2002; Return-Path: <5475yuy@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <html>; <HEAD>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O6FFhY095796;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0021_01C23272.92934220
## Header (preview): From 011696aaa002@mail.com  Tue Jul 23 14:00:50 2002; Return-Path: <011696aaa002@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health discovery that actuallyreverses aging while burning fat, without dieting or exercise! This provendiscovery has even been reported on by the New England Journal of Medicine.Forget aging and dieting forever! And it's Guaranteed! ; ; Click below to enter our web site:
## Header (preview): From r6N55u0Wu@mars.seed.net.tw  Wed Jul 24 02:38:37 2002; Return-Path: <r6N55u0Wu@mars.seed.net.tw>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_vt4s7Ki1w4kkBCQawg
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O3AjhY023815;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): MR MABO LOKO; BRANCH OFFICER,; UNITED BANK FOR AFRICA PLC
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O3BFhY024019;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): MR MABO LOKO; BRANCH OFFICER,; UNITED BANK FOR AFRICA PLC
## Header (preview): From fork-admin@xent.com  Wed Jul 24 03:17:29 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear fork =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): From fork-admin@xent.com  Wed Jul 24 03:08:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <body>
## Header (preview): From QGo0@yahoo.com  Wed Jul 24 03:17:36 2002; Return-Path: <QGo0@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_5O8i9UYbYKxGWktq5bsk5OC8
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O753hY015406;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <head>;
## Header (preview): From rates@digitalmortgage.cc  Wed Jul 24 06:56:38 2002; Return-Path: <rates@digitalmortgage.cc>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0012_01C1E216.45376260
## Header (preview): From bibey@att.net  Tue Jul 23 02:37:30 2002; Return-Path: <bibey@att.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From pitster267245087@hotmail.com  Wed Jul 24 06:15:00 2002; Return-Path: <pitster267245087@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body>; <hr width = "100%">; <center><font size = "+2" color = "#44C300"><b>Government Grants E-Book 2002 edition</font></b><p>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O8rDhY057724;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=3Dbig5">; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O92AhY061338;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=3Dbig5">; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Header (preview): From bsgusuuccesss@yahoo.com  Wed Jul 24 05:45:34 2002; Return-Path: <bsgusuuccesss@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p align="center"><b><font size="5" color="#FF0000">Fire Your Boss...</font></b><font size="5"><br>
## Header (preview): Received: from smtp2av.call.oleane.net (smtp2av.call.oleane.net [194.2.20.19]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6NICHe15190;   for <lynn.dietz@midrange.com>; Tue, 23 Jul 2002 13:12:17 -0500
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <html>; <HEAD>
## Header (preview): From ncprankservice@blueyonder.co.uk  Wed Jul 24 07:56:30 2002; Return-Path: <ncprankservice@blueyonder.co.uk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Please visit http://ukprankcalls.com to play a hilarious joke on your mates!
## Header (preview): From emailharvest@email.com  Wed Jul 24 09:00:50 2002; Return-Path: <emailharvest@email.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear jm =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O0TDhY060591;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Hi,; ; You can make $50,000 or more in the next 90 days sending e-mail.
## Header (preview): Received: from ns.hostinworld8.com ([65.125.227.118]);     by linux.midrange.com (8.11.6/8.11.6) with SMTP id g6OLkre20584;    for <dmgibbs@midrange.com>; Wed, 24 Jul 2002 16:46:53 -0500
## Body (preview): <html>; <body>; <p>100% Free Porn!<br>
## Header (preview): From seemsg_8452970@gmx.net  Wed Jul 24 10:43:10 2002; Return-Path: <seemsg_8452970@gmx.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =============================================; Brand-New VERSION 7.0 Just Released:; Astounding New Software Lets You Find
## Header (preview): From adrian7713j74@chello.at  Thu Jul 25 11:20:49 2002; Return-Path: <adrian7713j74@chello.at>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Header (preview): From cgarner@carrier.co.at  Tue Jul 23 23:17:03 2002; Return-Path: <cgarner@carrier.co.at>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>Take Control Of Your Conference Calls</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OAqlhY004815;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <=21-- saved from url=3D(0022)http://internet.e-mail -->; <=21DOCTYPE HTML PUBLIC =22-//W3C//DTD HTML 4.01 Transitional//EN=22>; <html xmlns:mso=3D=22urn:schemas-microsoft-com:office:office=22 xmlns:msdt=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P1Boi5048767;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; Hello, <br><br>; <div align="center"><font size=5><u>Premium Phone Qualified <br>
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): Received: from dallas.net (ultra1.dallas.net [204.215.60.15]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6OBc3e03139;   for <gibbs@midrange.com>; Wed, 24 Jul 2002 06:38:03 -0500
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (YourPeach21@hotmail.com) on Wednesday, July 24, 2002 at 06:30:19; ---------------------------------------------------------------------------
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NJpVhY051078;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Hi,; ; I'm a college dropout.  I work about two hours a day.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OCv8hY053287;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <BODY BGCOLOR="#FFFFFF">; ; <DIV ALIGN="center">
## Header (preview): From sitescooper-talk-admin@lists.sourceforge.net  Wed Jul 24 13:58:35 2002; Return-Path: <sitescooper-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3Chtml=3E=3Chead=3E=3Cmeta http-equiv=3DContent-Language content=3Dtr=3E=3Cmeta http-equiv=3DContent-Type content=3D=22text=2Fhtml=3B charset=3Dwindows-1254=22=3E=3Ctitle=3ETR Rehber 6=3C=2Ftitle=3E=3C=2Fhead=3E; =3Cbody background=3D=22http=3A=2F=2Fxyzlm22=2Esitemynet=2Ecom=2Fback1=2Egif=3E=22 topmargin=3D1 leftmargin=3D1 bgcolor=3D=22#CECFFF=22=3E;       =3Cp align=3D=22center=22=3E
## Header (preview): From aandjbaughebook@yahoo.com  Mon Jul 29 11:40:54 2002; Return-Path: <aandjbaughebook@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <html>;
## Header (preview): From fork-admin@xent.com  Wed Jul 24 02:55:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From infoeurope@mailcity.com  Wed Jul 24 15:12:29 2002; Return-Path: <infoeurope@mailcity.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): THE NEDERLANDS.; ;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OBCfhY012590;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): =DDyi g=FCnler; ; =20
## Header (preview): Received: from eastgate.starhub.net.sg (eastgate.starhub.net.sg [203.116.1.189]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6OEHve32523;   for <gibbs@midrange.com>; Wed, 24 Jul 2002 09:17:58 -0500
## Body (preview): (See Disclaimer below); ;
## Header (preview): From densua@Flashmail.com  Wed Jul 24 15:16:32 2002; Return-Path: <densua@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR>; </div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Hum<!--jm-->an
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OFDshY006978;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): DEAR SIR,; ; I am MRS MARIAM ABACHA, wife of the late Nigerian
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OFNkhY011220;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): DEAR SIR,; ; I am MRS MARIAM ABACHA, wife of the late Nigerian
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O4fhhY059330;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; </head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Wed Jul 24 18:00:07 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 95CB4440CD
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01013.c6cf4f54eda63230389baccc02702034 - missing value where TRUE/FALSE needed
## Header (preview): Received: from mailsouthcarolina.com ([64.216.79.71]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6P2NEe17907;   for <gibbs@midrange.com>; Wed, 24 Jul 2002 21:23:15 -0500
## Body (preview): Hi !  Your name was submitted as someone who might be interested in making money at home.  If this is in error, please excuse this email and delete it. This is a one time mailing. "DO NOT REPLY UNLESS YOU WANT MORE EMAILS"!!!; ; If you ARE interested in Making Money At Home, send an email to
## Header (preview): From promos@famtriptravel.com  Thu Jul 25 11:18:56 2002; Return-Path: <promos@famtriptravel.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is an HTML email message.  If you see this, your mail client does not support HTML messages.; ; ------=_NextPart_MABVCXIMXO
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6ONYHi5010344;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <x-tab>;
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6NJXvhY044076
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Tue, 23 Jul 2002 14:33:5...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01017.11a80131a2ae31ad0a9969189de3c2bb - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P37Ai5093886;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Hello,; ; This is a one time mailing.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O8EmhY042650;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <!-- saved from url=3D(0022)http://internet.e-mail --><HTML><HEAD><TITLE>N=; ew Web Technology</TITLE>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O2a1hY010356;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <body bgcolor="#FFFFFF" text="#CC3333">; <p><font face="Arial, Helvetica, sans-serif"><b><font size="3">Hi: <br>;   </font></b></font></p>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OKN9i5035373;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; --__________MIMEboundary__________
## Header (preview): From sahilinux4oems@sixnet-io.com  Thu Jul 25 11:00:19 2002; Return-Path: <sahilinux4oems@sixnet-io.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Industrial LINUX News: ; ; The June issue of the ISA's InTech Magazine has an interesting article on how truly open Linux applications can lower development cost and increase the performance and reliability of industrial automation.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O9HehY067614;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Long time no chat!; ; How have you been? If you've been like me, you've been trying
## Header (preview): Received: from uuout10smtp6.uu.flonetwork.com (uuout10smtp6.uu.flonetwork.com [205.150.6.36]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6OLTCe16779;   for <gibbs@midrange.com>; Wed, 24 Jul 2002 16:29:14 -0500
## Body (preview): <html>; <body>;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6O9hRhY077561;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Long time no chat!; ; How have you been? If you've been like me, you've been trying
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OK2Vi5027147;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>;  ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P0noi5039766;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML><P ALIGN=CENTER><FONT  SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0"><B>SAY GOODBYE <BR>; TO Dropped calls Forever!<BR>; </FONT><FONT  COLOR="#ff0000" BACK="#ffffff" style="BACKGROUND-COLOR: #ffffff" SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0">New Technological Breakthrough</FONT><FONT  COLOR="#000000" BACK="#ffffff" style="BACKGROUND-COLOR: #ffffff" SIZE=2 PTSIZE=10 FAMILY="SANSSERIF" FACE="Arial" LANG="0"><BR>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OMt3i5094918;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 Transitional//EN">; ; <html>
## Header (preview): From dna@insurancemail.net  Thu Jul 25 11:19:12 2002; Return-Path: <dna@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0007_01C23333.1932BF20
## Header (preview): Received: from otp.elinkisp.com (mail.elinkisp.com [66.7.15.149]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6OBfWe03179;   for <mitch@midrange.com>; Wed, 24 Jul 2002 06:41:32 -0500
## Body (preview): <html>; <head>; </head>
## Header (preview): From xe8xekv2v2683@hotmail.com  Wed Jul 24 13:02:33 2002; Return-Path: <xe8xekv2v2683@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P1SRi5055416;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>;     <TITLE>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P1iXi5061733;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <body>; <p>100% Free Porn!<br>
## Header (preview): From Your_Friend@indians.org  Thu Jul 25 11:07:02 2002; Return-Path: <Your_Friend@indians.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <BODY bgColor=#ffffff>; <DIV><FONT face=Arial size=2>Dear Friend,</FONT></DIV>; <DIV><FONT face=Arial size=2>&nbsp;</FONT></DIV>
## Header (preview): From fork-admin@xent.com  Thu Jul 25 11:19:26 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_480_83855460462270663
## Header (preview): From fork-admin@xent.com  Thu Jul 25 11:10:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): !Want to make a million bucks this year?; Me too but it's probably not going happen!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OMigi5090780;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title>Digital Authoring Tools - Free Software Alert!</title>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P57Bi5040575;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html><H3><B>You only <I><font color=red>THINK</font> </font> you're a; <font color=blue>U.S. citizen!!</font><P>;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OLD9i5055020;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; Hello, <br><br>; <div align="center"><font size=5><u>Premium Phone Qualified <br>
## Header (preview): From fork-admin@xent.com  Thu Jul 25 11:19:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3Chtml=3E=3Cbody onload=3D=22window=2Eopen=28'http=3A=2F=2F202=2E101=; =2E163=2E34=3A81=2Fultimatehgh=5Frun=2F'=29=22 ; bgColor=3D=22#CCCCCC=22 topmargin=3D1 onMouseOver=3D=22window=2Estatus=
## Header (preview): From stephen.adler@allexecs.org  Thu Jul 25 11:05:40 2002; Return-Path: <stephen.adler@allexecs.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------ack1234; Content-Type: multipart/alternative; boundary="----alt_border_1";
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P4bJi5028880;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title>Web Letter</title>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P8mxi5027401;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Look this is so hot that not only do you want one... but you can get rich selling it to others... some will use it for good and many will use it for bad... either way the unit works...It is a bulb... but it is not a bulb... it is a secret wireless camera use professionally by cia, fbi and others... original cost was over $5000 but because someone went to china to knock them off you now can buy it today for $299 each, or 2 for $499 or 10 for $1750... do the math... you can earn $125 per unit or more and sell 10 in a week... all people need to do is see one and they flip out...Here is how it worksYou screw it into any lamp, wall  or ceiling bulb socet (even over the shower) it could be in a dark place it don't matter... put it in your bedroom and make sure your wife does not have company while you are working... i am telling you man you would pay $1000's for this toy... Then you take the other piece and plug it into your vcr and it is as if you were standing over the person wi!; th!;  a video camera... As I said some will use it for good and some will use it for bad... and some will be like me and just get rich selling them... all you need do is demo it and they buy it... heh he even if it takes a day to sell just one you make $125but who says you have to charge $299 you can charge $499 and make $325 follow the rest of the information and check it out....Special Sale thru July 31st, 2002               http://www.easy-signup.com/sv4/
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6ONfwi5013534;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): JetMp3 T=FCrkiye'de ilk kez uygulanan bir sistemi hayata ge=E7irdi.; http://www.jetmp3.com; Bu sistemle art=FDk =DDstedi=F0iniz MP3 leri ister tek tek isterseniz alb=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6ONthi5018850;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): JetMp3 T=FCrkiye'de ilk kez uygulanan bir sistemi hayata ge=E7irdi.; http://www.jetmp3.com; Bu sistemle art=FDk =DDstedi=F0iniz MP3 leri ister tek tek isterseniz alb=
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P5J6i5045502;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): HELLO,; ; I AM A CITIZEN OF ZAIRE, SON OF THE LATE FORMER
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P5VKi5050420;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (Pamela@Blinkese.com) on Thursday, July 25, 2002 at 01:23:03; ---------------------------------------------------------------------------
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P6DWi5066692;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>;     <TITLE>
## Header (preview): From ABIGAIL@milepost1.com  Thu Jul 25 11:20:00 2002; Return-Path: <ABIGAIL@milepost1.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): .; ; ukqdrblkougooeoffnxsmbowei
## Header (preview): From webmake-talk-admin@lists.sourceforge.net  Thu Jul 25 11:20:19 2002; Return-Path: <webmake-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =3Chtml=3E=3Chead=3E=3Cmeta http-equiv=3DContent-Language content=3Dtr=3E=3Cmeta http-equiv=3DContent-Type content=3D=22text=2Fhtml=3B charset=3Dwindows-1254=22=3E=3Ctitle=3ETR Rehber 6=3C=2Ftitle=3E=3C=2Fhead=3E; =3Cbody background=3D=22http=3A=2F=2Fxyzlm22=2Esitemynet=2Ecom=2Fback1=2Egif=3E=22 topmargin=3D1 leftmargin=3D1 bgcolor=3D=22#CECFFF=22=3E;       =3Cp align=3D=22center=22=3E
## Header (preview): From investors9829032400m22@excite.com  Fri Jul 26 02:30:23 2002; Return-Path: <investors9829032400m22@excite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Learn from the BEST...for FREE! ; ; Learn to locate the markets that will make you money.
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PBGvi5085125;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Computer Privacy Help elizabeth0318 ,; ; <html>
## Header (preview): Received: from s1.smtp.oleane.net (s1.smtp.oleane.net [195.25.12.3]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6O1Wue21176;   for <lynn.dietz@midrange.com>; Tue, 23 Jul 2002 20:32:56 -0500
## Body (preview): <html><body><table border=3D"2" cellpadding=3D"4" width=3D"51%" height=3D"3=; 70">;   <tr>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PEfGi5066072;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <x-tab>;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PAlXi5073503;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Do you dream of working for yourself? From the; luxury of your own home?;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PBN3i5087599;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ##################################################; #                                                #; #                 Adult Club=99                    #
## Header (preview): From pitster262859971@hotmail.com  Thu Jul 25 15:13:53 2002; Return-Path: <pitster262859971@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Computer User jlugo ,; ; <html>
## Header (preview): From pitster262859971@hotmail.com  Mon Jul 29 11:21:55 2002; Return-Path: <pitster262859971@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Computer User jlugo ,; ; <html>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PLp4i5035872;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; </head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From d_tah@hotmail.com  Thu Jul 25 11:20:43 2002
## Return-Path: <d_tah@hotmail.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 30703440D0
##  for <jm@lo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01060.d72413ea3af9e1c5530a3570e0bb517e - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PEw5i5072820;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (Pamela@Blinkese.com) on Thursday, July 25, 2002 at 10:49:57; ---------------------------------------------------------------------------
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PDY5i5039282;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): When America's top companies compete for your business, you win.; ; http://four87.six86.com/sure_quote/sure_quote.htm
## Header (preview): From fork-admin@xent.com  Thu Jul 25 17:14:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Want to watch HARDCORE PORN MOVIES ? ; ; Our site is voted the #1 BROADBAND MOVIE SITE ONLINE !
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PGTbi5008815
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Thu, 25 Jul 2002 11:29:3...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01064.50715ffeb13446500895836b77fcee09 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From sitescooper-talk-admin@lists.sourceforge.net  Thu Jul 25 13:07:23 2002
## Return-Path: <sitescooper-talk-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netno...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01065.9ecef01b01ca912fa35453196b4dae4c - missing value where TRUE/FALSE needed
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PHXhi5034292;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; <title>COPY YOUR DVD MOVIES!</title>
## Header (preview): From fork-admin@xent.com  Thu Jul 25 11:19:54 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): Received: from uuout13smtp13.uu.flonetwork.com (uuout13smtp13.uu.flonetwork.com [205.150.6.113]);  by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PI3ie08724;   for <gibbs@midrange.com>; Thu, 25 Jul 2002 13:03:45 -0500
## Body (preview): <HTML>; <HEAD>; <TITLE>RE: CLAIM YOUR FREE STORAGE REEL &amp; SPRAY GUN ($20 Value) WITH FLATHOSE!</TITLE>
## Header (preview): From fork-admin@xent.com  Thu Jul 25 18:00:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_205_23557566705631860586663641
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P5wfi5060851;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html><head><meta http-equiv=3DContent-Type content=3D"text/html; charset=3D=; windows-1252"><title>SPECIAL ALERT</title><style><!--li.MsoNormal{mso-styl=; e-parent:"";margin-bottom:.0001pt;font-size:12.0pt;font-family:"Times New =
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PIDmi5049922;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; </head>
## Warning in strsplit(email_text, "\n"): unable to translate 'Received: from hq.pro-ns.net (localhost [127.0.0.1])
##  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PIQGi5055045
##  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
##  for <cypherpunks-forward@ds.pro-ns.net>; Thu, 25 Jul 2002 13:26:1...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01072.ac604802c74de2ebc445efc827299b96 - missing value where TRUE/FALSE needed
## Header (preview): From solution244@hotmail.com  Thu Jul 25 23:46:25 2002; Return-Path: <solution244@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is not spam.  Thanks for posting to our promotional web sites. If you ; wish to no longer receive email from us at this email address, or if you feel  ; you received this email in error please send an email message to
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PLF3i5021548;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00A8_33A71B3A.A8744E52; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PJEei5073747;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ################################################; #                                              #=20; #     Free Hardcore Porn - VIP Membership      #
## Header (preview): Received: from marge.expeditus.co.uk ([213.52.162.178]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PKx8e19548;   for <cinnamon@midrange.com>; Thu, 25 Jul 2002 15:59:09 -0500
## Body (preview):   If Amateurs is what you want,  Then we Have them.; Take a look at these HARDCORE sites.  Young HOTTT TEENS !!!;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PIsri5066116;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_864650872074
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PBnOi5097689;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PAYpi5068503;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): Received: from marge.expeditus.co.uk ([213.52.162.178]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PKxDe19562;   for <evie@midrange.com>; Thu, 25 Jul 2002 15:59:14 -0500
## Body (preview):
## Header (preview): From porn@napster.com  Fri Jul 26 04:48:48 2002; Return-Path: <porn@napster.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Free Porn Passwords</title>
## Header (preview): Received: from relay2.hot.ee (mail.hot.ee [194.126.101.94]);   by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PLI9e21405;   for <debra@midrange.com>; Thu, 25 Jul 2002 16:18:09 -0500
## Body (preview):
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PMOji5048990;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Reply From EnenKio; The following message was recieved Saturday, 13 July 2002.=20; Nothing has been amdended or changed. I hold no responcibility for the
## Header (preview): From ag@insurancemail.net  Fri Jul 26 00:01:00 2002; Return-Path: <ag@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_42AA1_01C233F9.06BE6710
## Header (preview): From jm@netnoteinc.com  Thu Jul 25 23:24:48 2002; Return-Path: <yyyy@netnoteinc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_1493_212580644306344345450286
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PNbNi5077250;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): This is a multi-part message in MIME format.; ; --__________MIMEboundary__________
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P4hKi5031186;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head>; </head>
## Header (preview): Received: from karls (194-086.basec.net [208.233.194.86] (may be forged));     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PCile14940;   for <mitch@midrange.com>; Thu, 25 Jul 2002 07:44:47 -0500
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6Q14xi5011399;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): Dear juanzec ,; ; <html>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PFMti5082737;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PDnTi5045564;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; ; <head>
## Header (preview): Received: from mail.escorts.co.in (IDENT:root@[203.200.75.75]);    by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PHkbe06080;   for <kas@midrange.com>; Thu, 25 Jul 2002 12:46:37 -0500
## Body (preview): <html>; <head>; <title>Free passwords</title>
## Header (preview): From bcbridge@hotmail.com  Thu Jul 25 15:41:16 2002; Return-Path: <bcbridge@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From regal3@freeuk.com  Fri Jul 26 03:51:44 2002; Return-Path: <regal3@freeuk.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------_NextPart_6193500912
## Header (preview): From regal3@freeuk.com  Fri Jul 26 05:02:52 2002; Return-Path: <regal3@freeuk.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------_NextPart_1622483731
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6OErjhY099080;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00D6_44B11E8C.E6018B42; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From mintformer@yahoo.com.hk  Fri Jul 26 06:42:01 2002; Return-Path: <mintformer@yahoo.com.hk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_w06gnvwSMBJCZhhJJKsn0sSgc1kn
## Header (preview): From pitster269304417@hotmail.com  Fri Jul 26 06:55:32 2002; Return-Path: <pitster269304417@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear lsb36 ,; ; <html>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PKqXi5012305;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From taxfree7550288@yahoo.com  Fri Jul 26 08:16:45 2002; Return-Path: <taxfree7550288@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>; <META http-equiv=Content-Type content="text/html; charset=windows-1252">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6Q0nti5005396;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <head>; <STYLE></STYLE>; </head>
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6P8l9i5026766;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html>; <head></head>; <body bgcolor = pink>
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:39:57 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Homeowner, ; ; Interest Rates are at their lowest point in 40 years! We help you find the
## Warning in strsplit(email_text, "\n"): unable to translate 'From china_lutong@163.com  Fri Jul 26 11:20:29 2002
## Return-Path: <china_lutong@163.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 03ACF440EA
##  for ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01104.ec267abf01fe81c42dc90dfd16c930bc - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From china_lutong@163.com  Fri Jul 26 11:20:35 2002
## Return-Path: <china_lutong@163.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 7635A440EB
##  for ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01105.2582a4afba9b0b06bed5d48e3e8b29df - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From social-admin@linux.ie  Fri Jul 26 12:04:31 2002
## Return-Path: <social-admin@linux.ie>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 0F61D440E7
##  fo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01106.37f316c0f77e739cb5fe0e37aaea2046 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From social-admin@linux.ie  Fri Jul 26 12:04:40 2002
## Return-Path: <social-admin@linux.ie>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 6353A440E8
##  fo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01107.5b3ad5e88347b08967ec627b815f2fc3 - missing value where TRUE/FALSE needed
## Header (preview): From remove@nok-nok.net  Fri Jul 26 12:20:54 2002; Return-Path: <remove@nok-nok.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------_NextPart_165172954316671
## Header (preview): Received: from rwcrmhc51.attbi.com (rwcrmhc51.attbi.com [204.127.198.38]);     by linux.midrange.com (8.11.6/8.11.6) with ESMTP id g6PNjue20565;   for <gibbs@midrange.com>; Thu, 25 Jul 2002 18:45:56 -0500
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6PNixi5080113;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): <html><body>; ; <table bgcolor=3D"663399" border=3D"2" width=3D"999" cellspacing=3D"0" cel=
## Header (preview): From fork-admin@xent.com  Fri Jul 26 15:41:52 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, fork@xent.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From kenmonique@msn.com  Fri Jul 26 05:23:01 2002; Return-Path: <kenmonique@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body>; ; <table bgcolor=3D"#FF6666" border=3D"2" width=3D"999" cellspacing=3D"0" ce=
## Header (preview): From httpd@blue003.nwcyberbaseus.com  Fri Jul 26 16:07:55 2002; Return-Path: <httpd@blue003.nwcyberbaseus.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear LAXPress.com customer,; ; You are receiving this email as a result of having joined one of our opt-in adults only newsletter services.
## Header (preview): From ilug-admin@linux.ie  Mon Jul 29 11:39:21 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =================================; ; Guaranteed to increase, lift and firm your
## Header (preview): From obi@accountant.com  Fri Jul 26 18:16:38 2002; Return-Path: <obi@accountant.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Sir,; ; My name is Mr. Obi W, the manager, credit and foreign bills of Eco
## Header (preview): From beth@yahoo.com  Mon Jul 29 11:20:54 2002; Return-Path: <beth@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; <TITLE></TITLE>
## Header (preview): From hothose2r@eudoramail.com  Mon Jul 29 11:21:06 2002; Return-Path: <hothose2r@eudoramail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =================================; ; Guaranteed to increase, lift and firm your
## Header (preview): From nlv@insurancemail.net  Mon Jul 29 11:39:25 2002; Return-Path: <nlv@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_8531F_01C234BE.5332BD60
## Header (preview): From fork-admin@xent.com  Fri Jul 26 12:21:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Jul 29 11:29:04 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 097AA44163
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01120.853b87a34ab28efd22d9851702b2f9c5 - missing value where TRUE/FALSE needed
## Header (preview): From claudia_lopez@earthdome.com  Mon Jul 29 11:21:18 2002; Return-Path: <claudia_lopez@earthdome.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): IMPORTANT INFORMATION:; ; The new domain names are finally available to the general public at discount prices. Now you can register one of the exciting new .BIZ or .INFO domain names, as well as the original .COM and .NET names for just $14.95. These brand new domain extensions were recently approved by ICANN and have the same rights as the original .COM and .NET domain names. The biggest benefit is of-course that the .BIZ and .INFO domain names are currently more available. i.e. it will be much easier to register an attractive and easy-to-remember domain name for the same price.  Visit: http://www.affordable-domains.com today for more info.
## Header (preview): From alyssa@lt08.yourip21.com  Mon Jul 29 11:39:15 2002; Return-Path: <alyssa@lt08.yourip21.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): When America's top companies compete for your business, you win.; ; http://four87.six86.com/sure_quote/sure_quote.htm
## Header (preview): From csh1@msn.com  Mon Jul 29 11:21:02 2002; Return-Path: <csh1@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body>; ; <table bgcolor=3D"663399" border=3D"2" width=3D"999" cellspacing=3D"0" cel=
## Header (preview): From dlang7@workmail.co.za  Mon Jul 29 11:21:19 2002; Return-Path: <dlang7@workmail.co.za>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Jul 29 11:39:59 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 47E8D44167
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01125.46ca779f86e1dd0a03c3ffc67b57f55e - missing value where TRUE/FALSE needed
## Header (preview): From hxu@cliffhanger.com  Mon Jul 29 11:21:29 2002; Return-Path: <hxu@cliffhanger.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv="Content-Language" content="en-us">
## Header (preview): From creditrepair@optinllc.com  Mon Jul 29 11:21:43 2002; Return-Path: <creditrepair@optinllc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; ; <HEAD>
## Header (preview): From prtal@sdilabs1w.com  Mon Jul 29 11:21:12 2002; Return-Path: <prtal@sdilabs1w.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <FONT SIZE=3D"1"><FONT FACE=3D"VERDANA"><FONT COLOR=3D"BLACK"><ALIGN=3DLEF=; T>
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:39:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We ship worldwide within 24 hours!; ; No waiting rooms, drug stores, or embarrassing conversations.
## Header (preview): From cheapbargain@yahoo.com  Mon Jul 29 11:40:01 2002; Return-Path: <cheapbargain@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body><div align=3D"center">;   <center>;   <table border=3D"3" cellspacing=3D"3" width=3D"80%" cellpadding=3D"3" bg=
## Header (preview): From Letitia22323124@cumbriamail.com  Mon Jul 29 13:39:35 2002; Return-Path: <Letitia22323124@cumbriamail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Header (preview): From Danielkxyolski@yahoo.com  Tue Jul 30 04:46:33 2002; Return-Path: <Danielkxyolski@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We guarantee you free signups before you ever pay; a penny!   We will show you the money before you; ever take out your wallet.  Sign up for FREE and test
## Header (preview): From primeman@Flashmail.com  Mon Jul 29 11:21:46 2002; Return-Path: <primeman@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =================================; ; Guaranteed to increase, lift and firm your
## Header (preview): From fcallthewayto@msn.com  Mon Jul 29 11:40:29 2002; Return-Path: <fcallthewayto@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From gort44@excite.com  Mon Jul 29 11:40:11 2002; Return-Path: <gort44@excite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Homeowner, ; ; Interest Rates are at their lowest point in 40 years! We help you find the
## Header (preview): From webmaster2fg7@address.com  Mon Jul 29 11:21:28 2002; Return-Path: <webmaster2fg7@address.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ;
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:40:35 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):  fork@xent.com; ; YOU WON A FREE PORN PASSWORD!!
## Header (preview): From suzie245@veronico.it  Mon Jul 29 11:21:58 2002; Return-Path: <suzie245@veronico.it>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p>See These Sweet Latina Honeys Go From Clothed TO Fucked!!!<br>
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:40:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>IGTT</title>
## Header (preview): From vnufbiehrereisb@hotmail.com  Mon Jul 29 11:40:25 2002; Return-Path: <vnufbiehrereisb@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From o18544@bluemail.dk  Mon Jul 29 11:21:53 2002; Return-Path: <o18544@bluemail.dk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <BODY BGCOLOR=3D"#ffff80"><P ALIGN=3DCENTER><FONT  SIZE=3D3 PTSIZE=3D12 FA=; MILY=3D"SANSSERIF" FACE=3D"Arial" LANG=3D"0"><BR>
## Header (preview): From jm@netnoteinc.com  Mon Jul 29 11:22:06 2002; Return-Path: <yyyy@netnoteinc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_34_5888148775635227063366114
## Header (preview): From rwuma@mailasia.com  Mon Jul 29 11:22:08 2002; Return-Path: <rwuma@mailasia.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): As seen on NBC, CBS, CNN, and even Oprah! The health ; discovery that actually reverses aging while burning fat, ; without dieting or exercise! This proven discovery has even
## Warning in strsplit(email_text, "\n"): unable to translate 'From info@9to6.ie  Mon Jul 29 11:40:47 2002
## Return-Path: <info@9to6.ie>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 00B0544117
##  for <jm@localhost>; ...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01144.94d2d4f5dfefab34c1370aec38d470eb - missing value where TRUE/FALSE needed
## Header (preview): From regional_rrr@yahoo.com  Mon Jul 29 11:21:51 2002; Return-Path: <regional_rrr@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ==========================================================================; ; Now you can have HUNDREDS of lenders compete for your loan!
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6Q0Fii5091918;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00A6_65D74A6D.D6752B68; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From vnufbiehrereisb@hotmail.com  Mon Jul 29 11:21:57 2002; Return-Path: <vnufbiehrereisb@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From womenwithcumontheirfaceforyoutosee@froma2z.com  Mon Jul 29 11:21:26 2002; Return-Path: <womenwithcumontheirfaceforyoutosee@froma2z.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Fantastic Facials!</title>
## Header (preview): From dfbgeuvbifeigv@msn.com  Mon Jul 29 11:40:35 2002; Return-Path: <dfbgeuvbifeigv@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <HTML><HEAD><META http-equiv=3DContent-Type content=3Dtext/html;charset=3D=; iso-8859-1><STYLE type=3Dtext/css>H1 { } TD {  FONT-SIZE: 12px; FONT-FAMIL=
## Header (preview): From doitnow@freemail.nl  Mon Jul 29 11:22:17 2002; Return-Path: <doitnow@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From mrsabacha_11@mail.com  Mon Jul 29 11:22:20 2002; Return-Path: <mrsabacha_11@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear friend,; May I briefly introduce myself to you. I am Hajia Maryam Abacha, the wife of late Nigerian Head of State, General Sanni Abacha, who died on the 8th of June 1998. ever since the death of my husband, my family has been facing a lot of problems mostly with the present civilian government. Consequently, my son - Mohammed Abacha has been under torture in detention for a sin he did not commit and made to make a lot of confessions as regards valuables and money, including that of my late husband entrusted in his hand for safe keeping. ; The latest is the confession of the US$700,000,000.00 (Seven Hundred Million United States Dollars) cash his late father gave him for safe keeping. Please check News watch Magazine of May 8th / 15th, 2000 issue on [Website:http://www.newswatchngr.com] to confirm the above story. Also the recent publication by this day Newspaper on Thursday March 1st Edition, which London Court clear ways for more recovery of Abacha's family looted money. Please confirm this issue on website; http://www.thisdayonline.com, click the Archieve/2001/March 2001/Thursday March 1st.
## Header (preview): From ilug-admin@linux.ie  Mon Jul 29 11:28:18 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by  (spock@1andonly.com) on Sunday, July 28, 19102 at 15:37:19; ---------------------------------------------------------------------------;
## Header (preview): From mdbayler@amison69.freeserve.co.uk  Mon Jul 29 11:22:21 2002; Return-Path: <mdbayler@amison69.freeserve.co.uk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <html>; <SCRIPT>
## Header (preview): From apache@ns3.super-hosts.com  Mon Jul 29 11:26:41 2002; Return-Path: <apache@ns3.super-hosts.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by  (spock@1andonly.com) on Sunday, July 28, 19102 at 15:59:55; ---------------------------------------------------------------------------;
## Header (preview): Received: from hq.pro-ns.net (localhost [127.0.0.1]);  by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6Q0m6i5004754;  (version=TLSv1/SSLv3 cipher=EDH-DSS-DES-CBC3-SHA bits=168 verify=NO)
## Body (preview): ------=_NextPart_000_00B6_53D62C4C.C4267A64; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:40:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:29:32 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi !; ; My name is Wayne Harrison and I would like to share a
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:41:11 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <table width="715">;   <tr>;     <td vAlign="top" align="left" width="511">
## Header (preview): From cleand_my_shed@yahoo.com  Mon Jul 29 11:41:08 2002; Return-Path: <cleand_my_shed@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From allmerica@insurancemail.net  Mon Jul 29 11:41:14 2002; Return-Path: <allmerica@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_C7975_01C23675.9DAF2550
## Header (preview): From babyface7361i02@sbox.tu-graz.ac.at  Mon Jul 29 21:38:52 2002; Return-Path: <babyface7361i02@sbox.tu-graz.ac.at>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Easy 30-50% Return?; ; Learn how you can receive a monthly check for 3, 4, or 5%
## Header (preview): From Programmers@bellsouth.net  Mon Jul 29 11:41:19 2002; Return-Path: <Programmers@bellsouth.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><head><title></title>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">; <style type="text/css">
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:41:01 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Jul 29 11:41:26 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 38B5E44136
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01164.55202a4234914b20004dc7f9264313e5 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Mon Jul 29 11:41:22 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_706_245554380
## Header (preview): From lazytrader@mail.com  Mon Jul 29 12:48:16 2002; Return-Path: <lazytrader@mail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Well, LazyTraders, ; ; Our Chatroom continues to get more profitable every week, here is what happened this week;
## Warning in strsplit(email_text, "\n"): unable to translate 'From bestoffers@dishnetdsl.net  Mon Jul 29 14:10:01 2002
## Return-Path: <bestoffers@dishnetdsl.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 676FF4...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01167.2ac57a0189fa2b8713202b84e587b707 - missing value where TRUE/FALSE needed
## Header (preview): From zcvzxbfds@office.com  Mon Jul 29 11:22:31 2002; Return-Path: <zcvzxbfds@office.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From suis@freemail.nl  Mon Jul 29 19:24:29 2002; Return-Path: <suis@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Mon Jul 29 20:27:37 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id DB6D4440F2
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01170.0f6cbb8149f3e19d1b3054960e2cceb5 - missing value where TRUE/FALSE needed
## Header (preview): From timaims@hotmail.com  Mon Jul 29 13:08:36 2002; Return-Path: <timaims@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=windows-1252">
## Header (preview): From mando@insurancemail.net  Tue Jul 30 00:01:26 2002; Return-Path: <mando@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_109E99_01C2371D.2AAD3990
## Warning in strsplit(email_text, "\n"): unable to translate 'From ali@microfinder.com  Tue Jul 30 01:42:57 2002
## Return-Path: <ali@microfinder.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 8C565440EE
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01173.e0da19fcbb5649aa5104320ce38c6906 - missing value where TRUE/FALSE needed
## Header (preview): From bestrate@igo6.saverighthere.com  Tue Jul 30 05:07:05 2002; Return-Path: <bestrate@igo6.saverighthere.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Protect your financial well-being.; Purchase an Extended Auto Warranty for your Car today. CLICK HERE for a FREE no obligation quote.; http://www3.all-savings.com/warranty/
## Header (preview): From lihochin@yahoo.com  Tue Jul 30 09:40:57 2002; Return-Path: <lihochin@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00E5_50D62D7A.E1807C03; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From fork-admin@xent.com  Tue Jul 30 07:29:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (xcutieamandax@yahoo.com) on Tuesday, July 30, 2002 at 01:29:47; ---------------------------------------------------------------------------
## Header (preview): From fork-admin@xent.com  Tue Jul 30 08:19:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (xcutieamandax@yahoo.com) on Tuesday, July 30, 2002 at 03:04:36; ---------------------------------------------------------------------------
## Header (preview): From mike3356@avolta.pg.it  Tue Jul 30 08:29:59 2002; Return-Path: <mike3356@avolta.pg.it>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p>Shoot your wad all over her face.<br>
## Header (preview): From apache@ns3.super-hosts.com  Tue Jul 30 08:50:18 2002; Return-Path: <apache@ns3.super-hosts.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by  (mike@winners.com) on Tuesday, July 30, 19102 at 03:48:23; ---------------------------------------------------------------------------;
## Header (preview): From a_wigtonebook@yahoo.com  Mon Jul 29 20:57:59 2002; Return-Path: <a_wigtonebook@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <html>;
## Header (preview): From matty@hurra.de  Tue Jul 30 09:30:50 2002; Return-Path: <matty@hurra.de>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Do you want to make money from home?  Are you tired; of working for someone else? Then welcome to the ; future.
## Header (preview): From users002@roklink.ro  Tue Jul 30 13:06:10 2002; Return-Path: <users002@roklink.ro>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear hulkjr ,; ; WANT THE BEST IN COMPUTER FILE SECURITY?
## Header (preview): From users002@roklink.ro  Wed Jul 31 02:09:17 2002; Return-Path: <users002@roklink.ro>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear hulkjr ,; ; WANT THE BEST IN COMPUTER FILE SECURITY?
## Header (preview): From pitster262743156@hotmail.com  Tue Jul 30 13:28:02 2002; Return-Path: <pitster262743156@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear closr ,; ; <html>
## Header (preview): From 0147j10@mileniumnet.com.br  Tue Jul 30 02:03:27 2002; Return-Path: <0147j10@mileniumnet.com.br>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Copy DVD Movies?; ; Yes!  Copy and burn your own DVD
## Header (preview): From Unsubscribe@sqlcare.com  Tue Jul 30 19:42:28 2002; Return-Path: <Unsubscribe@sqlcare.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML xmlns="http://www.sqlcare.com/TR/REC-html40" xmlns:v = ; "urn:schemas-microsoft-com:vml" xmlns:o =
## Header (preview): From matchmaker2fg7@lycos.com  Tue Jul 30 04:46:33 2002; Return-Path: <matchmaker2fg7@lycos.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>University Degrees thru Life Experience!</title>
## Header (preview): From 8qklzI@ara.seed.net.tw  Tue Jul 30 15:58:02 2002; Return-Path: <8qklzI@ara.seed.net.tw>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_9f5cBwKPXMZ2oYIR
## Header (preview): From stanleywoodwork@eircom.net  Tue Jul 30 17:09:23 2002; Return-Path: <stanleywoodwork@eircom.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Sir,; ; I am Stanley Woodwork, the secetary of Africa White farmers
## Header (preview): From AGNES@btinternet.com  Tue Jul 30 17:29:44 2002; Return-Path: <AGNES@btinternet.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>IGTT</title>
## Header (preview): From aa1555813m60@lycos.com  Wed Jul 31 12:41:12 2002; Return-Path: <aa1555813m60@lycos.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00D1_50E24C7B.C3584B84; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From fork-admin@xent.com  Tue Jul 30 18:51:40 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1B9FC_01C237B4.3A3BBE30
## Header (preview): From info@clrea.com  Tue Jul 30 18:41:22 2002; Return-Path: <info@clrea.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1C148_01C237B4.616C6590
## Header (preview): From ABNER@earthlink.net  Tue Jul 30 18:51:22 2002; Return-Path: <ABNER@earthlink.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>IGTT</title>
## Header (preview): From mis43@planetinternet.be  Tue Jul 30 19:11:42 2002; Return-Path: <mis43@planetinternet.be>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From stinkman1@hotmail.com  Tue Jul 30 08:19:53 2002; Return-Path: <stinkman1@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body><div align=3D"center">;   <center>;   <table border=3D"3" cellspacing=3D"3" width=3D"80%" cellpadding=3D"3" bg=
## Header (preview): From www-data@mail.virtualed.org  Tue Jul 30 22:15:36 2002; Return-Path: <www-data@mail.virtualed.org>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):  (suddenlysusan@Stoolmail.zzn.com) on Tuesday, July 30, 2002 at 17:07:56; : Why Spend upwards of $4000 on a DVD Burner when we will show you an alternative that will do the exact same thing for just a fraction of the cost? Copy your DVD's NOW. Best Price on the net. Click here: http://002@www.dvdcopyxp.com/cgi-bin/enter.cgi?marketing_id=dcx009 Click to remove http://003@www.spambites.com/cgi-bin/enter.cgi?spambytes_id=100115
## Header (preview): From cgarnett@ORGC.TU-GRAZ.AC.AT  Tue Jul 30 10:21:46 2002; Return-Path: <cgarnett@ORGC.TU-GRAZ.AC.AT>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From nt@insurancemail.net  Wed Jul 31 00:07:33 2002; Return-Path: <nt@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_14C159_01C237E6.C5B22F30
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From fork-admin@xent.com  Wed Jul 31 00:58:23 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Interested in Renting or Selling your; Timeshare or Vacation Membership?;
## Header (preview): From mandym210@iname.com  Wed Jul 31 02:19:26 2002; Return-Path: <mandym210@iname.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <BODY bgcolor="#FFFFFF" marginwidth="0" marginheight="0" topmargin="3" leftmargin="0" rightmargin="0" vlink="blue" alink="blue" text="#FF0000" link="#FF0000">; <DIV ALIGN="center">
## Header (preview): From olromanareesta@hotmail.com  Tue Jul 30 16:38:38 2002; Return-Path: <olromanareesta@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From renturrell22@netscape.net  Wed Jul 31 05:21:46 2002; Return-Path: <renturrell22@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Opportunity is knocking. Why?; ; Because mortgage rates are rising.
## Header (preview): From guesshow@philippines.to  Tue Jul 30 20:23:13 2002; Return-Path: <guesshow@philippines.to>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From lilblackraincloud@yahoo.com  Tue Jul 30 14:24:06 2002; Return-Path: <lilblackraincloud@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00A2_25A50A3E.D1003C25; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From fork-admin@xent.com  Wed Jul 31 07:25:20 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Interested in Renting or Selling your; Timeshare or Vacation Membership?;
## Header (preview): From ufadq@mailme.dk  Wed Jul 31 09:47:28 2002; Return-Path: <ufadq@mailme.dk>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Computer User 100670.3527 ,; ; <html>
## Header (preview): From httpd@sr-0.esswebservices.com  Wed Jul 31 12:30:59 2002; Return-Path: <httpd@sr-0.esswebservices.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (balletscho@netcity.ru) on Wednesday, July 31, 2002 at 07:06:01; ---------------------------------------------------------------------------
## Header (preview): From sagcvbcvx@office.com  Wed Jul 31 03:40:34 2002; Return-Path: <sagcvbcvx@office.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multipart message in MIME format.; ; --E688BA2004D84DB2B62AB45B06DBFFE2
## Header (preview): From cgarnett@arla.se  Wed Jul 31 05:32:06 2002; Return-Path: <cgarnett@arla.se>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>New Web Technology</TITLE>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Dwindows-12=; 52">
## Header (preview): From gtt45@planetinternet.be  Wed Jul 31 21:06:07 2002; Return-Path: <gtt45@planetinternet.be>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From doctda@msn.com  Wed Jul 31 15:49:25 2002; Return-Path: <doctda@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From bestrate@igo1.saverighthere.com  Thu Aug  1 01:24:56 2002; Return-Path: <bestrate@igo1.saverighthere.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): INTEREST RATES HAVE JUST BEEN CUT!!!;  ; NOW is the perfect time to think about refinancing your home mortgage! Rates are down! Take a minute and fill out our quick online form.
## Header (preview): From fork-admin@xent.com  Wed Jul 31 22:52:28 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multipart MIME message.; ; --= Multipart Boundary 0731021742
## Header (preview): From batonbrat6@hotmail.com  Wed Jul 31 10:58:51 2002; Return-Path: <batonbrat6@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From stiff_hgh@psinet.com  Wed Jul 31 23:53:29 2002; Return-Path: <stiff_hgh@psinet.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body onload="window.open('http://202.101.163.34:81/ultimatehgh_run/')" bgColor="#CCFF66" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Aug  1 00:03:49 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 9BCDA440CD
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01217.d5a1734ec521c1bd55270eca3ab4acd8 - missing value where TRUE/FALSE needed
## Header (preview): From nfg@insurancemail.net  Thu Aug  1 00:03:47 2002; Return-Path: <nfg@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_18E22D_01C238B0.6EDF1B30
## Header (preview): From Clear2-1268x10@lycos.com  Wed Jul 31 16:45:50 2002; Return-Path: <Clear2-1268x10@lycos.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Cell Booster Antenna</title>
## Header (preview): From debt_collectors@btamail.net.cn  Thu Aug  1 05:18:54 2002; Return-Path: <debt_collectors@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): PROFESSIONAL, EFFECTIVE DEBT COLLECTION SERVICES AVAILABLE; ; For the last seventeen years, National Credit Systems, Inc. has been providing
## Warning in strsplit(email_text, "\n"): unable to translate 'From ndqED@dialup.hiwaay.net  Thu Aug  1 03:47:06 2002
## Return-Path: <ndqED@dialup.hiwaay.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 2C269440A8...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01221.baf498fd213b8bc77b9dbfb13c1a6968 - missing value where TRUE/FALSE needed
## Header (preview): From bvkgkbvksdjhf@msn.com  Wed Jul 31 16:09:34 2002; Return-Path: <bvkgkbvksdjhf@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><META http-equiv=3DContent-Type content=3Dtext/html;charset=3Di=; so-8859-1><STYLE type=3Dtext/css>H1 { } TD {  FONT-SIZE: 12px; FONT-FAMILY=; : Arial, Helvetica, sans-serif } P {  FONT-SIZE: 12px; FONT-FAMILY: Arial,=
## Header (preview): From cwc02@mail.hz.zj.cn  Thu Aug  1 23:40:28 2002; Return-Path: <cwc02@mail.hz.zj.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): [Sorry for Multiple Copies of This Message. Welcome to CWC02 in China]; ; Dear wireless colleagues:
## Header (preview): From miy@aol.com  Thu Aug  1 09:23:15 2002; Return-Path: <miy@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body bgcolor="#FFFBE0">; <center>
## Header (preview): From egabriel@bfpg.ru  Thu Aug  1 01:04:38 2002; Return-Path: <egabriel@bfpg.ru>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <!-- saved from url=3D(0022)http://internet.e-mail --><HTML><HEAD><TITLE>N=; ew Web Technology</TITLE>
## Header (preview): From dfhsdfgsdf8gsd@yahoo.com  Thu Aug  1 17:04:08 2002; Return-Path: <dfhsdfgsdf8gsd@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We are offering you quality marketing lists which have been verified giving you a 90% delivery rate for your marketing campaign.; ; The lists are downloadable along with free sending software. We are currently adding 500,000 new addresses for download each week.
## Warning in strsplit(email_text, "\n"): unable to translate 'From sitescooper-talk-admin@lists.sourceforge.net  Thu Aug  1 13:21:43 2002
## Return-Path: <sitescooper-talk-admin@example.sourceforge.net>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netno...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01227.04a4f94c7a73b29cb56bf38c7d526116 - missing value where TRUE/FALSE needed
## Header (preview): From das336zaw@mail.wind.co.jp  Thu Aug  1 20:46:28 2002; Return-Path: <das336zaw@mail.wind.co.jp>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE></TITLE><META http-equiv=3D=22Content-Type=22 content=3D=22=; text/html; charset=3Dwindows-1252=22><STYLE>A:link =7BTEX-DECORATION: none=7D=; A:active =7BTEXT-DECORATION: none=7DA:visited =7BTEXT-DECORATION: none=7DA:h=
## Header (preview): From mary324695248@yahoo.com  Tue Aug  6 10:56:26 2002; Return-Path: <mary324695248@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Pack Your Bags!</title>
## Header (preview): From fp@insurancemail.net  Fri Aug  2 00:01:07 2002; Return-Path: <fp@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1D01C9_01C23978.C008DBE0
## Header (preview): From fork-admin@xent.com  Fri Aug  2 00:52:07 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------000000000000000000000; Content-Type: text/plain;;  charset="iso-8859-1"
## Header (preview): From starwars@tytcorp.com  Fri Aug  2 00:51:59 2002; Return-Path: <starwars@tytcorp.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_434_2562770446087
## Warning in strsplit(email_text, "\n"): unable to translate 'From GreenSP3387v35@yahoo.com  Fri Aug  2 16:52:06 2002
## Return-Path: <GreenSP3387v35@yahoo.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B9417441...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01233.010677fced50f4aecb67fba70701bcf5 - missing value where TRUE/FALSE needed
## Header (preview): From bestrate@igo7.saverighthere.com  Fri Aug  2 05:57:53 2002; Return-Path: <bestrate@igo7.saverighthere.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Lowest rates available for term life insurance! Take a moment and fill out our online form to see the low rate you qualify for. Save up to 70% from regular rates! Smokers accepted! http://www3.all-savings.com/termlife/ ;       ; Representing quality nationwide carriers. Act now!
## Warning in strsplit(email_text, "\n"): unable to translate 'From arah.lee@www.com  Fri Aug  2 05:06:40 2002
## Return-Path: <arah.lee@www.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id CEF86440F0
##  for <jm@loca...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01235.2e8191ab7ddffa2290e04f9ce0422041 - missing value where TRUE/FALSE needed
## Header (preview): From fork-admin@xent.com  Thu Aug  1 18:53:53 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From gina3@freemail.nl  Fri Aug  2 07:33:21 2002; Return-Path: <gina3@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From bjveryhotchick69@rogers.com  Fri Aug  2 08:14:09 2002; Return-Path: <bjveryhotchick69@rogers.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): see me naked <a href="http://www.braille.com.br/shows">Click Here</a>
## Header (preview): From Jenny18xxx@netizen.com  Fri Aug  2 08:24:21 2002; Return-Path: <Jenny18xxx@netizen.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>HARDCORE SEX</title>
## Header (preview): From abdulfadi1@netscape.net  Fri Aug  2 12:10:00 2002; Return-Path: <abdulfadi1@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --===_SecAtt_000_1fdcynbjtbpkdh; Content-Type: text/plain; charset="windows-1252"; Content-Transfer-Encoding: quoted-printable
## Header (preview): From miy@aol.com  Fri Aug  2 13:03:09 2002; Return-Path: <miy@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body bgcolor="#FFFBE0">; <center>
## Header (preview): From DataTapes@sdpacific.com  Fri Aug  2 16:30:52 2002; Return-Path: <DataTapes@sdpacific.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>Untitled Document</title>
## Header (preview): From httpd@www.meatdemons.com  Fri Aug  2 07:13:02 2002; Return-Path: <httpd@www.meatdemons.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Come check out Meatdemons!!; These young starlets think they have a future sucking cock.; With Amazing Facials, Cum Shots, and Deep Throating action.
## Header (preview): From niddeel@hotmail.com  Tue Aug  6 10:54:56 2002; Return-Path: <niddeel@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><HEAD><TITLE>creditfix</TITLE> ; </HEAD><BODY BGCOLOR=3D#FFFFFF TEXT=3D#000000 LINK=3D#FF0000 VLINK=3D#FF00=; 00 ALINK=3D#FF0000><BR><CENTER>
## Header (preview): From fork-admin@xent.com  Fri Aug  2 11:28:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is an HTML email message.  If you see this, your mail client does not support HTML messages.; ; ------=_NextPart_AAXPMNBMET
## Warning in strsplit(email_text, "\n"): unable to translate 'From lvi300702@free.fr  Tue Aug  6 12:50:59 2002
## Return-Path: <lvi300702@free.fr>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 5D3FF44229
##  for <jm@lo...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01246.d0ee9c7ebf9d953b21de9414cc96c2f9 - missing value where TRUE/FALSE needed
## Header (preview): From alksjdwieytgfbn@msn.com  Fri Aug  2 16:30:35 2002; Return-Path: <alksjdwieytgfbn@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><BODY><P align=3Dcenter><FONT size=3D5><STRONG><FONT color=3D#3300cc =; size=3D6><A href=3D###></A>Online Credit Breakthrough</FONT></STRONG>&nbsp=; ;</FONT></P><P align=3Dcenter><FONT size=3D5>&nbsp;</FONT><STRONG><FONT co=
## Header (preview): From fork-admin@xent.com  Tue Aug  6 11:58:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Interested in Renting or Selling your; Timeshare or Vacation Membership?;
## Header (preview): From frank356067@yahoo.com  Tue Aug  6 11:01:45 2002; Return-Path: <frank356067@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear bevstar10 ,; ; <html>
## Header (preview): From mando@insurancemail.net  Tue Aug  6 12:51:07 2002; Return-Path: <mando@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_211FCD_01C23A42.6BB016B0
## Header (preview): From eighbor2k@hotmail.com  Tue Aug  6 10:56:59 2002; Return-Path: <eighbor2k@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <BODY BGCOLOR="#FFFFFF" >; <P ALIGN=CENTER><br><br><br>
## Header (preview): From mtg4you@yahoo.com  Tue Aug  6 10:56:27 2002; Return-Path: <mtg4you@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>;            <DIV>&nbsp;</DIV><FONT size=2 PTSIZE="10">;       <TABLE
## Header (preview): From le8vuij0j06814@hotmail.com  Fri Aug  2 16:30:39 2002; Return-Path: <le8vuij0j06814@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From opportunities@optinllc.com  Tue Aug  6 10:57:37 2002; Return-Path: <opportunities@optinllc.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML>; <HEAD><TITLE>Untitled</TITLE>
## Header (preview): From hgh8822@polbox.com  Tue Aug  6 10:57:04 2002; Return-Path: <hgh8822@polbox.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><body onload="window.open('http://202.101.163.34:81/ultimatehgh_run/')" bgColor="#CCCCCC" topmargin=1 onMouseOver="window.status=''; return true" oncontextmenu="return false" ondragstart="return false" onselectstart="return false">; <div align="center">Hello, jm@netnoteinc.com<BR><BR></div><div align="center"></div><p align="center"><b><font face="Arial" size="4">Human Growth Hormone Therapy</font></b></p>; <p align="center"><b><font face="Arial" size="4">Lose weight while building lean muscle mass<br>and reversing the ravages of aging all at once.</font><font face="Arial" size="3"><br>
## Header (preview): From sykbd@kimo.com  Tue Aug  6 10:58:00 2002; Return-Path: <sykbd@kimo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): INTERNATIONAL DRIVER'S LICENSE; ; Need a new driver's license?
## Header (preview): From pete@superdada.it  Tue Aug  6 10:58:14 2002; Return-Path: <pete@superdada.it>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Do you want to make money from home?  Are you tired; of working for someone else? Then welcome to the ; future.
## Header (preview): From tlgu.the.truth@cutey.com  Tue Aug  6 10:58:36 2002; Return-Path: <tlgu.the.truth@cutey.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html><head><meta http-equiv="Content-Language" content="en-us"><meta name="GENERATOR" content="Microsoft FrontPage 5.0"><meta name="ProgId" content="FrontPage.Editor.Document"><meta http-equiv="Content-Type" content="text/html; charset=windows-1252"><title>I know you want to look at pussy</title></head><body><p><b>I know you want to look at pussy, but first you need to learn</b><br><b>The Truth about the adult industry:</b><br><br><b>Get Into Paysite Free!</b><br>If you take 2 minutes to read what I have to say you will have full access<br>to some of the largest membership sites for free.<br><br><b>TRUTH</b><br>A recent internet survey showed that almost 28 % of all the revenue generated on the internet today is from adult products &amp; websites. Making it the #1 product/service in demand on the internet.</p><p><b>TRUTH</b><br>Yahoo conducted a adult internet survey that showed more than More than half of all adult surfers have paid up to $50 for a pay site membership. We wonder why? It is really easy to ge; t into these sites for free. Why would you pay for a membership to an adult site with out knowing what they really have to offer? It's kind of like going on a blind date, you don't really know what to expect! I have top a adult sites you can become a member to for FREE.</p><p><b>TRUTH</b><br>These directions are common sense, but some people still haven't figured it out! I have found a pay site offering free passes. So if you get a free pass imagine all the movies you can download onto your hard drive. All %100 free. These sites all have more movies, chat rooms, and hot pictures than any other porn sites I have come across to date. They are all A+ porno sites.</p><p><b>All %100 free.<br></b><br><b>DIRECTIONS</b><br>Follow these 6 simple steps and you'll get a free pass into an adult paysite. Note that these passes are not permanent, but they're free and it takes less than two minutes to get in.</p><p><b>STEP 1:&nbsp; </b>Scroll down the page &amp; click on the Web site banner below that interests you most.&nb; sp;The descriptions and the links are below. Pick the one you want to get your 1st free pass to.<br><b><br>STEP 2:&nbsp; </b>Once you arrive at the site you have selected, fill out the form, then click the submit button that says &quot;GIVE MY FREE PASS&quot;. Remember to wait several seconds for the entire page to load. If you are on a dial up modem it will take a minute to process the page.<br><b><br>STEP 3:&nbsp; </b>This will take you to the second join page. Fill in the required information. This is not some second rate site run by couple scumbags, these are multi-million dollar operations with policies and rules. They won't charge you for the free pass. Don't believe me? Read their Terms and Conditions.<br><b><br>STEP 4:&nbsp; </b>After you have filled out the rest of the form........click the SUBMIT button! Only hit it one time! Wait one or two minutes, it will send the username and password to your e-mail account. That's it, within minutes you will have a free pass<br><b><br>STEP 5:&nbsp; </b>That's i
## Warning in strsplit(email_text, "\n"): unable to translate 'From jhzyi@cornnet.nl  Tue Aug  6 10:55:54 2002
## Return-Path: <jhzyi@cornnet.nl>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 0F7ED44112
##  for <jm@loca...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01259.b4dff1ed93bc931b271888cd42e41b85 - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From jhzyi@cornnet.nl  Tue Aug  6 11:04:51 2002
## Return-Path: <jhzyi@cornnet.nl>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 48E6144114
##  for <jm@loca...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01260.fae84d2193ed2d65a14e2c8b612fb7fe - missing value where TRUE/FALSE needed
## Warning in strsplit(email_text, "\n"): unable to translate 'From mrhealth@btamail.net.cn  Tue Aug  6 12:52:17 2002
## Return-Path: <mrhealth@btamail.net.cn>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 7D196441F0...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01261.0d7a6fa74b73f80f62fe11267eeaa956 - missing value where TRUE/FALSE needed
## Header (preview): From VWcmE8@sky.seed.net.tw  Tue Aug  6 12:52:21 2002; Return-Path: <VWcmE8@sky.seed.net.tw>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_GimEwuvgROJ8eFyeYA6Wmjd9wbYV6
## Header (preview): From dave1019@earthlink.net  Tue Aug  6 10:59:09 2002; Return-Path: <dave1019@earthlink.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From fork-admin@xent.com  Tue Aug  6 11:58:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------000000000000000000000; Content-Type: text/plain;;  charset="iso-8859-1"
## Header (preview): From wholesaleman6002@eudoramail.com  Tue Aug  6 10:58:55 2002; Return-Path: <wholesaleman6002@eudoramail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From Carol4038g40@msn.com  Tue Aug  6 11:00:11 2002; Return-Path: <Carol4038g40@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Greetings!; ; You can earn up to 10K per week doing simple
## Header (preview): From bchrist746@hotmail.com  Tue Aug  6 10:59:18 2002; Return-Path: <bchrist746@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From triphammer456@yahoo.com  Tue Aug  6 11:01:56 2002
## Return-Path: <triphammer456@yahoo.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 3C2714410D...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01268.626ef5e5fa30314816e0f049ea03bd9f - missing value where TRUE/FALSE needed
## Header (preview): From OneIncomeLiving-bounce@groups.msn.com  Tue Aug  6 12:53:24 2002; Return-Path: <OneIncomeLiving-bounce@groups.msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_D20F_01C23B49.FFE05AE0
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:52:59 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):  fork ,; ; From;Mr.David  Kargbou and Family,
## Header (preview): From programmers@bellsouth.net  Tue Aug  6 12:53:00 2002; Return-Path: <programmers@bellsouth.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; --NS_MAIL_Boundary_07132002; Content-Type: text/html
## Header (preview): From Lisandra2283348@jrnl.ut.ee  Tue Aug  6 12:52:28 2002; Return-Path: <Lisandra2283348@jrnl.ut.ee>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): On January 1st 2002, the European countries began; using the new Euro.  Never before have so; many countries with such powerful economies united
## Header (preview): From trimbird@hotmail.com  Tue Aug  6 12:52:39 2002; Return-Path: <trimbird@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p align=3D"center"><br>
## Header (preview): From safety33o@now5.takemetothesavings.com  Tue Aug  6 11:02:46 2002; Return-Path: <safety33o@now5.takemetothesavings.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Protect your financial well-being.;  Purchase an Extended Auto Warranty for your Car today. CLICK HERE for a FREE no obligation quote.;  http://www.takemetothesavings.com/warranty/
## Header (preview): From social-admin@linux.ie  Tue Aug  6 12:52:55 2002; Return-Path: <social-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): When America's top companies compete for your business, you win.; ; http://getit.routeit21.com/sure_quote/
## Header (preview): From abar1@webmail.co.za  Tue Aug  6 11:01:47 2002; Return-Path: <abar1@webmail.co.za>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD></HEAD><BODY><center><FONT SIZE=3D4 COLOR=3D#FF3300><B>Protect =; your financial well-being.<BR>Purchase an Extended Auto Warranty for your =; Vehicle TODAY.</B></FONT><BR><BR><BR><FONT FACE=3DArial SIZE=3D4 COLOR=3D#=
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:53:10 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_1201_65472431353854800184200
## Header (preview): From miy@aol.com  Tue Aug  6 11:02:35 2002; Return-Path: <miy@aol.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body bgcolor="#FFFBE0">; <center>
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:52:50 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We ship worldwide within 24 hours!; ; No waiting rooms, drug stores, or embarrassing conversations.
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:53:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi !; ; My name is Wayne Harrison and I would like to share a
## Header (preview): From usafin@insurancemail.net  Tue Aug  6 12:53:46 2002; Return-Path: <usafin@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_253BBB_01C23BCA.9FD9F850
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:53:51 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Just sent you a note with the wrong link. Tthe correct one is ; ; http://letscreatebiz.com/whjoinfree
## Header (preview): From reply@seekercenter.net  Tue Aug  6 12:53:58 2002; Return-Path: <reply@seekercenter.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From betternow54i@now6.takemetothesavings.com  Tue Aug  6 11:03:53 2002; Return-Path: <betternow54i@now6.takemetothesavings.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Protect your financial well-being.;  Purchase an Extended Auto Warranty for your Car today. CLICK HERE for a FREE no obligation quote.;  http://www.takemetothesavings.com/warranty/
## Header (preview): From programmers@yahoo.com  Tue Aug  6 12:54:55 2002; Return-Path: <programmers@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; --NS_MAIL_Boundary_07132002; Content-Type: text/html
## Header (preview): From ght6@alaska.net  Tue Aug  6 12:55:04 2002; Return-Path: <ght6@alaska.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): U N I V E R S I T Y    D I P L O M A S; ; Bachelors, Masters, MBA, and Doctorate (PhD)
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:53:39 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From RD4Bij@hotmail.com  Tue Aug  6 12:55:17 2002; Return-Path: <RD4Bij@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_U7taSLCsDhMjBsrSf8w
## Header (preview): From fork-admin@xent.com  Wed Aug  7 08:27:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <br>Dear Sir. ; <br>I got your contact in cause of a seriouse search for a ; <br>reliable foreign partner, which really made me to
## Header (preview): From emailharvest@email.com  Tue Aug  6 12:55:31 2002; Return-Path: <emailharvest@email.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear fma =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:54:45 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Hi Sweetie,; ; Come See the most beautiful, sweet...
## Header (preview): From financialfreedom@mydebtsite.com  Tue Aug  6 11:04:26 2002; Return-Path: <financialfreedom@mydebtsite.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_84815C5ABAF209EF376268C8; Content-type: text/plain; charset=US-ASCII; Content-Transfer-Encoding: quoted-printable
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:01:05 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): --0-1561587743-1028562700=:5319; Content-Type: text/plain; charset=us-ascii;
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:01:13 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): FORD SALUTES THE MILITARY.; ; THIS OFFER IS EXTENDED EXCLUSIVELY TO ALL ACTIVE DUTY, RESERVE, RETIRED, MILITARY VETERANS AND THEIR DIRECT DEPENDANTS ONLY.
## Header (preview): From customerservice@chaseff.com  Tue Aug  6 11:05:28 2002; Return-Path: <customerservice@chaseff.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From gina3@freemail.nl  Tue Aug  6 11:04:43 2002; Return-Path: <gina3@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From owner-melbwireless@wireless.org.au  Tue Aug  6 12:55:58 2002; Return-Path: <owner-melbwireless@wireless.org.au>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear melbwireless =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): From iswallow@brimail.de  Tue Aug  6 11:05:13 2002; Return-Path: <iswallow@brimail.de>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Want the most bang for your buck? Take your web site to the next level with a fast, powerful and yes cheap web hosting account.; ; We targeted mainly to self-employed individuals and small companies on a budget which aren't going to pay inflated  prices for webhosting.
## Header (preview): From gyiskcnvbfc@msn.com  Tue Aug  6 11:04:46 2002; Return-Path: <gyiskcnvbfc@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><BODY><P align=3Dcenter><FONT size=3D5><STRONG><FONT color=3D#3300cc =; size=3D6><A href=3D###></A>Online Credit Breakthrough</FONT></STRONG>&nbsp=; ;</FONT></P><P align=3Dcenter><FONT size=3D5>&nbsp;</FONT><STRONG><FONT co=
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From rstr@insurancemail.net  Tue Aug  6 12:56:51 2002; Return-Path: <rstr@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_295635_01C23C9D.8D2947A0
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Tue Aug  6 12:55:08 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id B68774424F
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01301.91269fd2b14a1fa0f183ca60953b99af - missing value where TRUE/FALSE needed
## Header (preview): From joeoli6653@earthlink.net  Tue Aug  6 11:05:25 2002; Return-Path: <joeoli6653@earthlink.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; <html>; <body>
## Header (preview): From freestore370@hotmail.com  Tue Aug  6 11:05:30 2002; Return-Path: <freestore370@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Still believe you can earn $100,000 FAST IN MLM? GET REAL!; ; GET EMM, A brand new SYSTEM that replaces MLM with something that WORKS!
## Header (preview): From fork-admin@xent.com  Tue Aug  6 12:57:02 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format; --717fbb98-2427-46fa-b1fc-01aeb8d47c3f; Content-Type: text/html; charset=gb2312
## Header (preview): From betternow54i@now9.takemetothesavings.com  Tue Aug  6 11:05:47 2002; Return-Path: <betternow54i@now9.takemetothesavings.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): INTEREST RATES HAVE JUST BEEN CUT!!!;   ;  NOW is the perfect time to think about refinancing your home mortgage! Rates are down! Take a minute and fill out our quick online form.
## Header (preview): From kfcarman@netvigator.com  Tue Aug  6 11:46:35 2002; Return-Path: <kfcarman@netvigator.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_hzG8dMSOY9olT2Ty
## Header (preview): From evtwqmigru@ecr.mu.oz.au  Tue Aug  6 11:05:04 2002; Return-Path: <evtwqmigru@ecr.mu.oz.au>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <HTML><HEAD><META HTTP-EQUIV=3D"Content-Type" CONTENT=3D"text/html;charset=; =3Diso-8859-1">
## Header (preview): From wysitinnovations@yahoo.com  Tue Aug  6 20:57:44 2002; Return-Path: <wysitinnovations@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):  ; You may have seen this business before and; ignored it. I know I did - many times! However,
## Header (preview): From sitescooper-talk-admin@lists.sourceforge.net  Tue Aug  6 14:01:00 2002; Return-Path: <sitescooper-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): PEhUTUw+PEhFQUQ+PFRJVExFPkV2IHlhcGltaSBhbWF09nIgdmlkZW9sYXIgdHFka3FqZG5s; IDwvVElUTEU+PC9IRUFEPjxCT0RZPg0KPERJViBBTElHTj0iY2VudGVyIj48VEFCTEUgYm9y; ZGVyPTAgY2VsbFBhZGRpbmc9MCBjZWxsU3BhY2luZz0wIHdpZHRoPTYwMD4NCiAgPFRCT0RZ
## Header (preview): From gender4828@flashmail.com  Tue Aug  6 13:39:41 2002; Return-Path: <gender4828@flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_2554534503687811774
## Header (preview): From 687ifsuy@bol.com.br  Tue Aug  6 12:56:57 2002; Return-Path: <687ifsuy@bol.com.br>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>; <META http-equiv=3DContent-Type content=3D"text/html; charset=3Diso-8859-1=
## Header (preview): From hgjfutiokf@msn.com  Tue Aug  6 11:05:38 2002; Return-Path: <hgjfutiokf@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><BODY><P align=3Dcenter><FONT size=3D5>&nbsp;</FONT><STRONG><FONT col=; or=3D#ff0000 size=3D7>Repair Your Credit Online!</FONT></STRONG></P><P ali=; gn=3Dcenter><A href=3D###></A><FONT color=3D#000000 size=3D4><STRONG>It's =
## Header (preview): From reply@seekercenter.net  Fri Aug  9 13:00:04 2002; Return-Path: yyyy; Delivery-Date: Tue Aug  6 16:48:54 2002
## Body (preview): BAD MSG:; ; PAM: -------------------- Start SpamAssassin results ----------------------
## Warning in strsplit(email_text, "\n"): unable to translate 'From apec-tech@totalise.co.uk  Tue Aug  6 18:15:42 2002
## Return-Path: <apec-tech@totalise.co.uk>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id C202E440...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01314.12c8b5b91bc690f0f0d6fad595150ac6 - missing value where TRUE/FALSE needed
## Header (preview): From gina3@freemail.nl  Tue Aug  6 18:31:59 2002; Return-Path: <gina3@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From 2l8k3LgfQ@ara.seed.net.tw  Tue Aug  6 20:47:08 2002; Return-Path: <2l8k3LgfQ@ara.seed.net.tw>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_xxt9w9r4F3OfnfRj5A6nlx
## Header (preview): From YIPXyvihOBZh2@ibm.com  Tue Aug  6 21:24:48 2002; Return-Path: <YIPXyvihOBZh2@ibm.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_xxt9w9r4F3OfnfRj5A6nlx
## Header (preview): From jhzyi@eng.tau.ac.il  Tue Aug  6 11:05:54 2002; Return-Path: <jhzyi@eng.tau.ac.il>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=3D(0022)http://internet.e-mail -->; <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD>
## Header (preview): From marymary1965@yahoo.com  Tue Aug  6 20:03:40 2002; Return-Path: <marymary1965@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =============================================================================================; THIS IS A FREE OFFER!     THIS IS A FREE OFFER!   THIS IS A FREE OFFER!   THIS IS A FREE OFFER! ; =============================================================================================
## Header (preview): From bboop313@hotmail.com  Tue Aug  6 13:41:06 2002; Return-Path: <bboop313@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv=3D"Content-Language" content=3D"en-us">
## Header (preview): From ilug-admin@linux.ie  Thu Aug  8 14:37:31 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): YOU HAVE NEVER SEEN A DILDO SITE LIKE THIS ONE!!; Extreme never seen before pictures and content; http://www.supremewebhosting-online.com/users/k/katrina/
## Header (preview): From aig@insurancemail.net  Wed Aug  7 01:09:48 2002; Return-Path: <aig@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_2D6F23_01C23D65.BB2D3AD0
## Header (preview): From lakskjdhjfh@msn.com  Tue Aug  6 14:04:13 2002; Return-Path: <lakskjdhjfh@msn.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From breakfree@luxmail.com  Wed Aug  7 02:03:10 2002; Return-Path: <breakfree@luxmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Still believe you can earn $100,000 FAST IN MLM? GET REAL!; ; GET EMM, A brand new SYSTEM that replaces MLM with something that WORKS!
## Header (preview): From ycessexchick@tesco.net  Wed Aug  7 04:22:23 2002; Return-Path: <ycessexchick@tesco.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>;  <title>Kates Knickers</title>
## Header (preview): From fork-admin@xent.com  Wed Aug  7 04:33:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_Part_1210763_-1358544416.1028690797657; Content-Type: text/plain; charset=iso-8859-1; Content-Transfer-Encoding: 7bit
## Header (preview): From vheystarta@hotmail.com  Tue Aug  6 19:20:51 2002; Return-Path: <vheystarta@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <HEAD> ; <TITLE>creditfix</TITLE>
## Header (preview): From fork-admin@xent.com  Thu Aug  8 14:37:34 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Are you satisfied with your ISP? Do you have 5 email addresses for you and your family? Do you have 5 MB of personal webspace? How truly unlimited is your access time?; ; Our internet service provides you with all of that at a low monthly fee of just $14.95. You get 5 email addresses, 5MB of personal webspace and 350 hours of access time per month (virtually unlimited). That is more than most people will use, do the math.
## Header (preview): From fork-admin@xent.com  Tue Aug  6 19:42:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From doitnow@freemail.nl  Wed Aug  7 08:32:27 2002; Return-Path: <doitnow@freemail.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From frank325760@yahoo.com  Thu Aug  8 11:57:20 2002; Return-Path: <frank325760@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear andrea_justice ,; ; <html>
## Header (preview): From fg480525@caramail.com  Wed Aug  7 09:37:02 2002; Return-Path: <fg480525@caramail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.0 Transitional//EN">; <HTML><HEAD><TITLE>Beautiful,Custom Websites for $359 Complete!</TITLE>; <STYLE></STYLE>
## Header (preview): From see-msg_952621@flashmail.com  Wed Aug  7 14:45:48 2002; Return-Path: <see-msg_952621@flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): =============================================; Brand-New VERSION 7.0 Just Released:; Astounding New Software Lets You Find
## Header (preview): From milfhunterisontheprowlandgoingtogether@froma2z.com  Wed Aug  7 12:34:46 2002; Return-Path: <milfhunterisontheprowlandgoingtogether@froma2z.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>MILFhunter</TITLE>; <META http-equiv=Content-Type; content="text/html; charset=windows-1252"><HTTP-EQUIV="PRAGMA"
## Header (preview): From bruc9629368@yahoo.com  Wed Aug  7 17:27:42 2002; Return-Path: <bruc9629368@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <!-- saved from url=(0022)http://internet.e-mail -->; ; <HTML><HEAD>
## Header (preview): From mavin12hop@vega.co.il  Wed Aug  7 17:39:00 2002; Return-Path: <mavin12hop@vega.co.il>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE></TITLE><META http-equiv=3D=22Content-Type=22 content=3D=22=; text/html; charset=3Dwindows-1252=22><STYLE>A:link =7BTEX-DECORATION: none=7D=; A:active =7BTEXT-DECORATION: none=7DA:visited =7BTEXT-DECORATION: none=7DA:h=
## Header (preview): From fork-admin@xent.com  Thu Aug  8 14:35:48 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Tomorrow will be huge.  Password: Soleil has become the premiere Thursday night in New York - with a chill after-work and a blazing late-night.  This Thursday, producers from Columbia Tristar are casting people for their new reality TV show.  ; ; We invite all members of the media and entertainment industries for an exclusive event celebrating New York high-life.
## Warning in strsplit(email_text, "\n"): unable to translate 'From FreeSoft-1334p61@yahoo.com  Wed Aug  7 12:46:12 2002
## Return-Path: <FreeSoft-1334p61@yahoo.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 3E3D...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01338.a67c3827402b4610bd2a6814cd8cd907 - missing value where TRUE/FALSE needed
## Header (preview): From mtg4you@yahoo.com  Thu Aug  8 11:14:30 2002; Return-Path: <mtg4you@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>;            <DIV>&nbsp;</DIV><FONT size=2 PTSIZE="10">;       <TABLE
## Header (preview): From tito98y@yahoo.com  Thu Aug  8 11:14:31 2002; Return-Path: <tito98y@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Obtain a prosperous future, money earning power,; and the admiration of all.;
## Header (preview): From emailharvest@email.com  Thu Aug  8 14:36:01 2002; Return-Path: <emailharvest@email.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear jm-cv =2C; ; =3CBODY bgColor=3D#ffccff=3E
## Header (preview): From remove1ink9876@btamail.net.cn  Thu Aug  8 11:14:59 2002; Return-Path: <remove1ink9876@btamail.net.cn>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Everything you need to know about every registered US Business is on one single CD-ROM. The latest version of the USA Business Search CD contains a wealth of information on 18 million business listings in the US. So whether you're after new business, building or enhancing your own database or simply want cheap quality leads, USA Business Search CD will pinpoint exactly what you are looking for.; ; USA Business Search is an easy to use CD-ROM compiled using the most accurate and comprehensive USA Yellow Pages (11.6 million records) and USA Domain Names (6.2 million records) databases. At just $429.00, USA Business Search CD is a cost effective way of generating UNLIMITED leads and spotting opportunities. Unrestricted export capability enables you to import data into your database application. Where else can you get this for $429.00? For the same data InfoUSA will charge you over $600,000.00
## Header (preview): From bignaturaltittiesarethebest@froma2z.com  Thu Aug  8 11:14:18 2002; Return-Path: <bignaturaltittiesarethebest@froma2z.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>Big and big</TITLE>; <META http-equiv=Content-Type; content="text/html; charset=windows-1252"><HTTP-EQUIV="PRAGMA"
## Header (preview): From alancrooks@mark9.hostserve21.com  Thu Aug  8 11:15:18 2002; Return-Path: <alancrooks@mark9.hostserve21.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): When America's top companies compete for your business, you win.; ; http://quotes.routeit21.com/sure_quote/
## Header (preview): From indylife@insurancemail.net  Thu Aug  8 14:36:15 2002; Return-Path: <indylife@insurancemail.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0007_01C23E2C.44242DA0
## Header (preview): From fhogan@bigfoot.com  Wed Aug  7 09:15:30 2002; Return-Path: <fhogan@bigfoot.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; </head>
## Header (preview): From wondersaliva@webname.com  Wed Aug  7 13:55:27 2002; Return-Path: <wondersaliva@webname.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <HEAD>; </HEAD>
## Header (preview): From fork-admin@xent.com  Wed Aug  7 14:17:00 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HR>; <html>; <div bgcolor=3D"#FFFFCC">
## Header (preview): From rob4433@iwon.com  Wed Aug  7 17:00:15 2002; Return-Path: <rob4433@iwon.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear Homeowner, ; ; Interest Rates are at their lowest point in 40 years! We help you find the
## Header (preview): From frank6728230@yahoo.com  Fri Aug  9 08:13:50 2002; Return-Path: <frank6728230@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Dear lanigel ,; ; <html>
## Header (preview): From yoshioha5857x55@lycos.com  Thu Aug  8 11:15:38 2002; Return-Path: <yoshioha5857x55@lycos.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ------=_NextPart_000_00B0_35C58D0E.D7267B06; Content-Type: text/html; charset="iso-8859-1"; Content-Transfer-Encoding: base64
## Header (preview): From firstever001@now3.takemetothesavings.com  Thu Aug  8 11:16:13 2002; Return-Path: <firstever001@now3.takemetothesavings.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Lowest rates available for term life insurance! Take a moment and fill out our online form to see the low rate you qualify for. Save up to 70% from regular rates! Smokers accepted! http://www.takemetothesavings.com/termlife/ ;        ;  Representing quality nationwide carriers. Act now!
## Warning in strsplit(email_text, "\n"): unable to translate 'From fork-admin@xent.com  Thu Aug  8 16:00:35 2002
## Return-Path: <fork-admin@xent.com>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id 5328B44117
##  for <j...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01353.369f79f8f31f3b18bdb5d1006207b52e - missing value where TRUE/FALSE needed
## Header (preview): From blain8488@runbox.com  Wed Aug  7 18:38:06 2002; Return-Path: <blain8488@runbox.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From salesandleads2628@Flashmail.com  Thu Aug  8 11:14:16 2002; Return-Path: <salesandleads2628@Flashmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): We offer some of the best bulk e-mail prices on the Internet.  ; Bulk e-mail can get you the best exposure on the net. What makes ; this kind of advertising so effective is the fact that you go to the
## Header (preview): From fork-admin@xent.com  Thu Aug  8 14:37:17 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): ----------------------------------------------------------; >>  GiftCD Offer Newsletter Confirmation August 8th, 2002; ----------------------------------------------------------
## Header (preview): From alexa122_bwer@msg.com  Thu Aug  8 11:16:25 2002; Return-Path: <alexa122_bwer@msg.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p align="center"><b>
## Header (preview): From zarco9@hotmail.com  Thu Aug  8 11:14:47 2002; Return-Path: <zarco9@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <body>; <p align=3D"center"><br>
## Header (preview): From fork-admin@xent.com  Thu Aug  8 14:13:15 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): This is a multi-part message in MIME format; --f09e4063-d1b9-43d5-bd3b-7955a9315611; Content-Type: text/plain; charset=gb2312
## Header (preview): From eml7@hotmail.com  Thu Aug  8 19:09:00 2002; Return-Path: <eml7@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): From ilug-admin@linux.ie  Thu Aug  8 15:54:40 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Below is the result of your feedback form.  It was submitted by;  (reenspring@happyman.com) on Thursday, August 8, 2002 at 08:36:27; ---------------------------------------------------------------------------
## Header (preview): From wvJimmyfreel1180xoxo@c1net.com  Thu Aug  8 15:54:31 2002; Return-Path: <wvJimmyfreel1180xoxo@c1net.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): My FREE Media Sofware link; ; enjoy, Jim--->
## Header (preview): From fork-admin@xent.com  Thu Aug  8 15:56:41 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): -----=c_8xk3gaozmp2il98g4_xq03eowmlk; Content-Type: text/plain; charset="iso-8859-1"; Content-Transfer-Encoding: 8bit
## Header (preview): From fork-admin@xent.com  Thu Aug  8 18:04:04 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; ; <head>
## Header (preview): From jtr4@zonnet.nl  Thu Aug  8 18:58:31 2002; Return-Path: <jtr4@zonnet.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From bignaturaltittiesthatarefun@froma2z.com  Thu Aug  8 16:25:28 2002; Return-Path: <bignaturaltittiesthatarefun@froma2z.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML><HEAD><TITLE>Big and big</TITLE>; <META http-equiv=Content-Type; content="text/html; charset=windows-1252"><HTTP-EQUIV="PRAGMA"
## Header (preview): From OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM  Thu Aug  8 20:22:34 2002; Return-Path: <OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title>mailv06c.gif</title>
## Header (preview): From fork-admin@xent.com  Wed Aug  7 16:11:18 2002; Return-Path: <fork-admin@xent.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <HTML>; <BODY bgColor=3Dwhite>; <CENTER>
## Header (preview): From scott@hetnet.nl  Fri Aug  9 07:11:07 2002; Return-Path: <scott@hetnet.nl>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): WE NEED HELP.  We are a 14 year old fortune 500 company, and we have ; grown 1000%!  We cannot keep up.  We are looking for individuals who ; want to work at home, and make a good living.
## Header (preview): From alvalinen33@netscape.net  Fri Aug  9 07:26:48 2002; Return-Path: <alvalinen33@netscape.net>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): Opportunity is knocking. Why?; ; Because mortgage rates are rising.
## Header (preview): From vcyonjqktt@compuserve.com  Fri Aug  9 07:52:55 2002; Return-Path: <vcyonjqktt@compuserve.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview):
## Header (preview): From qy1cykr1g86312@yahoo.com  Fri Aug  9 01:31:01 2002; Return-Path: <qy1cykr1g86312@yahoo.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <title></title>
## Header (preview): From bc2larsen@hotmail.com  Thu Aug  8 18:32:47 2002; Return-Path: <bc2larsen@hotmail.com>; Delivered-To: yyyy@localhost.netnoteinc.com
## Body (preview): <html>; <head>; <meta http-equiv=3D"Content-Language" content=3D"en-us">
## Header (preview): From webmake-talk-admin@lists.sourceforge.net  Thu Nov 28 16:09:44 2002; Return-Path: <webmake-talk-admin@example.sourceforge.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Dear our Guests,; ; EXPLORE TURKEY WITH ASTARTETOURS!!
## Header (preview): From Sidney22@webmail.co.za  Wed Dec  4 11:58:35 2002; Return-Path: <Sidney22@webmail.co.za>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>; ; <head>
## Warning in strsplit(email_text, "\n"): unable to translate 'From ilug-admin@linux.ie  Thu Nov 28 11:45:43 2002
## Return-Path: <ilug-admin@linux.ie>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 7DE6D16F17
##  for <jm@localho...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01376.73e738e4cd8121ce3dfb42d190b193c9 - missing value where TRUE/FALSE needed
## Header (preview): From cristina@collectorsinternet.com  Thu Nov 28 11:41:21 2002; Return-Path: <cristina@collectorsinternet.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_0070_01C29634.08C7C1D0
## Header (preview): From cristopherwotton@netscape.net  Thu Nov 28 16:05:52 2002; Return-Path: <cristopherwotton@netscape.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Protect Yourself.; ; Purchase An Extended Warranty For Your Car Before
## Warning in strsplit(email_text, "\n"): unable to translate 'From postmaster@topsitez.us  Fri Nov 29 11:17:25 2002
## Return-Path: <postmaster@topsitez.us>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id 1BF5C16F16
##  for <jm@l...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01379.0d39498608cd170bbbc8cd33ffd18e35 - missing value where TRUE/FALSE needed
## Header (preview): From valentart@runbox.com  Thu Nov 28 11:41:03 2002; Return-Path: <valentart@runbox.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Friend, We have recently been introduced to an amazing shopping experience that has all the products we look for at phenomenal savings, actually below Wholesale!!! In the next few days, we'll be introducing the e-world to this unique savings oriented shopping website. We need to be sure that you are open to reviewing this information. If you are not open, here's what to do... Nothing! You will be automatically unsubscribed if you do not click on the link below. <http://www.netmarkpro.com/bbpr/lc1> We are cleaning these databases now...in preparation for a major campaign for our new shopping website. Our marketing campaign should only go out to those that are sincerely interested...If you do not wish to be contacted, please accept our thanks and use the unsubscribe link below, now. Our company does not promote or approve of unsolicited email broadcasting (spam)... Therefore; we have designed this system to clean our databases of individuals that wish not to receive announcements of this type, offering savings and the opportunity to buy products at a substantially reduced price. Please remove your email address if you do not wish to receive further communications. It is our hope that you will keep our lines of communication open. The first introduction of this shopper's paradise will be within 48 hours of this message. We hope that you will take the opportunity to review it. No action is required if you do not wish to remain on our communication list. You will be automatically unsubscribed. Again, we appreciate your assistance and hope that you appreciate our efforts to clean the databases and be spam free. Thank you again for your decision to accept our message or to unsubscribe, whichever your choice was. ******************************************************* For those who are still with us, we commit to sending you only valuable information on substantial savings for shopping online. ; ;
## Header (preview): From OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM  Fri Nov 29 11:22:47 2002; Return-Path: <OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>; <head>; <title>mailv05a.gif</title>
## Header (preview): From Jacquiro@tjohoo.se  Sun Dec  1 16:14:33 2002; Return-Path: <Jacquiro@tjohoo.se>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): YOUR DEGREE MAY BE CLOSER THAN YOU THINK; We remove the obstacles that cause adults to abandon hope.; DID YOU KNOW that you could earn your legitimate Associate's, Bachelor's, Master's or even Doctorate degree, utilizing your already existing professional or academic expertise?
## Header (preview): From txoaplc@go-fishing.co.uk  Mon Dec  2 11:08:48 2002; Return-Path: <txoaplc@go-fishing.co.uk>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): PGh0bWw+PGJvZHkgYmdjb2xvcj0jRkZGRkZGIHRleHQ9IzAwMDAwMD4gPHRhYmxlIHdpZHRo; PTUwMCBib3JkZXI9MCBjZWxsc3BhY2luZz0wIGNlbGxwYWRkaW5nPTAgYWxpZ249Y2VudGVy; Pjx0cj48dGQ+PGEgaHJlZj1odHRwOi8vd3d3LmdhdGUxMjAuY29tL2Jvb2tjZHJvbS8+PGlt
## Header (preview): From profile@e-frsecurities.com  Mon Dec  2 11:10:59 2002; Return-Path: <profile@e-frsecurities.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_76F4_01C299FB.39D33820
## Header (preview): From moviedbjwuede@mandic.com.br  Mon Dec  2 11:09:00 2002; Return-Path: <moviedbjwuede@mandic.com.br>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): SEE a Teen Farm Girl Do it with her horse see it Free!; You think you have seen some pretty crazy p*rn on the ; internet?YOU HAVEN'T SEEN SH*T! I saw the most unbelievable
## Warning in strsplit(email_text, "\n"): unable to translate 'From webmaster@ibest.com.br  Mon Dec  2 22:46:02 2002
## Return-Path: <webmaster@ibest.com.br>
## Delivered-To: yyyy@localhost.spamassassin.taint.org
## Received: from localhost (jalapeno [127.0.0.1])
##  by jmason.org (Postfix) with ESMTP id B341C16F19
##  for <jm@l...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01386.9398d616dfc3d67fb10e95d911768b39 - missing value where TRUE/FALSE needed
## Header (preview): From donnamartos@link-builder.com  Mon Dec  2 23:55:10 2002; Return-Path: <donnamartos@link-builder.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): I discovered jmason.org in Yahoo, my favorite directory. I am requesting that you create a link from jmason.org to my client's web site if you feel that their content is in some way related or complements your site. In exchange, I'll post a link from their site to yours.  ; ; Exchanging links will help bring in more business for both your web site and my client's. An added benefit is increased search engine traffic because the search engines rank sites higher that have a good number of relevant links.
## Header (preview): From Tim3h85kg9@bigfoot.com  Wed Dec  4 11:58:40 2002; Return-Path: <Tim3h85kg9@bigfoot.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Hello -; ; You get emails every day, offering to show you how to make money.
## Header (preview): From mik323@usa.net  Tue Dec  3 19:32:15 2002; Return-Path: <mik323@usa.net>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Do You Want To Make $1000 Or More Per Week?; ;
## Header (preview): From OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM  Tue Dec  3 11:46:31 2002; Return-Path: <OWNER-NOLIST-SGODAILY*JM**NETNOTEINC*-COM@SMTP1.ADMANMAIL.COM>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html><body background="http://a725.g.akamai.net/7/725/1095/0001/www.omahasteaks.com/gifs/email/dotcom_3rdparty_bkg.gif" MARGINWIDTH="0" MARGINHEIGHT="0"><div align="center"><span style="font-family:arial; font-size:12px; color:black">; <table width="100%" leftmargin="0" topmargin="0" border="0" cellpadding="0" cellspacing="0" background="http://a725.g.akamai.net/7/725/1095/0001/www.omahasteaks.com/gifs/email/dotcom_3rdparty_bkg.gif" style="border-collapse: collapse" bordercolor="#111111">; <tr><td align="center"><font color="#FFFFFF" size="1">This message was not sent
## Header (preview): From Jhon67@aol.com  Wed Dec  4 11:58:43 2002; Return-Path: <Jhon67@aol.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>;  <head>;         <meta http-equiv="content-type" content="text/html;charset=ISO-8859-1">
## Header (preview): Received: from pop3.web.de [217.72.192.134];   by localhost with POP3 (fetchmail-5.9.0);   for k@localhost (single-drop); Wed, 04 Dec 2002 02:24:29 +0100 (CET)
## Body (preview): -----------------------------------------------------------  ;  ; http://www.webheadsweekly.com/babes-shaved/karsten/babes.html
## Header (preview): From LoseWeight@DIRECT4OPTIN.COM  Tue Dec  3 22:44:04 2002; Return-Path: <LoseWeight@DIRECT4OPTIN.COM>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>; <head>;     <meta http-equiv="Content-Type" content="text/html; charset=iso-8859-1">
## Header (preview): From alh4544032@mcimail.com  Tue Dec  3 22:44:05 2002; Return-Path: <alh4544032@mcimail.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>; <head>;  <title></title>
## Header (preview): From johnson11@aa64.toplinequotes.com  Wed Dec  4 11:58:31 2002; Return-Path: <johnson11@aa64.toplinequotes.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): Did you hear? Interest rates have just been lowered again. Don't delay! Get your free mortgage rate quote now and see how much you could save every month!;     ; Free, no obligation quote:
## Header (preview): From Professional_Career_Development_Institute-1-12032002-HTML@frugaljoe.330w.com  Tue Dec  3 22:44:06 2002; Return-Path: <Professional_Career_Development_Institute-1-12032002-HTML@frugaljoe.330w.com>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): <html>; <head>; <meta http-equiv="content-type" content="text/html;charset=ISO-8859-1">
## Header (preview): From tba@insiq.us  Wed Dec  4 11:46:34 2002; Return-Path: <tba@insiq.us>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview): This is a multi-part message in MIME format.; ; ------=_NextPart_000_1BDD6B_01C29AE9.2CD26A80
## Header (preview): Return-Path: <raye@yahoo.lv>; Received: from user2.pro-ns.net (user2.pro-ns.net [208.200.182.45]);     by hq.pro-ns.net (8.12.5/8.12.5) with ESMTP id g6L8N9CT032714
## Body (preview): Dear Subscriber,; ; If I could show you a way to get up to 10,000 visitors a day to your web site, noting that it will cost you no money, and only 30 minutes a day of your time would you be interested?
## Warning in strsplit(email_text, "\n"): unable to translate 'From cweqx@dialix.oz.au  Tue Aug  6 11:03:54 2002
## Return-Path: <cweqx@dialix.oz.au>
## Delivered-To: yyyy@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id D3ACD44135
##  for <jm@...' to a wide string
## Warning in strsplit(email_text, "\n"): input string 1 is invalid
## ⚠️ Error reading file: C:/Users/tanzi/OneDrive/DATA/607/Project 4/email/spam/01399.2319643317e2c5193d574e40a71809c2 - missing value where TRUE/FALSE needed
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview): From ilug-admin@linux.ie  Wed Dec  4 11:52:36 2002; Return-Path: <ilug-admin@linux.ie>; Delivered-To: yyyy@localhost.spamassassin.taint.org
## Body (preview):                       STRICTLY CONFIDENTIAL.; ; I am pleased to introduce myself  to you.My name is Mr. Wilson Kamela a native of South Africa and a senior employee of mines and natural resources department currently on a trainning course in Holland for few months.
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): mv 00001.317e78fa8ee2f54cd4890fdc09ba8176 00001.317e78fa8ee2f54cd4890fdc09ba8176; mv 00002.9438920e9a55591b18e60d1ed37d992b 00002.9438920e9a55591b18e60d1ed37d992b; mv 00003.590eff932f8704d8b0fcbe69d023b54d 00003.590eff932f8704d8b0fcbe69d023b54d
## Header (preview):
## Body (preview): 404: Not Found
## Header (preview):
## Body (preview): 404: Not Found
# Combine ham and spam data
email_data <- bind_rows(ham_data, spam_data)

# Basic validation
if (nrow(email_data) == 0) {
  stop("❌ No valid email data processed.")
}

# Summary diagnostics
message("✅ Processed ", nrow(email_data), " emails.")
## ✅ Processed 3508 emails.
message("📨 Ham emails: ", sum(email_data$label == "ham"))
## 📨 Ham emails: 2388
message("📨 Spam emails: ", sum(email_data$label == "spam"))
## 📨 Spam emails: 1120
# Preview dataset with shortened header/body
email_data %>%
  mutate(
    header_preview = str_trunc(header, 100),
    body_preview = str_trunc(body, 100)
  ) %>%
  select(filename, label, word_count, header_preview, body_preview) %>%
  head() %>%
  knitr::kable(caption = "📋 Preview: First 6 Emails (Header & Body Truncated)")
📋 Preview: First 6 Emails (Header & Body Truncated)
filename label word_count header_preview body_preview
00001.7c53336b37003a9286aba55d2945844c ham 208 From Thu Aug 22 12:36:23 2002
Return-Path: < | I can’t reproduce this error.

For me it is very repeatable… (like every time, without fail… | |00001.7c53336b37003a9286aba55d2945844c.txt |ham | 3| |404: Not Found | |00002.9c4069e25e1ef370c078db7ee85ff9ac |ham | 127|From Thu Aug 22 12:46:39 2002 Return-Path: <… |Martin A posted: Tassos Papadopoulos, the Greek sculptor behind the plan, judged that the limest… | |00002.9c4069e25e1ef370c078db7ee85ff9ac.txt |ham | 3| |404: Not Found | |00003.860e3c3cee1b42ead714c5c874fe25f7 |ham | 271|From Thu Aug 22 13:52:59 2002 Return-Path: Delivered-To: … |Man Threatens Explosion In Moscow

Thursday August 22, 2002 1:40 PM MOSCOW (AP) - Security offic… | |00004.864220c5b6930b209cc287c361c99af1 |ham | 154|From Thu Aug 22 14:23:39 2002 Return-Path: Deliv… |Already the most prolific virus ever, Klez continues to wreak havoc.

Andrew Brandt >>From the Se… |

# Optional: Print full header and body for first email
if (nrow(email_data) > 0) {
  cat("\n--- 📌 Full Header (", email_data$filename[1], ") ---\n", email_data$header[1], "\n\n")
  cat("--- 📨 Full Body ---\n", email_data$body[1], "\n")
}
## 
## --- 📌 Full Header ( 00001.7c53336b37003a9286aba55d2945844c ) ---
##  From exmh-workers-admin@redhat.com  Thu Aug 22 12:36:23 2002
## Return-Path: <exmh-workers-admin@spamassassin.taint.org>
## Delivered-To: zzzz@localhost.netnoteinc.com
## Received: from localhost (localhost [127.0.0.1])
##  by phobos.labs.netnoteinc.com (Postfix) with ESMTP id D03E543C36
##  for <zzzz@localhost>; Thu, 22 Aug 2002 07:36:16 -0400 (EDT)
## Received: from phobos [127.0.0.1]
##  by localhost with IMAP (fetchmail-5.9.0)
##  for zzzz@localhost (single-drop); Thu, 22 Aug 2002 12:36:16 +0100 (IST)
## Received: from listman.spamassassin.taint.org (listman.spamassassin.taint.org [66.187.233.211]) by
##     dogma.slashnull.org (8.11.6/8.11.6) with ESMTP id g7MBYrZ04811 for
##     <zzzz-exmh@spamassassin.taint.org>; Thu, 22 Aug 2002 12:34:53 +0100
## Received: from listman.spamassassin.taint.org (localhost.localdomain [127.0.0.1]) by
##     listman.redhat.com (Postfix) with ESMTP id 8386540858; Thu, 22 Aug 2002
##     07:35:02 -0400 (EDT)
## Delivered-To: exmh-workers@listman.spamassassin.taint.org
## Received: from int-mx1.corp.spamassassin.taint.org (int-mx1.corp.spamassassin.taint.org
##     [172.16.52.254]) by listman.redhat.com (Postfix) with ESMTP id 10CF8406D7
##     for <exmh-workers@listman.redhat.com>; Thu, 22 Aug 2002 07:34:10 -0400
##     (EDT)
## Received: (from mail@localhost) by int-mx1.corp.spamassassin.taint.org (8.11.6/8.11.6)
##     id g7MBY7g11259 for exmh-workers@listman.redhat.com; Thu, 22 Aug 2002
##     07:34:07 -0400
## Received: from mx1.spamassassin.taint.org (mx1.spamassassin.taint.org [172.16.48.31]) by
##     int-mx1.corp.redhat.com (8.11.6/8.11.6) with SMTP id g7MBY7Y11255 for
##     <exmh-workers@redhat.com>; Thu, 22 Aug 2002 07:34:07 -0400
## Received: from ratree.psu.ac.th ([202.28.97.6]) by mx1.spamassassin.taint.org
##     (8.11.6/8.11.6) with SMTP id g7MBIhl25223 for <exmh-workers@redhat.com>;
##     Thu, 22 Aug 2002 07:18:55 -0400
## Received: from delta.cs.mu.OZ.AU (delta.coe.psu.ac.th [172.30.0.98]) by
##     ratree.psu.ac.th (8.11.6/8.11.6) with ESMTP id g7MBWel29762;
##     Thu, 22 Aug 2002 18:32:40 +0700 (ICT)
## Received: from munnari.OZ.AU (localhost [127.0.0.1]) by delta.cs.mu.OZ.AU
##     (8.11.6/8.11.6) with ESMTP id g7MBQPW13260; Thu, 22 Aug 2002 18:26:25
##     +0700 (ICT)
## From: Robert Elz <kre@munnari.OZ.AU>
## To: Chris Garrigues <cwg-dated-1030377287.06fa6d@DeepEddy.Com>
## Cc: exmh-workers@spamassassin.taint.org
## Subject: Re: New Sequences Window
## In-Reply-To: <1029945287.4797.TMDA@deepeddy.vircio.com>
## References: <1029945287.4797.TMDA@deepeddy.vircio.com>
##     <1029882468.3116.TMDA@deepeddy.vircio.com> <9627.1029933001@munnari.OZ.AU>
##     <1029943066.26919.TMDA@deepeddy.vircio.com>
##     <1029944441.398.TMDA@deepeddy.vircio.com>
## MIME-Version: 1.0
## Content-Type: text/plain; charset=us-ascii
## Message-Id: <13258.1030015585@munnari.OZ.AU>
## X-Loop: exmh-workers@spamassassin.taint.org
## Sender: exmh-workers-admin@spamassassin.taint.org
## Errors-To: exmh-workers-admin@spamassassin.taint.org
## X-Beenthere: exmh-workers@spamassassin.taint.org
## X-Mailman-Version: 2.0.1
## Precedence: bulk
## List-Help: <mailto:exmh-workers-request@spamassassin.taint.org?subject=help>
## List-Post: <mailto:exmh-workers@spamassassin.taint.org>
## List-Subscribe: <https://listman.spamassassin.taint.org/mailman/listinfo/exmh-workers>,
##     <mailto:exmh-workers-request@redhat.com?subject=subscribe>
## List-Id: Discussion list for EXMH developers <exmh-workers.spamassassin.taint.org>
## List-Unsubscribe: <https://listman.spamassassin.taint.org/mailman/listinfo/exmh-workers>,
##     <mailto:exmh-workers-request@redhat.com?subject=unsubscribe>
## List-Archive: <https://listman.spamassassin.taint.org/mailman/private/exmh-workers/>
## Date: Thu, 22 Aug 2002 18:26:25 +0700 
## 
## --- 📨 Full Body ---
##    | I can't reproduce this error.
## 
## For me it is very repeatable... (like every time, without fail).
## 
## This is the debug log of the pick happening ...
## 
## 18:19:03 Pick_It {exec pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace} {4852-4852 -sequence mercury}
## 18:19:03 exec pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace 4852-4852 -sequence mercury
## 18:19:04 Ftoc_PickMsgs {{1 hit}}
## 18:19:04 Marking 1 hits
## 18:19:04 tkerror: syntax error in expression "int ...
## 
## Note, if I run the pick command by hand ...
## 
## delta$ pick +inbox -list -lbrace -lbrace -subject ftp -rbrace -rbrace  4852-4852 -sequence mercury
## 1 hit
## 
## That's where the "1 hit" comes from (obviously).  The version of nmh I'm
## using is ...
## 
## delta$ pick -version
## pick -- nmh-1.0.4 [compiled on fuchsia.cs.mu.OZ.AU at Sun Mar 17 14:55:56 ICT 2002]
## 
## And the relevant part of my .mh_profile ...
## 
## delta$ mhparam pick
## -seq sel -list
## 
## 
## Since the pick command works, the sequence (actually, both of them, the
## one that's explicit on the command line, from the search popup, and the
## one that comes from .mh_profile) do get created.
## 
## 
## been able to reach the cvs repository today (local routing issue I think).

Data preparetion for ML model

#' Process a single email file and extract structured information
#'
#' @param file_path Full path to the email file
#' @param label     Label to assign ("ham" or "spam")
#' @return A tibble with filename, label, header, body, and word_count
process_email_file <- function(file_path, label) {
  tryCatch({
    # Read email content as one single string
    email_text <- paste(readLines(file_path, warn = FALSE), collapse = "\n")

    # Use the separate_email() function to extract header and body
    result <- separate_email(email_text)

    # Basic feature: word count from body
    body_words <- str_count(result$body, "\\w+")

    # Create a structured tibble for each email
    tibble(
      filename   = basename(file_path),
      label      = factor(label, levels = c("ham", "spam")),
      header     = result$header,
      body       = result$body,
      word_count = body_words
    )
  }, error = function(e) {
    # Log error with filename for easier debugging
    message("❌ Error processing file: ", file_path)
    message("   ↳ ", e$message)
    return(NULL)
  })
}

Build the ML model

# 📦 Load required libraries
library(tidyverse)
library(tidymodels)
library(stringr)

# 🧪 Set seed for reproducibility
set.seed(123)

# ✅ Check required columns exist in email_data
required_cols <- c("label", "word_count", "body")
missing_cols <- setdiff(required_cols, names(email_data))

if (length(missing_cols) > 0) {
  stop("❌ 'email_data' is missing required columns: ", paste(missing_cols, collapse = ", "))
}

# 🛠️ Feature engineering: add binary indicators for keywords
email_data <- email_data %>%
  mutate(
    has_unsubscribe = as.integer(str_detect(body, regex("unsubscribe", ignore_case = TRUE))),
    has_free = as.integer(str_detect(body, regex("free", ignore_case = TRUE)))
  ) %>%
  select(label, word_count, has_unsubscribe, has_free)

# ✂️ Split dataset
# Split the data
set.seed(123)
data_split <- initial_split(email_data, prop = 0.8, strata = label)
train_data <- training(data_split)
test_data <- testing(data_split)

##Evaluate Model

# 🔁 Reproducible random forest model pipeline

# 🧪 Step 1: Initialize the model
rf_model <- rand_forest(trees = 100) %>%
  set_engine("ranger") %>%
  set_mode("classification")

# 🥣 Step 2: Create a preprocessing recipe
rf_recipe <- recipe(label ~ ., data = train_data) %>%
  step_normalize(all_numeric_predictors())

# ⚙️ Step 3: Combine model and recipe into a workflow
rf_workflow <- workflow() %>%
  add_recipe(rf_recipe) %>%
  add_model(rf_model)

# 🚀 Step 4: Fit the model
message("🚧 Building random forest model...")
## 🚧 Building random forest model...
rf_fit <- rf_workflow %>%
  fit(data = train_data)
message("✅ Model built successfully!")
## ✅ Model built successfully!
# 📊 Step 5: Make predictions and evaluate
message("🔍 Evaluating model...")
## 🔍 Evaluating model...
predictions <- predict(rf_fit, new_data = test_data) %>%
  bind_cols(test_data %>% select(label))

# 📉 Step 6: Confusion matrix and accuracy
conf_matrix <- conf_mat(predictions, truth = label, estimate = .pred_class)
acc_metric  <- accuracy(predictions, truth = label, estimate = .pred_class)

# 🖨️ Output results
message("📉 Confusion Matrix:")
## 📉 Confusion Matrix:
print(conf_matrix)
##           Truth
## Prediction ham spam
##       ham  433  100
##       spam  45  124
message("🎯 Accuracy: ", round(acc_metric$.estimate, 3))
## 🎯 Accuracy: 0.793

##Plotting confusion matrix

✂️ Split Data

email_split <- initial_split(email_data, prop = 0.8, strata = label)
train_data <- training(email_split)
test_data  <- testing(email_split)

🌲 Build Random Forest Model

rf_model <- rand_forest(trees = 100) %>%
  set_engine("ranger") %>%
  set_mode("classification")

rf_recipe <- recipe(label ~ ., data = train_data) %>%
  step_normalize(all_numeric_predictors())

rf_workflow <- workflow() %>%
  add_recipe(rf_recipe) %>%
  add_model(rf_model)

rf_fit <- rf_workflow %>%
  fit(data = train_data)

🔍 Evaluate Model

predictions <- predict(rf_fit, new_data = test_data) %>%
  bind_cols(test_data %>% select(label))

conf_matrix <- conf_mat(predictions, truth = label, estimate = .pred_class)
acc_metric  <- accuracy(predictions, truth = label, estimate = .pred_class)

Confusion Matrix

conf_mat_table <- as.data.frame(conf_matrix$table)
colnames(conf_mat_table) <- c("Truth", "Prediction", "Freq")

ggplot(conf_mat_table, aes(x = Prediction, y = Truth, fill = Freq)) +
  geom_tile(color = "gray30") +
  geom_text(aes(label = Freq), color = "white", size = 5, fontface = "bold") +
  scale_fill_gradient(low = "steelblue", high = "darkred") +
  labs(title = "Confusion Matrix: Spam vs. Ham", x = "Predicted", y = "Actual") +
  theme_minimal(base_size = 14)

Accuracy, Precision, Recall, F1

eval_metrics <- metric_set(precision, recall, f_meas)(predictions, truth = label, estimate = .pred_class)
eval_metrics
## # A tibble: 3 × 3
##   .metric   .estimator .estimate
##   <chr>     <chr>          <dbl>
## 1 precision binary         0.785
## 2 recall    binary         0.931
## 3 f_meas    binary         0.852

📈 ROC Curve

prob_predictions <- predict(rf_fit, new_data = test_data, type = "prob") %>%
  bind_cols(test_data %>% select(label))

roc_results <- roc_curve(prob_predictions, truth = label, .pred_spam)

autoplot(roc_results) +
  labs(title = "ROC Curve: Spam vs. Ham Classification") +
  theme_minimal(base_size = 14)

✅ Conclusion

message("The random forest model achieved an accuracy of ", round(acc_metric$.estimate, 3), ".")
## The random forest model achieved an accuracy of 0.779.
message("It performed well in classifying emails, though further improvements can be made using additional features or hyperparameter tuning.")
## It performed well in classifying emails, though further improvements can be made using additional features or hyperparameter tuning.

##Conclusion: In this project, we developed a machine learning model to classify emails as either spam or ham using a Random Forest algorithm within the tidymodels framework. By preprocessing the text data, normalizing features, and tuning the model pipeline, we achieved a reliable classifier that can identify unwanted emails with a high degree of accuracy.

The confusion matrix visualization highlighted the model’s ability to distinguish between spam and ham emails, showing strong performance in both precision and recall. These results suggest that Random Forest is a robust choice for handling binary classification tasks in text-based datasets.

For future improvements, incorporating additional natural language processing techniques—such as stemming, lemmatization, or advanced vectorization (e.g., TF-IDF, word embeddings)—could further enhance the model’s performance. Moreover, comparing different models (e.g., logistic regression, support vector machines, or deep learning approaches) could provide more insights and potentially better accuracy.

Overall, this reproducible workflow serves as a solid foundation for email filtering systems, showcasing the power of tidy modeling principles in real-world applications.

LS0tDQp0aXRsZTogIlByb2plY3Q0Ig0KYXV0aG9yOiAiTWQuIFRhbnppbCBFaHNhbiINCmRhdGU6ICJgMDUvMDQvMjAyNWAiDQpvdXRwdXQ6DQogIG9wZW5pbnRybzo6bGFiX3JlcG9ydDogZGVmYXVsdA0KICBodG1sX2RvY3VtZW50Og0KICAgIGRmX3ByaW50OiBwYWdlZA0KICBwZGZfZG9jdW1lbnQ6IGRlZmF1bHQNCi0tLQ0KDQpgYGB7ciBsb2FkLXBhY2thZ2VzLCBtZXNzYWdlPUZBTFNFfQ0KbGlicmFyeSh0aWR5dmVyc2UpDQpsaWJyYXJ5KG9wZW5pbnRybykNCmBgYA0KDQoNCg0KIyMgQ2hlY2sgbmVjZXNzYXJ5IExpYnJhcnkNCg0KDQpgYGB7cn0NCiMgSW5zdGFsbCByZXF1aXJlZCBwYWNrYWdlcyBpZiBub3QgYWxyZWFkeSBpbnN0YWxsZWQgICAgICAgICAgICAgICAgICAgIA0KICANCnJlcXVpcmVkX3BhY2thZ2VzIDwtIGMoInRpZHl2ZXJzZSIsInRpZHl0ZXh0IiwgIk1hdHJpeCIsICJyYW5nZXIiLCAiZ2dwbG90MiIsICJ5YXJkc3RpY2siKQ0KZm9yIChwa2cgaW4gcmVxdWlyZWRfcGFja2FnZXMpIHsNCiAgaWYgKCFyZXF1aXJlTmFtZXNwYWNlKHBrZywgcXVpZXRseSA9IFRSVUUpKSB7DQogICAgbWVzc2FnZSgiSW5zdGFsbGluZyBwYWNrYWdlOiAiLCBwa2cpDQogICAgaW5zdGFsbC5wYWNrYWdlcyhwa2csIHJlcG9zID0gImh0dHBzOi8vY3Jhbi5yc3R1ZGlvLmNvbS8iKQ0KICB9DQogIGxpYnJhcnkocGtnLCBjaGFyYWN0ZXIub25seSA9IFRSVUUpDQp9DQpgYGANCg0KIyMgTG9hZCB0aGUgcGFja2FnZXMNCmBgYHtyIHNldHVwfQ0KDQpsaWJyYXJ5KHRpZHl2ZXJzZSkNCmxpYnJhcnkodGlkeW1vZGVscykNCmxpYnJhcnkodGlkeXRleHQpDQpsaWJyYXJ5KHBhcnNuaXApDQpsaWJyYXJ5KHJlY2lwZXMpDQpsaWJyYXJ5KHdvcmtmbG93cykNCmxpYnJhcnkoeWFyZHN0aWNrKQ0KDQoNCmBgYA0KDQoNCg0KYGBge3J9DQojIExvYWQgcmVxdWlyZWQgcGFja2FnZXMNCmxpYnJhcnkodGlkeXZlcnNlKQ0KbGlicmFyeShzdHJpbmdyKQ0KDQojIEZ1bmN0aW9uIHRvIHNwbGl0IGFuZCBjbGVhbiBlbWFpbCB0ZXh0DQpzZXBhcmF0ZV9lbWFpbCA8LSBmdW5jdGlvbihlbWFpbF90ZXh0KSB7DQogIGxpbmVzIDwtIHVubGlzdChzdHJzcGxpdChlbWFpbF90ZXh0LCAiXG4iKSkNCiAgc3RhcnRfbGluZSA8LSBpZmVsc2UoZ3JlcGwoIl48RE9DVU1FTlQiLCBsaW5lc1sxXSksIDIsIDEpDQogIGxpbmVzIDwtIGxpbmVzW3N0YXJ0X2xpbmU6bGVuZ3RoKGxpbmVzKV0NCiAgDQogIGJsYW5rX2xpbmVfaW5kZXggPC0gd2hpY2godHJpbXdzKGxpbmVzKSA9PSAiIilbMV0NCiAgaGVhZGVyIDwtIGNoYXJhY3RlcigpDQogIGJvZHkgPC0gY2hhcmFjdGVyKCkNCiAgDQogIGlmICghaXMubmEoYmxhbmtfbGluZV9pbmRleCkgJiYgYmxhbmtfbGluZV9pbmRleCA+IDEpIHsNCiAgICBoZWFkZXIgPC0gbGluZXNbMTooYmxhbmtfbGluZV9pbmRleCAtIDEpXQ0KICAgIGJvZHkgPC0gbGluZXNbKGJsYW5rX2xpbmVfaW5kZXggKyAxKTpsZW5ndGgobGluZXMpXQ0KICB9IGVsc2Ugew0KICAgIGhlYWRlcl9wYXR0ZXJuIDwtICJeW0EtWmEtei1dKzouKiQiDQogICAgaW5faGVhZGVyIDwtIFRSVUUNCiAgICBmb3IgKGkgaW4gc2VxX2Fsb25nKGxpbmVzKSkgew0KICAgICAgbGluZSA8LSBsaW5lc1tpXQ0KICAgICAgaWYgKGluX2hlYWRlcikgew0KICAgICAgICBpZiAoZ3JlcGwoaGVhZGVyX3BhdHRlcm4sIGxpbmUpIHx8IChpID4gMSAmJiBncmVwbCgiXlxccyIsIGxpbmUpKSkgew0KICAgICAgICAgIGhlYWRlciA8LSBjKGhlYWRlciwgbGluZSkNCiAgICAgICAgfSBlbHNlIHsNCiAgICAgICAgICBpbl9oZWFkZXIgPC0gRkFMU0UNCiAgICAgICAgICBib2R5IDwtIGMoYm9keSwgbGluZSkNCiAgICAgICAgfQ0KICAgICAgfSBlbHNlIHsNCiAgICAgICAgYm9keSA8LSBjKGJvZHksIGxpbmUpDQogICAgICB9DQogICAgfQ0KICB9DQoNCiAgIyBDbGVhbiBib2R5DQogIGJvZHlfbGluZXMgPC0gYm9keQ0KICBjbGVhbmVkX2JvZHkgPC0gY2hhcmFjdGVyKCkNCiAgaW5fcXVvdGVkX2hlYWRlciA8LSBUUlVFDQogIHNpZ25hdHVyZV9zdGFydCA8LSBGQUxTRQ0KICBza2lwX2Zvb3RlciA8LSBGQUxTRQ0KDQogIGZvciAoaSBpbiBzZXFfYWxvbmcoYm9keV9saW5lcykpIHsNCiAgICBsaW5lIDwtIGJvZHlfbGluZXNbaV0NCiAgICANCiAgICBpZiAoaW5fcXVvdGVkX2hlYWRlciAmJiAoZ3JlcGwoIl5cXHMqW0EtWmEtei1dKzouKiQiLCBsaW5lKSB8fCB0cmltd3MobGluZSkgPT0gIiIpKSB7DQogICAgICBuZXh0DQogICAgfSBlbHNlIHsNCiAgICAgIGluX3F1b3RlZF9oZWFkZXIgPC0gRkFMU0UNCiAgICB9DQoNCiAgICBpZiAoaSA8IGxlbmd0aChib2R5X2xpbmVzKSkgew0KICAgICAgbmV4dF9saW5lcyA8LSBib2R5X2xpbmVzWyhpICsgMSk6bWluKGkgKyAzLCBsZW5ndGgoYm9keV9saW5lcykpXQ0KICAgICAgaWYgKGFueShncmVwbCgibWFpbGluZyBsaXN0fGh0dHBzOi8vbGlzdG1hbnxfX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX3xFeG1oLXdvcmtlcnNAcmVkaGF0LmNvbSIsIGMobGluZSwgbmV4dF9saW5lcykpKSkgew0KICAgICAgICBza2lwX2Zvb3RlciA8LSBUUlVFDQogICAgICB9DQogICAgfQ0KICAgIGlmIChza2lwX2Zvb3RlcikgbmV4dA0KDQogICAgaWYgKGdyZXBsKCJeLS1cXHMqJCIsIGxpbmUpKSB7DQogICAgICBzaWduYXR1cmVfc3RhcnQgPC0gVFJVRQ0KICAgICAgbmV4dA0KICAgIH0NCiAgICBpZiAoc2lnbmF0dXJlX3N0YXJ0IHx8IGdyZXBsKCJecHM6LiokfF5cXHd7MSwxNX0kIiwgbGluZSkpIHsNCiAgICAgIG5leHQNCiAgICB9DQoNCiAgICBjbGVhbmVkX2JvZHkgPC0gYyhjbGVhbmVkX2JvZHksIGxpbmUpDQogIH0NCg0KICBsaXN0KA0KICAgIGhlYWRlciA9IHBhc3RlKGhlYWRlciwgY29sbGFwc2UgPSAiXG4iKSwNCiAgICBib2R5ID0gcGFzdGUoY2xlYW5lZF9ib2R5LCBjb2xsYXBzZSA9ICJcbiIpDQogICkNCn0NCg0KIyBGdW5jdGlvbiB0byByZWFkIGVtYWlsIGZpbGUgZnJvbSBVUkwNCnByb2Nlc3NfZW1haWxfZmlsZSA8LSBmdW5jdGlvbihmaWxlX3VybCwgbGFiZWwpIHsNCiAgdHJ5Q2F0Y2goew0KICAgIGVtYWlsX3RleHQgPC0gcmVhZExpbmVzKHVybChmaWxlX3VybCksIHdhcm4gPSBGQUxTRSkgJT4lIHBhc3RlKGNvbGxhcHNlID0gIlxuIikNCiAgICByZXN1bHQgPC0gc2VwYXJhdGVfZW1haWwoZW1haWxfdGV4dCkNCiAgICB3b3JkX2NvdW50IDwtIHN0cl9jb3VudChyZXN1bHQkYm9keSwgIlxcdysiKQ0KICAgIA0KICAgIHRpYmJsZSgNCiAgICAgIGZpbGVuYW1lID0gYmFzZW5hbWUoZmlsZV91cmwpLA0KICAgICAgbGFiZWwgPSBmYWN0b3IobGFiZWwsIGxldmVscyA9IGMoImhhbSIsICJzcGFtIikpLA0KICAgICAgaGVhZGVyID0gcmVzdWx0JGhlYWRlciwNCiAgICAgIGJvZHkgPSByZXN1bHQkYm9keSwNCiAgICAgIHdvcmRfY291bnQgPSB3b3JkX2NvdW50DQogICAgKQ0KICB9LCBlcnJvciA9IGZ1bmN0aW9uKGUpIHsNCiAgICBtZXNzYWdlKCJFcnJvciBwcm9jZXNzaW5nOiAiLCBmaWxlX3VybCwgIiAtICIsIGUkbWVzc2FnZSkNCiAgICByZXR1cm4oTlVMTCkNCiAgfSkNCn0NCmBgYA0KDQoNCmBgYHtyfQ0KIyBHaXRIdWIgcmF3IGZvbGRlciBVUkxzIChyZXBsYWNlIHdpdGggcmF3IGZpbGUgbGlua3MpDQpoYW1fYmFzZSA8LSAiaHR0cHM6Ly9yYXcuZ2l0aHVidXNlcmNvbnRlbnQuY29tL3RhbnppbDY0L1Byb2plY3Q0XzMvbWFpbi9lbWFpbC9oYW0iDQpzcGFtX2Jhc2UgPC0gImh0dHBzOi8vcmF3LmdpdGh1YnVzZXJjb250ZW50LmNvbS90YW56aWw2NC9Qcm9qZWN0NF8zL21haW4vZW1haWwvc3BhbTEiDQoNCiMgTGlzdCBvZiBmaWxlIG5hbWVzIGZyb20gR2l0SHViIChhZGQgYWN0dWFsIGZpbGVuYW1lcyBtYW51YWxseSBvciB3aXRoIGEgc2NyaXB0KQ0KaGFtX2ZpbGVzIDwtIGMoIjAwMDAxLjdjNTMzMzZiMzcwMDNhOTI4NmFiYTU1ZDI5NDU4NDRjIiwgIjAwMDAyLjljNDA2OWUyNWUxZWYzNzBjMDc4ZGI3ZWU4NWZmOWFjIikgICMgRXh0ZW5kIHRoaXMgbGlzdA0Kc3BhbV9maWxlcyA8LSBjKCIwMDIwOC5jOWUzMGZjOTA0NGNkYzUwNjgyYzJlMmQyYmU0YzQ2NiIsICIwMDIwOS5kNTljOWMyODIyYTRiNmRjMTU3YmE0M2Q5ZTJlIikgICAgICMgRXh0ZW5kIHRoaXMgbGlzdA0KDQojIENyZWF0ZSBmdWxsIHJhdyBVUkxzDQpoYW1fdXJscyA8LSBmaWxlLnBhdGgoaGFtX2Jhc2UsIGhhbV9maWxlcykNCnNwYW1fdXJscyA8LSBmaWxlLnBhdGgoc3BhbV9iYXNlLCBzcGFtX2ZpbGVzKQ0KDQojIFByb2Nlc3MgZmlsZXMNCmhhbV9kYXRhIDwtIG1hcChoYW1fdXJscywgfnByb2Nlc3NfZW1haWxfZmlsZSgueCwgImhhbSIpKSAlPiUgY29tcGFjdCgpICU+JSBiaW5kX3Jvd3MoKQ0Kc3BhbV9kYXRhIDwtIG1hcChzcGFtX3VybHMsIH5wcm9jZXNzX2VtYWlsX2ZpbGUoLngsICJzcGFtIikpICU+JSBjb21wYWN0KCkgJT4lIGJpbmRfcm93cygpDQoNCiMgQ29tYmluZQ0KZW1haWxfZGF0YSA8LSBiaW5kX3Jvd3MoaGFtX2RhdGEsIHNwYW1fZGF0YSkNCg0KIyBTaG93IHN1bW1hcnkNCm1lc3NhZ2UoIlRvdGFsIGVtYWlsczogIiwgbnJvdyhlbWFpbF9kYXRhKSkNCm1lc3NhZ2UoIkhhbTogIiwgc3VtKGVtYWlsX2RhdGEkbGFiZWwgPT0gImhhbSIpLCAiIHwgU3BhbTogIiwgc3VtKGVtYWlsX2RhdGEkbGFiZWwgPT0gInNwYW0iKSkNCg0KIyBQcmV2aWV3DQplbWFpbF9kYXRhICU+JQ0KICBtdXRhdGUoDQogICAgaGVhZGVyX3ByZXZpZXcgPSBzdHJfdHJ1bmMoaGVhZGVyLCAxMDApLA0KICAgIGJvZHlfcHJldmlldyA9IHN0cl90cnVuYyhib2R5LCAxMDApDQogICkgJT4lDQogIHNlbGVjdChmaWxlbmFtZSwgbGFiZWwsIHdvcmRfY291bnQsIGhlYWRlcl9wcmV2aWV3LCBib2R5X3ByZXZpZXcpICU+JQ0KICBoZWFkKCkgJT4lDQogIGtuaXRyOjprYWJsZShjYXB0aW9uID0gIkZpcnN0IDYgcHJvY2Vzc2VkIGVtYWlscyIpDQoNCiMgU2hvdyBmdWxsIHRleHQgZm9yIG9uZSBleGFtcGxlDQppZiAobnJvdyhlbWFpbF9kYXRhKSA+IDApIHsNCiAgY2F0KCJcbi0tLSBGdWxsIEhlYWRlciAtLS1cbiIsIGVtYWlsX2RhdGEkaGVhZGVyWzFdLCAiXG4iKQ0KICBjYXQoIlxuLS0tIEZ1bGwgQm9keSAtLS1cbiIsIGVtYWlsX2RhdGEkYm9keVsxXSwgIlxuIikNCn0NCg0KYGBgDQoNCiMjICBGdW5jdGlvbiB0byBTZXBhcmF0ZSBFbWFpbCBIZWFkZXIgYW5kIEJvZHkgIA0KYGBge3J9DQpzZXBhcmF0ZV9lbWFpbCA8LSBmdW5jdGlvbihlbWFpbF90ZXh0KSB7DQogICMgU3BsaXQgZW1haWwgdGV4dCBpbnRvIGxpbmVzDQogIGxpbmVzIDwtIHVubGlzdChzdHJzcGxpdChlbWFpbF90ZXh0LCAiXG4iKSkNCg0KICAjIFNraXAgPERPQ1VNRU5UPiB0YWcgaWYgcHJlc2VudA0KICBpZiAoZ3JlcGwoIl48RE9DVU1FTlQiLCBsaW5lc1sxXSkpIHsNCiAgICBsaW5lcyA8LSBsaW5lc1stMV0NCiAgfQ0KDQogICMgQXR0ZW1wdCB0byBzcGxpdCBvbiBmaXJzdCBibGFuayBsaW5lIGJldHdlZW4gaGVhZGVyIGFuZCBib2R5DQogIGJsYW5rX2xpbmVfaW5kZXggPC0gd2hpY2godHJpbXdzKGxpbmVzKSA9PSAiIilbMV0NCiAgaGVhZGVyIDwtIGNoYXJhY3RlcigpDQogIGJvZHkgPC0gY2hhcmFjdGVyKCkNCg0KICBpZiAoIWlzLm5hKGJsYW5rX2xpbmVfaW5kZXgpICYmIGJsYW5rX2xpbmVfaW5kZXggPiAxKSB7DQogICAgaGVhZGVyIDwtIGxpbmVzWzE6KGJsYW5rX2xpbmVfaW5kZXggLSAxKV0NCiAgICBib2R5IDwtIGxpbmVzWyhibGFua19saW5lX2luZGV4ICsgMSk6bGVuZ3RoKGxpbmVzKV0NCiAgfSBlbHNlIHsNCiAgICAjIElmIG5vIGJsYW5rIGxpbmUsIGZhbGwgYmFjayB0byBwYXR0ZXJuLWJhc2VkIGhlYWRlciBkZXRlY3Rpb24NCiAgICBoZWFkZXJfcGF0dGVybiA8LSAiXltBLVphLXotXSs6LiokIg0KICAgIGluX2hlYWRlciA8LSBUUlVFDQogICAgZm9yIChsaW5lIGluIGxpbmVzKSB7DQogICAgICBpZiAoaW5faGVhZGVyKSB7DQogICAgICAgIGlmIChncmVwbChoZWFkZXJfcGF0dGVybiwgbGluZSkgfHwgZ3JlcGwoIl5cXHMiLCBsaW5lKSkgew0KICAgICAgICAgIGhlYWRlciA8LSBjKGhlYWRlciwgbGluZSkNCiAgICAgICAgfSBlbHNlIHsNCiAgICAgICAgICBpbl9oZWFkZXIgPC0gRkFMU0UNCiAgICAgICAgICBib2R5IDwtIGMoYm9keSwgbGluZSkNCiAgICAgICAgfQ0KICAgICAgfSBlbHNlIHsNCiAgICAgICAgYm9keSA8LSBjKGJvZHksIGxpbmUpDQogICAgICB9DQogICAgfQ0KICB9DQoNCiAgIyBDbGVhbiB0aGUgYm9keTogUmVtb3ZlIHF1b3RlZCBoZWFkZXJzLCBzaWduYXR1cmVzLCBtYWlsaW5nIGxpc3QgZm9vdGVycw0KICBjbGVhbmVkX2JvZHkgPC0gY2hhcmFjdGVyKCkNCiAgaW5fcXVvdGVkX2hlYWRlciA8LSBUUlVFDQogIHNpZ25hdHVyZV9zdGFydCA8LSBGQUxTRQ0KICBza2lwX2Zvb3RlciA8LSBGQUxTRQ0KDQogIGZvciAoaSBpbiBzZXFfYWxvbmcoYm9keSkpIHsNCiAgICBsaW5lIDwtIGJvZHlbaV0NCg0KICAgICMgU2tpcCBxdW90ZWQgaGVhZGVyIGxpbmVzDQogICAgaWYgKGluX3F1b3RlZF9oZWFkZXIgJiYgKGdyZXBsKCJeXFxzKltBLVphLXotXSs6LiokIiwgbGluZSkgfHwgdHJpbXdzKGxpbmUpID09ICIiKSkgew0KICAgICAgbmV4dA0KICAgIH0gZWxzZSB7DQogICAgICBpbl9xdW90ZWRfaGVhZGVyIDwtIEZBTFNFDQogICAgfQ0KDQogICAgIyBEZXRlY3QgbWFpbGluZyBsaXN0IGZvb3RlcnMNCiAgICBpZiAoaSA8IGxlbmd0aChib2R5KSkgew0KICAgICAgbG9va2FoZWFkIDwtIGJvZHlbKGkgKyAxKTptaW4oaSArIDMsIGxlbmd0aChib2R5KSldDQogICAgICBpZiAoYW55KGdyZXBsKCJtYWlsaW5nIGxpc3R8aHR0cHM6Ly9saXN0bWFufF9fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19fX19ffEV4bWgtd29ya2Vyc0ByZWRoYXQuY29tIiwgYyhsaW5lLCBsb29rYWhlYWQpKSkpIHsNCiAgICAgICAgc2tpcF9mb290ZXIgPC0gVFJVRQ0KICAgICAgfQ0KICAgIH0NCiAgICBpZiAoc2tpcF9mb290ZXIpIG5leHQNCg0KICAgICMgU2tpcCBzaWduYXR1cmUgbGluZXMNCiAgICBpZiAoZ3JlcGwoIl4tLVxccyokIiwgbGluZSkpIHsNCiAgICAgIHNpZ25hdHVyZV9zdGFydCA8LSBUUlVFDQogICAgICBuZXh0DQogICAgfQ0KICAgIGlmIChzaWduYXR1cmVfc3RhcnQgfHwgZ3JlcGwoIl5wczouKiR8Xlxcd3sxLDE1fSQiLCBsaW5lKSkgew0KICAgICAgbmV4dA0KICAgIH0NCg0KICAgIGNsZWFuZWRfYm9keSA8LSBjKGNsZWFuZWRfYm9keSwgbGluZSkNCiAgfQ0KDQogICMgQ29sbGFwc2UgaGVhZGVyIGFuZCBib2R5IHRvIHNpbmdsZSBzdHJpbmdzDQogIGhlYWRlcl90ZXh0IDwtIHBhc3RlKGhlYWRlciwgY29sbGFwc2UgPSAiXG4iKQ0KICBib2R5X3RleHQgPC0gcGFzdGUoY2xlYW5lZF9ib2R5LCBjb2xsYXBzZSA9ICJcbiIpDQoNCiAgIyBQcmludCBwcmV2aWV3IGZvciBkZWJ1Z2dpbmcNCiAgbWVzc2FnZSgiSGVhZGVyIChwcmV2aWV3KTogIiwgcGFzdGUoaGVhZChzdHJzcGxpdChoZWFkZXJfdGV4dCwgIlxuIilbWzFdXSwgMyksIGNvbGxhcHNlID0gIjsgIikpDQogIG1lc3NhZ2UoIkJvZHkgKHByZXZpZXcpOiAiLCBwYXN0ZShoZWFkKHN0cnNwbGl0KGJvZHlfdGV4dCwgIlxuIilbWzFdXSwgMyksIGNvbGxhcHNlID0gIjsgIikpDQoNCiAgIyBSZXR1cm4gY2xlYW5lZCBoZWFkZXIgYW5kIGJvZHkNCiAgcmV0dXJuKGxpc3QoaGVhZGVyID0gaGVhZGVyX3RleHQsIGJvZHkgPSBib2R5X3RleHQpKQ0KfQ0KDQpgYGANCg0KDQoNCiMjIFByb2Nlc3MgZW1haWwgZm9sZGVyIDE6IA0KDQoNCmBgYHtyfQ0KDQoNCiMgTG9hZCByZXF1aXJlZCBwYWNrYWdlcw0KbGlicmFyeSh0aWR5dmVyc2UpDQpsaWJyYXJ5KHN0cmluZ3IpDQoNCiMgRGVmaW5lIGZpbGUgcGF0aHMgKGFkanVzdCBpZiB5b3VyIHByb2Zlc3NvciBydW5zIG9uIGEgZGlmZmVyZW50IHN5c3RlbSkNCmhhbV9mb2xkZXIgPC0gIkM6L1VzZXJzL3RhbnppL09uZURyaXZlL0RBVEEvNjA3L1Byb2plY3QgNC9lbWFpbC9oYW0iDQpzcGFtX2ZvbGRlciA8LSAiQzovVXNlcnMvdGFuemkvT25lRHJpdmUvREFUQS82MDcvUHJvamVjdCA0L2VtYWlsL3NwYW0iDQoNCiMgR2V0IGxpc3Qgb2YgYWxsIGVtYWlsIGZpbGVzDQpoYW1fZmlsZXMgPC0gbGlzdC5maWxlcyhoYW1fZm9sZGVyLCBmdWxsLm5hbWVzID0gVFJVRSkNCnNwYW1fZmlsZXMgPC0gbGlzdC5maWxlcyhzcGFtX2ZvbGRlciwgZnVsbC5uYW1lcyA9IFRSVUUpDQoNCiMgVmFsaWRhdGUgZmlsZXMgZXhpc3QNCmlmIChsZW5ndGgoaGFtX2ZpbGVzKSA9PSAwICYmIGxlbmd0aChzcGFtX2ZpbGVzKSA9PSAwKSB7DQogIHN0b3AoIuKdjCBObyBmaWxlcyBmb3VuZCBpbiBoYW0gb3Igc3BhbSBmb2xkZXJzLiBQbGVhc2UgY2hlY2sgdGhlIGZvbGRlciBwYXRocy4iKQ0KfQ0KbWVzc2FnZSgi8J+TgiBGb3VuZCAiLCBsZW5ndGgoaGFtX2ZpbGVzKSwgIiBoYW0gZmlsZXMgYW5kICIsIGxlbmd0aChzcGFtX2ZpbGVzKSwgIiBzcGFtIGZpbGVzLiIpDQoNCiMgRnVuY3Rpb24gdG8gcHJvY2VzcyBhIHNpbmdsZSBlbWFpbCBmaWxlIGFuZCBleHRyYWN0IG1ldGFkYXRhDQpwcm9jZXNzX2VtYWlsX2ZpbGUgPC0gZnVuY3Rpb24oZmlsZV9wYXRoLCBsYWJlbCkgew0KICB0cnlDYXRjaCh7DQogICAgZW1haWxfdGV4dCA8LSBwYXN0ZShyZWFkTGluZXMoZmlsZV9wYXRoLCB3YXJuID0gRkFMU0UpLCBjb2xsYXBzZSA9ICJcbiIpDQogICAgcmVzdWx0IDwtIHNlcGFyYXRlX2VtYWlsKGVtYWlsX3RleHQpDQoNCiAgICB0aWJibGUoDQogICAgICBmaWxlbmFtZSA9IGJhc2VuYW1lKGZpbGVfcGF0aCksDQogICAgICBsYWJlbCA9IGZhY3RvcihsYWJlbCwgbGV2ZWxzID0gYygiaGFtIiwgInNwYW0iKSksDQogICAgICBoZWFkZXIgPSByZXN1bHQkaGVhZGVyLA0KICAgICAgYm9keSA9IHJlc3VsdCRib2R5LA0KICAgICAgd29yZF9jb3VudCA9IHN0cl9jb3VudChyZXN1bHQkYm9keSwgIlxcdysiKQ0KICAgICkNCiAgfSwgZXJyb3IgPSBmdW5jdGlvbihlKSB7DQogICAgbWVzc2FnZSgi4pqg77iPIEVycm9yIHJlYWRpbmcgZmlsZTogIiwgZmlsZV9wYXRoLCAiIC0gIiwgZSRtZXNzYWdlKQ0KICAgIHJldHVybihOVUxMKQ0KICB9KQ0KfQ0KDQojIFByb2Nlc3MgZW1haWxzIHVzaW5nIHB1cnJyOjptYXAgYW5kIGJpbmQgaW50byBvbmUgZGF0YXNldA0KaGFtX2RhdGEgPC0gbWFwKGhhbV9maWxlcywgfnByb2Nlc3NfZW1haWxfZmlsZSgueCwgImhhbSIpKSAlPiUgY29tcGFjdCgpICU+JSBiaW5kX3Jvd3MoKQ0Kc3BhbV9kYXRhIDwtIG1hcChzcGFtX2ZpbGVzLCB+cHJvY2Vzc19lbWFpbF9maWxlKC54LCAic3BhbSIpKSAlPiUgY29tcGFjdCgpICU+JSBiaW5kX3Jvd3MoKQ0KDQojIENvbWJpbmUgaGFtIGFuZCBzcGFtIGRhdGENCmVtYWlsX2RhdGEgPC0gYmluZF9yb3dzKGhhbV9kYXRhLCBzcGFtX2RhdGEpDQoNCiMgQmFzaWMgdmFsaWRhdGlvbg0KaWYgKG5yb3coZW1haWxfZGF0YSkgPT0gMCkgew0KICBzdG9wKCLinYwgTm8gdmFsaWQgZW1haWwgZGF0YSBwcm9jZXNzZWQuIikNCn0NCg0KIyBTdW1tYXJ5IGRpYWdub3N0aWNzDQptZXNzYWdlKCLinIUgUHJvY2Vzc2VkICIsIG5yb3coZW1haWxfZGF0YSksICIgZW1haWxzLiIpDQptZXNzYWdlKCLwn5OoIEhhbSBlbWFpbHM6ICIsIHN1bShlbWFpbF9kYXRhJGxhYmVsID09ICJoYW0iKSkNCm1lc3NhZ2UoIvCfk6ggU3BhbSBlbWFpbHM6ICIsIHN1bShlbWFpbF9kYXRhJGxhYmVsID09ICJzcGFtIikpDQoNCiMgUHJldmlldyBkYXRhc2V0IHdpdGggc2hvcnRlbmVkIGhlYWRlci9ib2R5DQplbWFpbF9kYXRhICU+JQ0KICBtdXRhdGUoDQogICAgaGVhZGVyX3ByZXZpZXcgPSBzdHJfdHJ1bmMoaGVhZGVyLCAxMDApLA0KICAgIGJvZHlfcHJldmlldyA9IHN0cl90cnVuYyhib2R5LCAxMDApDQogICkgJT4lDQogIHNlbGVjdChmaWxlbmFtZSwgbGFiZWwsIHdvcmRfY291bnQsIGhlYWRlcl9wcmV2aWV3LCBib2R5X3ByZXZpZXcpICU+JQ0KICBoZWFkKCkgJT4lDQogIGtuaXRyOjprYWJsZShjYXB0aW9uID0gIvCfk4sgUHJldmlldzogRmlyc3QgNiBFbWFpbHMgKEhlYWRlciAmIEJvZHkgVHJ1bmNhdGVkKSIpDQoNCiMgT3B0aW9uYWw6IFByaW50IGZ1bGwgaGVhZGVyIGFuZCBib2R5IGZvciBmaXJzdCBlbWFpbA0KaWYgKG5yb3coZW1haWxfZGF0YSkgPiAwKSB7DQogIGNhdCgiXG4tLS0g8J+TjCBGdWxsIEhlYWRlciAoIiwgZW1haWxfZGF0YSRmaWxlbmFtZVsxXSwgIikgLS0tXG4iLCBlbWFpbF9kYXRhJGhlYWRlclsxXSwgIlxuXG4iKQ0KICBjYXQoIi0tLSDwn5OoIEZ1bGwgQm9keSAtLS1cbiIsIGVtYWlsX2RhdGEkYm9keVsxXSwgIlxuIikNCn0NCg0KDQpgYGANCg0KDQoNCiMjIERhdGEgcHJlcGFyZXRpb24gZm9yIE1MIG1vZGVsDQpgYGB7cn0NCg0KIycgUHJvY2VzcyBhIHNpbmdsZSBlbWFpbCBmaWxlIGFuZCBleHRyYWN0IHN0cnVjdHVyZWQgaW5mb3JtYXRpb24NCiMnDQojJyBAcGFyYW0gZmlsZV9wYXRoIEZ1bGwgcGF0aCB0byB0aGUgZW1haWwgZmlsZQ0KIycgQHBhcmFtIGxhYmVsICAgICBMYWJlbCB0byBhc3NpZ24gKCJoYW0iIG9yICJzcGFtIikNCiMnIEByZXR1cm4gQSB0aWJibGUgd2l0aCBmaWxlbmFtZSwgbGFiZWwsIGhlYWRlciwgYm9keSwgYW5kIHdvcmRfY291bnQNCnByb2Nlc3NfZW1haWxfZmlsZSA8LSBmdW5jdGlvbihmaWxlX3BhdGgsIGxhYmVsKSB7DQogIHRyeUNhdGNoKHsNCiAgICAjIFJlYWQgZW1haWwgY29udGVudCBhcyBvbmUgc2luZ2xlIHN0cmluZw0KICAgIGVtYWlsX3RleHQgPC0gcGFzdGUocmVhZExpbmVzKGZpbGVfcGF0aCwgd2FybiA9IEZBTFNFKSwgY29sbGFwc2UgPSAiXG4iKQ0KDQogICAgIyBVc2UgdGhlIHNlcGFyYXRlX2VtYWlsKCkgZnVuY3Rpb24gdG8gZXh0cmFjdCBoZWFkZXIgYW5kIGJvZHkNCiAgICByZXN1bHQgPC0gc2VwYXJhdGVfZW1haWwoZW1haWxfdGV4dCkNCg0KICAgICMgQmFzaWMgZmVhdHVyZTogd29yZCBjb3VudCBmcm9tIGJvZHkNCiAgICBib2R5X3dvcmRzIDwtIHN0cl9jb3VudChyZXN1bHQkYm9keSwgIlxcdysiKQ0KDQogICAgIyBDcmVhdGUgYSBzdHJ1Y3R1cmVkIHRpYmJsZSBmb3IgZWFjaCBlbWFpbA0KICAgIHRpYmJsZSgNCiAgICAgIGZpbGVuYW1lICAgPSBiYXNlbmFtZShmaWxlX3BhdGgpLA0KICAgICAgbGFiZWwgICAgICA9IGZhY3RvcihsYWJlbCwgbGV2ZWxzID0gYygiaGFtIiwgInNwYW0iKSksDQogICAgICBoZWFkZXIgICAgID0gcmVzdWx0JGhlYWRlciwNCiAgICAgIGJvZHkgICAgICAgPSByZXN1bHQkYm9keSwNCiAgICAgIHdvcmRfY291bnQgPSBib2R5X3dvcmRzDQogICAgKQ0KICB9LCBlcnJvciA9IGZ1bmN0aW9uKGUpIHsNCiAgICAjIExvZyBlcnJvciB3aXRoIGZpbGVuYW1lIGZvciBlYXNpZXIgZGVidWdnaW5nDQogICAgbWVzc2FnZSgi4p2MIEVycm9yIHByb2Nlc3NpbmcgZmlsZTogIiwgZmlsZV9wYXRoKQ0KICAgIG1lc3NhZ2UoIiAgIOKGsyAiLCBlJG1lc3NhZ2UpDQogICAgcmV0dXJuKE5VTEwpDQogIH0pDQp9DQoNCg0KYGBgDQojIyBCdWlsZCB0aGUgTUwgbW9kZWwNCg0KDQoNCmBgYHtyfQ0KDQoNCiMg8J+TpiBMb2FkIHJlcXVpcmVkIGxpYnJhcmllcw0KbGlicmFyeSh0aWR5dmVyc2UpDQpsaWJyYXJ5KHRpZHltb2RlbHMpDQpsaWJyYXJ5KHN0cmluZ3IpDQoNCiMg8J+nqiBTZXQgc2VlZCBmb3IgcmVwcm9kdWNpYmlsaXR5DQpzZXQuc2VlZCgxMjMpDQoNCiMg4pyFIENoZWNrIHJlcXVpcmVkIGNvbHVtbnMgZXhpc3QgaW4gZW1haWxfZGF0YQ0KcmVxdWlyZWRfY29scyA8LSBjKCJsYWJlbCIsICJ3b3JkX2NvdW50IiwgImJvZHkiKQ0KbWlzc2luZ19jb2xzIDwtIHNldGRpZmYocmVxdWlyZWRfY29scywgbmFtZXMoZW1haWxfZGF0YSkpDQoNCmlmIChsZW5ndGgobWlzc2luZ19jb2xzKSA+IDApIHsNCiAgc3RvcCgi4p2MICdlbWFpbF9kYXRhJyBpcyBtaXNzaW5nIHJlcXVpcmVkIGNvbHVtbnM6ICIsIHBhc3RlKG1pc3NpbmdfY29scywgY29sbGFwc2UgPSAiLCAiKSkNCn0NCg0KIyDwn5ug77iPIEZlYXR1cmUgZW5naW5lZXJpbmc6IGFkZCBiaW5hcnkgaW5kaWNhdG9ycyBmb3Iga2V5d29yZHMNCmVtYWlsX2RhdGEgPC0gZW1haWxfZGF0YSAlPiUNCiAgbXV0YXRlKA0KICAgIGhhc191bnN1YnNjcmliZSA9IGFzLmludGVnZXIoc3RyX2RldGVjdChib2R5LCByZWdleCgidW5zdWJzY3JpYmUiLCBpZ25vcmVfY2FzZSA9IFRSVUUpKSksDQogICAgaGFzX2ZyZWUgPSBhcy5pbnRlZ2VyKHN0cl9kZXRlY3QoYm9keSwgcmVnZXgoImZyZWUiLCBpZ25vcmVfY2FzZSA9IFRSVUUpKSkNCiAgKSAlPiUNCiAgc2VsZWN0KGxhYmVsLCB3b3JkX2NvdW50LCBoYXNfdW5zdWJzY3JpYmUsIGhhc19mcmVlKQ0KDQojIOKcgu+4jyBTcGxpdCBkYXRhc2V0DQoNCg0KYGBgDQoNCmBgYHtyfQ0KIyBTcGxpdCB0aGUgZGF0YQ0Kc2V0LnNlZWQoMTIzKQ0KZGF0YV9zcGxpdCA8LSBpbml0aWFsX3NwbGl0KGVtYWlsX2RhdGEsIHByb3AgPSAwLjgsIHN0cmF0YSA9IGxhYmVsKQ0KdHJhaW5fZGF0YSA8LSB0cmFpbmluZyhkYXRhX3NwbGl0KQ0KdGVzdF9kYXRhIDwtIHRlc3RpbmcoZGF0YV9zcGxpdCkNCg0KYGBgDQoNCg0KDQojI0V2YWx1YXRlIE1vZGVsDQoNCmBgYHtyfQ0KDQoNCiMg8J+UgSBSZXByb2R1Y2libGUgcmFuZG9tIGZvcmVzdCBtb2RlbCBwaXBlbGluZQ0KDQojIPCfp6ogU3RlcCAxOiBJbml0aWFsaXplIHRoZSBtb2RlbA0KcmZfbW9kZWwgPC0gcmFuZF9mb3Jlc3QodHJlZXMgPSAxMDApICU+JQ0KICBzZXRfZW5naW5lKCJyYW5nZXIiKSAlPiUNCiAgc2V0X21vZGUoImNsYXNzaWZpY2F0aW9uIikNCg0KIyDwn6WjIFN0ZXAgMjogQ3JlYXRlIGEgcHJlcHJvY2Vzc2luZyByZWNpcGUNCnJmX3JlY2lwZSA8LSByZWNpcGUobGFiZWwgfiAuLCBkYXRhID0gdHJhaW5fZGF0YSkgJT4lDQogIHN0ZXBfbm9ybWFsaXplKGFsbF9udW1lcmljX3ByZWRpY3RvcnMoKSkNCg0KIyDimpnvuI8gU3RlcCAzOiBDb21iaW5lIG1vZGVsIGFuZCByZWNpcGUgaW50byBhIHdvcmtmbG93DQpyZl93b3JrZmxvdyA8LSB3b3JrZmxvdygpICU+JQ0KICBhZGRfcmVjaXBlKHJmX3JlY2lwZSkgJT4lDQogIGFkZF9tb2RlbChyZl9tb2RlbCkNCg0KIyDwn5qAIFN0ZXAgNDogRml0IHRoZSBtb2RlbA0KbWVzc2FnZSgi8J+apyBCdWlsZGluZyByYW5kb20gZm9yZXN0IG1vZGVsLi4uIikNCnJmX2ZpdCA8LSByZl93b3JrZmxvdyAlPiUNCiAgZml0KGRhdGEgPSB0cmFpbl9kYXRhKQ0KbWVzc2FnZSgi4pyFIE1vZGVsIGJ1aWx0IHN1Y2Nlc3NmdWxseSEiKQ0KDQojIPCfk4ogU3RlcCA1OiBNYWtlIHByZWRpY3Rpb25zIGFuZCBldmFsdWF0ZQ0KbWVzc2FnZSgi8J+UjSBFdmFsdWF0aW5nIG1vZGVsLi4uIikNCg0KcHJlZGljdGlvbnMgPC0gcHJlZGljdChyZl9maXQsIG5ld19kYXRhID0gdGVzdF9kYXRhKSAlPiUNCiAgYmluZF9jb2xzKHRlc3RfZGF0YSAlPiUgc2VsZWN0KGxhYmVsKSkNCg0KIyDwn5OJIFN0ZXAgNjogQ29uZnVzaW9uIG1hdHJpeCBhbmQgYWNjdXJhY3kNCmNvbmZfbWF0cml4IDwtIGNvbmZfbWF0KHByZWRpY3Rpb25zLCB0cnV0aCA9IGxhYmVsLCBlc3RpbWF0ZSA9IC5wcmVkX2NsYXNzKQ0KYWNjX21ldHJpYyAgPC0gYWNjdXJhY3kocHJlZGljdGlvbnMsIHRydXRoID0gbGFiZWwsIGVzdGltYXRlID0gLnByZWRfY2xhc3MpDQoNCiMg8J+WqO+4jyBPdXRwdXQgcmVzdWx0cw0KbWVzc2FnZSgi8J+TiSBDb25mdXNpb24gTWF0cml4OiIpDQpwcmludChjb25mX21hdHJpeCkNCg0KbWVzc2FnZSgi8J+OryBBY2N1cmFjeTogIiwgcm91bmQoYWNjX21ldHJpYyQuZXN0aW1hdGUsIDMpKQ0KDQoNCg0KYGBgDQojI1Bsb3R0aW5nIGNvbmZ1c2lvbiBtYXRyaXgNCg0KDQoNCiMjIOKcgu+4jyBTcGxpdCBEYXRhDQoNCmBgYHtyfQ0KZW1haWxfc3BsaXQgPC0gaW5pdGlhbF9zcGxpdChlbWFpbF9kYXRhLCBwcm9wID0gMC44LCBzdHJhdGEgPSBsYWJlbCkNCnRyYWluX2RhdGEgPC0gdHJhaW5pbmcoZW1haWxfc3BsaXQpDQp0ZXN0X2RhdGEgIDwtIHRlc3RpbmcoZW1haWxfc3BsaXQpDQpgYGANCg0KIyMg8J+MsiBCdWlsZCBSYW5kb20gRm9yZXN0IE1vZGVsDQoNCmBgYHtyfQ0KcmZfbW9kZWwgPC0gcmFuZF9mb3Jlc3QodHJlZXMgPSAxMDApICU+JQ0KICBzZXRfZW5naW5lKCJyYW5nZXIiKSAlPiUNCiAgc2V0X21vZGUoImNsYXNzaWZpY2F0aW9uIikNCg0KcmZfcmVjaXBlIDwtIHJlY2lwZShsYWJlbCB+IC4sIGRhdGEgPSB0cmFpbl9kYXRhKSAlPiUNCiAgc3RlcF9ub3JtYWxpemUoYWxsX251bWVyaWNfcHJlZGljdG9ycygpKQ0KDQpyZl93b3JrZmxvdyA8LSB3b3JrZmxvdygpICU+JQ0KICBhZGRfcmVjaXBlKHJmX3JlY2lwZSkgJT4lDQogIGFkZF9tb2RlbChyZl9tb2RlbCkNCg0KcmZfZml0IDwtIHJmX3dvcmtmbG93ICU+JQ0KICBmaXQoZGF0YSA9IHRyYWluX2RhdGEpDQpgYGANCg0KIyMg8J+UjSBFdmFsdWF0ZSBNb2RlbA0KDQpgYGB7cn0NCnByZWRpY3Rpb25zIDwtIHByZWRpY3QocmZfZml0LCBuZXdfZGF0YSA9IHRlc3RfZGF0YSkgJT4lDQogIGJpbmRfY29scyh0ZXN0X2RhdGEgJT4lIHNlbGVjdChsYWJlbCkpDQoNCmNvbmZfbWF0cml4IDwtIGNvbmZfbWF0KHByZWRpY3Rpb25zLCB0cnV0aCA9IGxhYmVsLCBlc3RpbWF0ZSA9IC5wcmVkX2NsYXNzKQ0KYWNjX21ldHJpYyAgPC0gYWNjdXJhY3kocHJlZGljdGlvbnMsIHRydXRoID0gbGFiZWwsIGVzdGltYXRlID0gLnByZWRfY2xhc3MpDQpgYGANCg0KIyMjIENvbmZ1c2lvbiBNYXRyaXgNCmBgYHtyfQ0KY29uZl9tYXRfdGFibGUgPC0gYXMuZGF0YS5mcmFtZShjb25mX21hdHJpeCR0YWJsZSkNCmNvbG5hbWVzKGNvbmZfbWF0X3RhYmxlKSA8LSBjKCJUcnV0aCIsICJQcmVkaWN0aW9uIiwgIkZyZXEiKQ0KDQpnZ3Bsb3QoY29uZl9tYXRfdGFibGUsIGFlcyh4ID0gUHJlZGljdGlvbiwgeSA9IFRydXRoLCBmaWxsID0gRnJlcSkpICsNCiAgZ2VvbV90aWxlKGNvbG9yID0gImdyYXkzMCIpICsNCiAgZ2VvbV90ZXh0KGFlcyhsYWJlbCA9IEZyZXEpLCBjb2xvciA9ICJ3aGl0ZSIsIHNpemUgPSA1LCBmb250ZmFjZSA9ICJib2xkIikgKw0KICBzY2FsZV9maWxsX2dyYWRpZW50KGxvdyA9ICJzdGVlbGJsdWUiLCBoaWdoID0gImRhcmtyZWQiKSArDQogIGxhYnModGl0bGUgPSAiQ29uZnVzaW9uIE1hdHJpeDogU3BhbSB2cy4gSGFtIiwgeCA9ICJQcmVkaWN0ZWQiLCB5ID0gIkFjdHVhbCIpICsNCiAgdGhlbWVfbWluaW1hbChiYXNlX3NpemUgPSAxNCkNCmBgYA0KDQojIyMgQWNjdXJhY3ksIFByZWNpc2lvbiwgUmVjYWxsLCBGMQ0KYGBge3J9DQpldmFsX21ldHJpY3MgPC0gbWV0cmljX3NldChwcmVjaXNpb24sIHJlY2FsbCwgZl9tZWFzKShwcmVkaWN0aW9ucywgdHJ1dGggPSBsYWJlbCwgZXN0aW1hdGUgPSAucHJlZF9jbGFzcykNCmV2YWxfbWV0cmljcw0KYGBgDQoNCiMjIPCfk4ggUk9DIEN1cnZlDQpgYGB7cn0NCnByb2JfcHJlZGljdGlvbnMgPC0gcHJlZGljdChyZl9maXQsIG5ld19kYXRhID0gdGVzdF9kYXRhLCB0eXBlID0gInByb2IiKSAlPiUNCiAgYmluZF9jb2xzKHRlc3RfZGF0YSAlPiUgc2VsZWN0KGxhYmVsKSkNCg0Kcm9jX3Jlc3VsdHMgPC0gcm9jX2N1cnZlKHByb2JfcHJlZGljdGlvbnMsIHRydXRoID0gbGFiZWwsIC5wcmVkX3NwYW0pDQoNCmF1dG9wbG90KHJvY19yZXN1bHRzKSArDQogIGxhYnModGl0bGUgPSAiUk9DIEN1cnZlOiBTcGFtIHZzLiBIYW0gQ2xhc3NpZmljYXRpb24iKSArDQogIHRoZW1lX21pbmltYWwoYmFzZV9zaXplID0gMTQpDQpgYGANCg0KDQoNCiMjIOKchSBDb25jbHVzaW9uDQpgYGB7cn0NCm1lc3NhZ2UoIlRoZSByYW5kb20gZm9yZXN0IG1vZGVsIGFjaGlldmVkIGFuIGFjY3VyYWN5IG9mICIsIHJvdW5kKGFjY19tZXRyaWMkLmVzdGltYXRlLCAzKSwgIi4iKQ0KbWVzc2FnZSgiSXQgcGVyZm9ybWVkIHdlbGwgaW4gY2xhc3NpZnlpbmcgZW1haWxzLCB0aG91Z2ggZnVydGhlciBpbXByb3ZlbWVudHMgY2FuIGJlIG1hZGUgdXNpbmcgYWRkaXRpb25hbCBmZWF0dXJlcyBvciBoeXBlcnBhcmFtZXRlciB0dW5pbmcuIikNCmBgYA0KDQojI0NvbmNsdXNpb246DQpJbiB0aGlzIHByb2plY3QsIHdlIGRldmVsb3BlZCBhIG1hY2hpbmUgbGVhcm5pbmcgbW9kZWwgdG8gY2xhc3NpZnkgZW1haWxzIGFzIGVpdGhlciBzcGFtIG9yIGhhbSB1c2luZyBhIFJhbmRvbSBGb3Jlc3QgYWxnb3JpdGhtIHdpdGhpbiB0aGUgdGlkeW1vZGVscyBmcmFtZXdvcmsuIEJ5IHByZXByb2Nlc3NpbmcgdGhlIHRleHQgZGF0YSwgbm9ybWFsaXppbmcgZmVhdHVyZXMsIGFuZCB0dW5pbmcgdGhlIG1vZGVsIHBpcGVsaW5lLCB3ZSBhY2hpZXZlZCBhIHJlbGlhYmxlIGNsYXNzaWZpZXIgdGhhdCBjYW4gaWRlbnRpZnkgdW53YW50ZWQgZW1haWxzIHdpdGggYSBoaWdoIGRlZ3JlZSBvZiBhY2N1cmFjeS4NCg0KVGhlIGNvbmZ1c2lvbiBtYXRyaXggdmlzdWFsaXphdGlvbiBoaWdobGlnaHRlZCB0aGUgbW9kZWwncyBhYmlsaXR5IHRvIGRpc3Rpbmd1aXNoIGJldHdlZW4gc3BhbSBhbmQgaGFtIGVtYWlscywgc2hvd2luZyBzdHJvbmcgcGVyZm9ybWFuY2UgaW4gYm90aCBwcmVjaXNpb24gYW5kIHJlY2FsbC4gVGhlc2UgcmVzdWx0cyBzdWdnZXN0IHRoYXQgUmFuZG9tIEZvcmVzdCBpcyBhIHJvYnVzdCBjaG9pY2UgZm9yIGhhbmRsaW5nIGJpbmFyeSBjbGFzc2lmaWNhdGlvbiB0YXNrcyBpbiB0ZXh0LWJhc2VkIGRhdGFzZXRzLg0KDQpGb3IgZnV0dXJlIGltcHJvdmVtZW50cywgaW5jb3Jwb3JhdGluZyBhZGRpdGlvbmFsIG5hdHVyYWwgbGFuZ3VhZ2UgcHJvY2Vzc2luZyB0ZWNobmlxdWVz4oCUc3VjaCBhcyBzdGVtbWluZywgbGVtbWF0aXphdGlvbiwgb3IgYWR2YW5jZWQgdmVjdG9yaXphdGlvbiAoZS5nLiwgVEYtSURGLCB3b3JkIGVtYmVkZGluZ3Mp4oCUY291bGQgZnVydGhlciBlbmhhbmNlIHRoZSBtb2RlbOKAmXMgcGVyZm9ybWFuY2UuIE1vcmVvdmVyLCBjb21wYXJpbmcgZGlmZmVyZW50IG1vZGVscyAoZS5nLiwgbG9naXN0aWMgcmVncmVzc2lvbiwgc3VwcG9ydCB2ZWN0b3IgbWFjaGluZXMsIG9yIGRlZXAgbGVhcm5pbmcgYXBwcm9hY2hlcykgY291bGQgcHJvdmlkZSBtb3JlIGluc2lnaHRzIGFuZCBwb3RlbnRpYWxseSBiZXR0ZXIgYWNjdXJhY3kuDQoNCk92ZXJhbGwsIHRoaXMgcmVwcm9kdWNpYmxlIHdvcmtmbG93IHNlcnZlcyBhcyBhIHNvbGlkIGZvdW5kYXRpb24gZm9yIGVtYWlsIGZpbHRlcmluZyBzeXN0ZW1zLCBzaG93Y2FzaW5nIHRoZSBwb3dlciBvZiB0aWR5IG1vZGVsaW5nIHByaW5jaXBsZXMgaW4gcmVhbC13b3JsZCBhcHBsaWNhdGlvbnMuDQoNCg0K